diff --git a/.travis.yml b/.travis.yml index bcb4607..c2f98c4 100644 --- a/.travis.yml +++ b/.travis.yml @@ -37,7 +37,6 @@ r_packages: - LaplacesDemon - logspline - testthat - - devtools - remotes - knitr - rmarkdown diff --git a/API b/API index dcfb90c..74b289a 100644 --- a/API +++ b/API @@ -9,10 +9,10 @@ pairwise_p(data, x, y, type = "parametric", paired = FALSE, var.equal = FALSE, t ## Reexported objects -::%$% +magrittr::%$% zeallot::%<-% -::%<>% -::%>% +magrittr::%<>% +magrittr::%>% rlang::%|% rlang::%||% rlang:::= diff --git a/CRAN-RELEASE b/CRAN-RELEASE index c152a1e..c65e03b 100644 --- a/CRAN-RELEASE +++ b/CRAN-RELEASE @@ -1,2 +1,2 @@ -This package was submitted to CRAN on 2020-06-23. -Once it is accepted, delete this file and tag the release (commit b0b6801fdc). +This package was submitted to CRAN on 2020-09-04. +Once it is accepted, delete this file and tag the release (commit 8ab15c7). diff --git a/DESCRIPTION b/DESCRIPTION index 961a6bd..eb8f294 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: pairwiseComparisons Title: Multiple Pairwise Comparison Tests -Version: 1.1.2.9000 +Version: 2.0.0 Authors@R: person(given = "Indrajeet", family = "Patil", diff --git a/NEWS.md b/NEWS.md index 71cd06c..3bccd17 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,4 +1,12 @@ -# pairwiseComparisons 1.1.2.9000 +# pairwiseComparisons 2.0.0 + + - Fixes a bug which affected results for within-subjects design when the + dataframe wasn't sorted by `x` (#19). + + - This fix also now makes the results more consistent, such that irrespective + of which type of statistics is chosen the `group1` and `group2` columns are + in identical order. + # pairwiseComparisons 1.1.2 diff --git a/R/data.R b/R/data.R index 0d023ef..5335595 100644 --- a/R/data.R +++ b/R/data.R @@ -2,13 +2,9 @@ #' @name movies_wide #' @details Modified dataset from `ggplot2movies` package. #' -#' 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 information -#' about 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}. +#' The internet movie database, \url{https://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. #' #' Movies were selected for inclusion if they had a known length and had been #' rated by at least one imdb user. Small categories such as documentaries @@ -41,13 +37,9 @@ #' @name movies_long #' @details Modified dataset from `ggplot2movies` package. #' -#' The internet movie database, \url{http://imdb.com/}, is a website devoted +#' The internet movie database, \url{https://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}. +#' biggest movie database on the web and is run by amazon. #' #' Movies were are identical to those selected for inclusion in movies_wide but this #' dataset has been constructed such that every movie appears in one and only one diff --git a/R/games_howell.R b/R/games_howell.R index 969b018..e093cb9 100644 --- a/R/games_howell.R +++ b/R/games_howell.R @@ -78,39 +78,32 @@ games_howell <- function(data, x, y) { ) # sigma standard error - se <- - sqrt(x = 0.5 * (std[combs[1, x]] / n[combs[1, x]] + std[combs[2, x]] / n[combs[2, x]])) + se <- sqrt(x = 0.5 * (std[combs[1, x]] / n[combs[1, x]] + std[combs[2, x]] / n[combs[2, x]])) # upper confidence limit for mean difference - conf.high <- lapply(X = 1:NCOL(combs), FUN = function(x) { - mean.diff + stats::qtukey( - p = 0.95, - nmeans = groups, - df = df - ) * se - })[[1]] + conf.high <- + lapply( + X = 1:NCOL(combs), + FUN = function(x) mean.diff + stats::qtukey(p = 0.95, nmeans = groups, df = df) * se + ) # lower confidence limit for mean difference - conf.low <- lapply(X = 1:NCOL(combs), FUN = function(x) { - mean.diff - stats::qtukey( - p = 0.95, - nmeans = groups, - df = df - ) * se - })[[1]] + conf.low <- + lapply( + X = 1:NCOL(combs), + FUN = function(x) mean.diff - stats::qtukey(p = 0.95, nmeans = groups, df = df) * se + ) # Group Combinations group1 <- as.character(combs[1, x]) group2 <- as.character(combs[2, x]) # Collect all statistics into list - stats <- list(group1, group2, mean.diff, se, t, df, p, conf.high, conf.low) + stats <- list(group1, group2, mean.diff, se, t, df, p, conf.high[[1]], conf.low[[1]]) }) # unlist statistics collected earlier - stats.unlisted <- lapply(statistics, function(x) { - unlist(x) - }) + stats.unlisted <- lapply(statistics, function(x) unlist(x)) # create dataframe from flattened list results <- @@ -121,8 +114,7 @@ games_howell <- function(data, x, y) { )) # select columns that should be numeric and change with as.numeric - results[, 3:ncol(results)] <- - round(as.numeric(as.matrix(results[, 3:ncol(results)])), digits = 3) + results[, 3:ncol(results)] <- round(as.numeric(as.matrix(results[, 3:ncol(results)])), digits = 3) # Rename data frame columns colnames(results) <- diff --git a/R/pairwise_comparisons.R b/R/pairwise_comparisons.R index b456a87..b2d64c0 100644 --- a/R/pairwise_comparisons.R +++ b/R/pairwise_comparisons.R @@ -3,8 +3,8 @@ #' @description Calculate parametric, non-parametric, and robust pairwise #' comparisons between group levels with corrections for multiple testing. #' -#' @param data A dataframe (or a tibble) from which variables specified are to -#' be taken. A matrix or tables will **not** be accepted. +#' @param data A dataframe from which variables specified are to be taken. A +#' matrix or tables will **not** be accepted. #' @param x The grouping variable from the dataframe `data`. #' @param y The response (a.k.a. outcome or dependent) variable from the #' dataframe `data`. @@ -187,16 +187,20 @@ pairwise_comparisons <- function(data, # ---------------------------- data cleanup ------------------------------- - # creating a dataframe + # creating a dataframe (it's important for the data to be sorted by `x`) df_internal <- long_to_wide_converter( - data = data, + data = dplyr::arrange(data, {{ x }}), x = {{ x }}, y = {{ y }}, paired = paired, spread = FALSE ) + # for some tests, it's better to have these as vectors + x_vec <- df_internal %>% dplyr::pull({{ x }}) + y_vec <- df_internal %>% dplyr::pull({{ y }}) + # ---------------------------- parametric --------------------------------- if (type %in% c("parametric", "bayes")) { @@ -253,16 +257,15 @@ pairwise_comparisons <- function(data, # tidy dataframe with results from pairwise tests df_tidy <- - broomExtra::tidy( - stats::pairwise.t.test( - x = df_internal %>% dplyr::pull({{ y }}), - g = df_internal %>% dplyr::pull({{ x }}), - p.adjust.method = "none", - paired = paired, - alternative = "two.sided", - na.action = na.omit - ) + stats::pairwise.t.test( + x = y_vec, + g = x_vec, + p.adjust.method = "none", + paired = paired, + alternative = "two.sided", + na.action = na.omit ) %>% + broomExtra::tidy(.) %>% p_adjust_column_adder(df = ., p.adjust.method = p.adjust.method) # combining mean difference and results from pairwise t-test @@ -310,23 +313,20 @@ pairwise_comparisons <- function(data, ) ) %>% dplyr::rowwise() %>% - dplyr::mutate(label = paste( - "list(~log[e](BF[10])", - "==", - specify_decimal_p(x = log_e_bf10, k = k), - ")", - sep = "" + dplyr::mutate(label = paste0( + "list(~log[e](BF[10])", "==", specify_decimal_p(x = log_e_bf10, k = k), ")" )) %>% dplyr::ungroup() %>% dplyr::mutate(.data = ., test.details = "Student's t-test") # early return (no further cleanup required) - return(dplyr::bind_cols(dplyr::select(df, group1, group2), df_tidy) %>% + return( dplyr::mutate_if( - .tbl = ., + .tbl = dplyr::bind_cols(dplyr::select(df, group1, group2), df_tidy), .predicate = is.factor, .funs = ~ as.character(.) - )) + ) + ) } # ---------------------------- nonparametric ---------------------------- @@ -337,8 +337,8 @@ pairwise_comparisons <- function(data, invisible(utils::capture.output(df <- as.data.frame( dunn.test::dunn.test( - x = df_internal %>% dplyr::pull({{ y }}), - g = df_internal %>% dplyr::pull({{ x }}), + x = y_vec, + g = x_vec, table = FALSE, kw = FALSE, label = FALSE, @@ -375,19 +375,13 @@ pairwise_comparisons <- function(data, # converting the entered long format data to wide format if (isTRUE(paired)) { - x_vec <- df_internal %>% dplyr::pull({{ x }}) - y_vec <- df_internal %>% dplyr::pull({{ y }}) - # creating model object mod <- PMCMRplus::durbinAllPairsTest( y = na.omit(matrix( data = y_vec, ncol = length(unique(x_vec)), - dimnames = list( - seq(1, length(y_vec) / length(unique(x_vec))), - unique(x_vec) - ) + dimnames = list(seq(1, length(y_vec) / length(unique(x_vec))), unique(x_vec)) )), p.adjust.method = "none" ) @@ -395,9 +389,9 @@ pairwise_comparisons <- function(data, # combining into one dataframe df <- dplyr::bind_cols( - matrix_to_tidy(m = mod$statistic, col_names = c("group1", "group2", "W")), + matrix_to_tidy(m = mod$statistic, col_names = c("group2", "group1", "W")), dplyr::select( - matrix_to_tidy(m = mod$p.value, col_names = c("group1", "group2", "p.value")), + matrix_to_tidy(m = mod$p.value, col_names = c("group2", "group1", "p.value")), -dplyr::contains("group") ) ) @@ -485,8 +479,8 @@ pairwise_comparisons <- function(data, dplyr::mutate(label = specify_decimal_p(x = p.value, k = k, p.value = TRUE)) %>% dplyr::mutate( label = dplyr::case_when( - label == "< 0.001" ~ paste("list(~italic(p)[", adjust_text, "]<=", "0.001", ")", sep = " "), - TRUE ~ paste("list(~italic(p)[", adjust_text, "]==", label, ")", sep = " ") + label == "< 0.001" ~ paste0("list(~italic(p)[", adjust_text, "]<=", "0.001", ")"), + TRUE ~ paste0("list(~italic(p)[", adjust_text, "]==", label, ")") ) ) %>% dplyr::mutate( diff --git a/README.Rmd b/README.Rmd index cd88356..4af616f 100644 --- a/README.Rmd +++ b/README.Rmd @@ -6,7 +6,7 @@ output: github_document ```{r, echo = FALSE} # show me all columns -options(tibble.width = Inf) +options(tibble.width = Inf, pillar.bold = TRUE) knitr::opts_chunk$set( collapse = TRUE, @@ -23,12 +23,12 @@ knitr::opts_chunk$set( Package | Status | Usage | GitHub | References ----------------- | ----------------- | ----------------- | ----------------- | ----------------- -[![CRAN_Release_Badge](http://www.r-pkg.org/badges/version-ago/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Travis Build Status](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons.svg?branch=master)](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons) | [![Daily downloads badge](https://cranlogs.r-pkg.org/badges/last-day/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![GitHub version](https://img.shields.io/badge/GitHub-1.1.1-orange.svg?style=flat-square)](https://github.com/IndrajeetPatil/pairwiseComparisons/) | [![Website](https://img.shields.io/badge/website-pairwiseComparisons-orange.svg?colorB=E91E63)](https://indrajeetpatil.github.io/pairwiseComparisons/) +[![CRAN_Release_Badge](http://www.r-pkg.org/badges/version-ago/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Travis Build Status](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons.svg?branch=master)](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons) | [![Daily downloads badge](https://cranlogs.r-pkg.org/badges/last-day/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![GitHub version](https://img.shields.io/badge/GitHub-2.0.0-orange.svg?style=flat-square)](https://github.com/IndrajeetPatil/pairwiseComparisons/) | [![Website](https://img.shields.io/badge/website-pairwiseComparisons-orange.svg?colorB=E91E63)](https://indrajeetpatil.github.io/pairwiseComparisons/) [![CRAN Checks](https://cranchecks.info/badges/summary/pairwiseComparisons)](https://cran.r-project.org/web/checks/check_results_pairwiseComparisons.html) | [![AppVeyor Build Status](https://ci.appveyor.com/api/projects/status/github/IndrajeetPatil/pairwiseComparisons?branch=master&svg=true)](https://ci.appveyor.com/project/IndrajeetPatil/pairwiseComparisons) | [![Weekly downloads badge](https://cranlogs.r-pkg.org/badges/last-week/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Forks](https://img.shields.io/badge/forks-`r itdepends:::get_github_info("pairwiseComparisons")$forks[[1]]`-blue.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/) | [![Rdoc](https://www.rdocumentation.org/badges/version/pairwiseComparisons)](https://www.rdocumentation.org/packages/pairwiseComparisons) -[![minimal R version](https://img.shields.io/badge/R%3E%3D-3.6.0-6666ff.svg)](https://cran.r-project.org/) | [![lifecycle](https://img.shields.io/badge/lifecycle-maturing-blue.svg)](https://www.tidyverse.org/lifecycle/) | [![Monthly downloads badge](https://cranlogs.r-pkg.org/badges/last-month/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Github Issues](https://img.shields.io/badge/issues-`r itdepends:::get_github_info("pairwiseComparisons")$open_issues[[1]]`-red.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) | [![vignettes](https://img.shields.io/badge/vignettes-1.0.0-orange.svg?colorB=FF5722)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/README.md) +[![minimal R version](https://img.shields.io/badge/R%3E%3D-3.6.0-6666ff.svg)](https://cran.r-project.org/) | [![lifecycle](https://img.shields.io/badge/lifecycle-maturing-blue.svg)](https://www.tidyverse.org/lifecycle/) | [![Monthly downloads badge](https://cranlogs.r-pkg.org/badges/last-month/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Github Issues](https://img.shields.io/badge/issues-`r itdepends:::get_github_info("pairwiseComparisons")$open_issues[[1]]`-red.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) | [![vignettes](https://img.shields.io/badge/vignettes-2.0.0-orange.svg?colorB=FF5722)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/README.md) [![GitHub code size in bytes](https://img.shields.io/github/languages/code-size/IndrajeetPatil/pairwiseComparisons.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![Coverage Status](https://coveralls.io/repos/github/IndrajeetPatil/pairwiseComparisons/badge.svg?branch=master)](https://coveralls.io/github/IndrajeetPatil/pairwiseComparisons?branch=master) | [![Total downloads badge](https://cranlogs.r-pkg.org/badges/grand-total/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Github Stars](https://img.shields.io/github/stars/IndrajeetPatil/pairwiseComparisons.svg?style=social&label=Github)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![DOI](https://zenodo.org/badge/DOI/10.5281/zenodo.2074621.svg)](https://doi.org/10.5281/zenodo.2074621) [![Licence](https://img.shields.io/badge/licence-GPL--3-blue.svg)](https://www.gnu.org/licenses/gpl-3.0.en.html) | [![Codecov test coverage](https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons/branch/master/graph/badge.svg)](https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons?branch=master) | [![Covrpage Summary](https://img.shields.io/badge/covrpage-Last_Build_2020_05_29-brightgreen.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/tests/README.md) | [![Last-changedate](https://img.shields.io/badge/last%20change-`r gsub('-', '--', Sys.Date())`-yellowgreen.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/commits/master) | [![GitHub last commit](https://img.shields.io/github/last-commit/IndrajeetPatil/pairwiseComparisons.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/commits/master) -[![status](https://tinyverse.netlify.com/badge/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![R build status](https://github.com/IndrajeetPatil/pairwiseComparisons/workflows/R-CMD-check/badge.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![Gitter chat](https://badges.gitter.im/gitterHQ/gitter.png)](https://gitter.im/pairwiseComparisons/community) | [![Project Status](http://www.repostatus.org/badges/latest/active.svg)](http://www.repostatus.org/#active) | [![contributions welcome](https://img.shields.io/badge/contributions-welcome-brightgreen.svg?style=flat)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) +[![status](https://tinyverse.netlify.com/badge/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![R build status](https://github.com/IndrajeetPatil/pairwiseComparisons/workflows/R-CMD-check/badge.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![Gitter chat](https://badges.gitter.im/gitterHQ/gitter.png)](https://gitter.im/pairwiseComparisons/community) | [![Project Status](http://www.repostatus.org/badges/latest/active.svg)](https://www.repostatus.org/#active) | [![contributions welcome](https://img.shields.io/badge/contributions-welcome-brightgreen.svg?style=flat)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) # Introduction @@ -233,7 +233,8 @@ library(ggsignif) mtcars$cyl <- as.factor(mtcars$cyl) # creating a basic plot -p <- ggplot(mtcars, aes(cyl, wt)) + geom_boxplot() +p <- ggplot(mtcars, aes(cyl, wt)) + + geom_boxplot() # using `pairwiseComparisons` package to create a dataframe with results (df <- @@ -308,8 +309,7 @@ of commitment): - Review code - - Add new functionality (in the form of new plotting functions or helpers for - preparing subtitles) + - Add new functionality Please note that this project is released with a [Contributor Code of Conduct](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/.github/CODE_OF_CONDUCT.md). By participating in this project you agree to abide by its terms. diff --git a/README.md b/README.md index 882b6e6..28f23ee 100644 --- a/README.md +++ b/README.md @@ -1,18 +1,20 @@ -# `pairwiseComparisons`: Multiple Pairwise Comparison Tests +`pairwiseComparisons`: Multiple Pairwise Comparison Tests +========================================================= | Package | Status | Usage | GitHub | References | -| ------------------------------------------------------------------------------------------------------------------------------------------------------------------------------- | ------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------ | ------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------- | ------------------------------------------------------------------------------------------------------------------------------------------------------------------------------ | ------------------------------------------------------------------------------------------------------------------------------------------------------------------------------- | -| [![CRAN\_Release\_Badge](http://www.r-pkg.org/badges/version-ago/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Travis Build Status](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons.svg?branch=master)](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons) | [![Daily downloads badge](https://cranlogs.r-pkg.org/badges/last-day/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![GitHub version](https://img.shields.io/badge/GitHub-1.1.1-orange.svg?style=flat-square)](https://github.com/IndrajeetPatil/pairwiseComparisons/) | [![Website](https://img.shields.io/badge/website-pairwiseComparisons-orange.svg?colorB=E91E63)](https://indrajeetpatil.github.io/pairwiseComparisons/) | +|---------------------------------------------------------------------------------------------------------------------------------------------------------------------------------|--------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------|---------------------------------------------------------------------------------------------------------------------------------------------------------------------------------------|--------------------------------------------------------------------------------------------------------------------------------------------------------------------------------|---------------------------------------------------------------------------------------------------------------------------------------------------------------------------------| +| [![CRAN\_Release\_Badge](http://www.r-pkg.org/badges/version-ago/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Travis Build Status](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons.svg?branch=master)](https://travis-ci.org/IndrajeetPatil/pairwiseComparisons) | [![Daily downloads badge](https://cranlogs.r-pkg.org/badges/last-day/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![GitHub version](https://img.shields.io/badge/GitHub-2.0.0-orange.svg?style=flat-square)](https://github.com/IndrajeetPatil/pairwiseComparisons/) | [![Website](https://img.shields.io/badge/website-pairwiseComparisons-orange.svg?colorB=E91E63)](https://indrajeetpatil.github.io/pairwiseComparisons/) | | [![CRAN Checks](https://cranchecks.info/badges/summary/pairwiseComparisons)](https://cran.r-project.org/web/checks/check_results_pairwiseComparisons.html) | [![AppVeyor Build Status](https://ci.appveyor.com/api/projects/status/github/IndrajeetPatil/pairwiseComparisons?branch=master&svg=true)](https://ci.appveyor.com/project/IndrajeetPatil/pairwiseComparisons) | [![Weekly downloads badge](https://cranlogs.r-pkg.org/badges/last-week/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Forks](https://img.shields.io/badge/forks-3-blue.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/) | [![Rdoc](https://www.rdocumentation.org/badges/version/pairwiseComparisons)](https://www.rdocumentation.org/packages/pairwiseComparisons) | -| [![minimal R version](https://img.shields.io/badge/R%3E%3D-3.6.0-6666ff.svg)](https://cran.r-project.org/) | [![lifecycle](https://img.shields.io/badge/lifecycle-maturing-blue.svg)](https://www.tidyverse.org/lifecycle/) | [![Monthly downloads badge](https://cranlogs.r-pkg.org/badges/last-month/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Github Issues](https://img.shields.io/badge/issues-1-red.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) | [![vignettes](https://img.shields.io/badge/vignettes-1.0.0-orange.svg?colorB=FF5722)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/README.md) | +| [![minimal R version](https://img.shields.io/badge/R%3E%3D-3.6.0-6666ff.svg)](https://cran.r-project.org/) | [![lifecycle](https://img.shields.io/badge/lifecycle-maturing-blue.svg)](https://www.tidyverse.org/lifecycle/) | [![Monthly downloads badge](https://cranlogs.r-pkg.org/badges/last-month/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Github Issues](https://img.shields.io/badge/issues-1-red.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) | [![vignettes](https://img.shields.io/badge/vignettes-2.0.0-orange.svg?colorB=FF5722)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/README.md) | | [![GitHub code size in bytes](https://img.shields.io/github/languages/code-size/IndrajeetPatil/pairwiseComparisons.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![Coverage Status](https://coveralls.io/repos/github/IndrajeetPatil/pairwiseComparisons/badge.svg?branch=master)](https://coveralls.io/github/IndrajeetPatil/pairwiseComparisons?branch=master) | [![Total downloads badge](https://cranlogs.r-pkg.org/badges/grand-total/pairwiseComparisons?color=blue)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![Github Stars](https://img.shields.io/github/stars/IndrajeetPatil/pairwiseComparisons.svg?style=social&label=Github)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![DOI](https://zenodo.org/badge/DOI/10.5281/zenodo.2074621.svg)](https://doi.org/10.5281/zenodo.2074621) | -| [![Licence](https://img.shields.io/badge/licence-GPL--3-blue.svg)](https://www.gnu.org/licenses/gpl-3.0.en.html) | [![Codecov test coverage](https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons/branch/master/graph/badge.svg)](https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons?branch=master) | [![Covrpage Summary](https://img.shields.io/badge/covrpage-Last_Build_2020_05_29-brightgreen.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/tests/README.md) | [![Last-changedate](https://img.shields.io/badge/last%20change-2020--07--14-yellowgreen.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/commits/master) | [![GitHub last commit](https://img.shields.io/github/last-commit/IndrajeetPatil/pairwiseComparisons.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/commits/master) | -| [![status](https://tinyverse.netlify.com/badge/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![R build status](https://github.com/IndrajeetPatil/pairwiseComparisons/workflows/R-CMD-check/badge.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![Gitter chat](https://badges.gitter.im/gitterHQ/gitter.png)](https://gitter.im/pairwiseComparisons/community) | [![Project Status](http://www.repostatus.org/badges/latest/active.svg)](http://www.repostatus.org/#active) | [![contributions welcome](https://img.shields.io/badge/contributions-welcome-brightgreen.svg?style=flat)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) | +| [![Licence](https://img.shields.io/badge/licence-GPL--3-blue.svg)](https://www.gnu.org/licenses/gpl-3.0.en.html) | [![Codecov test coverage](https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons/branch/master/graph/badge.svg)](https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons?branch=master) | [![Covrpage Summary](https://img.shields.io/badge/covrpage-Last_Build_2020_05_29-brightgreen.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/tests/README.md) | [![Last-changedate](https://img.shields.io/badge/last%20change-2020--09--04-yellowgreen.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/commits/master) | [![GitHub last commit](https://img.shields.io/github/last-commit/IndrajeetPatil/pairwiseComparisons.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons/commits/master) | +| [![status](https://tinyverse.netlify.com/badge/pairwiseComparisons)](https://CRAN.R-project.org/package=pairwiseComparisons) | [![R build status](https://github.com/IndrajeetPatil/pairwiseComparisons/workflows/R-CMD-check/badge.svg)](https://github.com/IndrajeetPatil/pairwiseComparisons) | [![Gitter chat](https://badges.gitter.im/gitterHQ/gitter.png)](https://gitter.im/pairwiseComparisons/community) | [![Project Status](http://www.repostatus.org/badges/latest/active.svg)](https://www.repostatus.org/#active) | [![contributions welcome](https://img.shields.io/badge/contributions-welcome-brightgreen.svg?style=flat)](https://github.com/IndrajeetPatil/pairwiseComparisons/issues) | -# Introduction +Introduction +========================================================================= [`pairwiseComparisons`](https://indrajeetpatil.github.io/pairwiseComparisons/) provides a tidy data friendly way to carry out pairwise comparison @@ -23,459 +25,442 @@ both between-subjects and within-subjects one-way analysis of variance designs. For both of these designs, parametric, non-parametric, robust, and Bayes Factor statistical tests are available. -## Installation +Installation +------------ To get the latest, stable `CRAN` release: -``` r -install.packages("pairwiseComparisons") -``` + install.packages("pairwiseComparisons") You can get the **development** version of the package from `GitHub`. To see what new changes (and bug fixes) have been made to the package since the last release on `CRAN`, you can check the detailed log of changes here: - +https://indrajeetpatil.github.io/pairwiseComparisons/news/index.html If you are in hurry and want to reduce the time of installation, prefer- -``` r -# needed package to download from GitHub repo -install.packages("remotes") + # needed package to download from GitHub repo + install.packages("remotes") -# downloading the package from GitHub -remotes::install_github( - repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub - dependencies = FALSE, # assumes you have already installed needed packages - quick = TRUE # skips docs, demos, and vignettes -) -``` + # downloading the package from GitHub + remotes::install_github( + repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub + dependencies = FALSE, # assumes you have already installed needed packages + quick = TRUE # skips docs, demos, and vignettes + ) If time is not a constraint- -``` r -remotes::install_github( - repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub - dependencies = TRUE, # installs packages which pairwiseComparisons depends on - upgrade_dependencies = TRUE # updates any out of date dependencies -) -``` + remotes::install_github( + repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub + dependencies = TRUE, # installs packages which pairwiseComparisons depends on + upgrade_dependencies = TRUE # updates any out of date dependencies + ) -# Summary of types of statistical analyses +Summary of types of statistical analyses +======================================== Following table contains a brief summary of the currently supported pairwise comparison tests- -## Between-subjects design +Between-subjects design +----------------------- | Type | Equal variance? | Test | *p*-value adjustment? | -| -------------- | --------------- | ------------------------- | ------------------------------ | +|----------------|-----------------|---------------------------|--------------------------------| | Parametric | No | Games-Howell test | Yes | | Parametric | Yes | Student’s *t*-test | Yes | | Non-parametric | No | Dunn test | Yes | | Robust | No | Yuen’s trimmed means test | Yes | | Bayes Factor | `NA` | Student’s *t*-test | `NA` | -## Within-subjects design +Within-subjects design +---------------------- | Type | Test | *p*-value adjustment? | -| -------------- | ------------------------- | ------------------------------ | +|----------------|---------------------------|--------------------------------| | Parametric | Student’s *t*-test | Yes | | Non-parametric | Durbin-Conover test | Yes | | Robust | Yuen’s trimmed means test | Yes | | Bayes Factor | Student’s *t*-test | `NA` | -# Examples +Examples +======== Here we will see specific examples of how to use this function for different types of - - designs (between or within subjects) - - statistics (parametric, non-parametric, robust, Bayes Factor) - - *p*-value adjustment methods - -## Between-subjects design - -``` r -# for reproducibility -set.seed(123) -library(pairwiseComparisons) - -# parametric -# if `var.equal = TRUE`, then Student's *t*-test will be run -pairwise_comparisons( - data = ggplot2::msleep, - x = vore, - y = brainwt, - type = "parametric", - var.equal = TRUE, - paired = FALSE, - p.adjust.method = "bonferroni" -) -#> # A tibble: 6 x 8 -#> group1 group2 mean.difference p.value significance -#> -#> 1 carni herbi 0.542 1 ns -#> 2 carni insecti -0.0577 1 ns -#> 3 carni omni 0.0665 1 ns -#> 4 herbi insecti -0.600 1 ns -#> 5 herbi omni -0.476 0.979 ns -#> 6 insecti omni 0.124 1 ns -#> label test.details p.value.adjustment -#> -#> 1 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni -#> 2 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni -#> 3 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni -#> 4 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni -#> 5 list(~italic(p)[ adjusted ]== 0.979 ) Student's t-test Bonferroni -#> 6 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni - -# if `var.equal = FALSE`, then Games-Howell test will be run -pairwise_comparisons( - data = ggplot2::msleep, - x = vore, - y = brainwt, - type = "parametric", - var.equal = FALSE, - paired = FALSE, - p.adjust.method = "bonferroni" -) -#> # A tibble: 6 x 11 -#> group1 group2 mean.difference se t.value df p.value significance -#> -#> 1 carni insecti -0.058 0.027 1.53 10.7 1 ns -#> 2 herbi carni -0.542 0.25 1.54 19.4 1 ns -#> 3 herbi insecti -0.6 0.249 1.70 19.1 1 ns -#> 4 omni carni -0.066 0.061 0.774 21.1 1 ns -#> 5 omni herbi 0.476 0.255 1.32 20.9 1 ns -#> 6 omni insecti -0.124 0.057 1.55 17.2 1 ns -#> label test.details p.value.adjustment -#> -#> 1 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni -#> 2 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni -#> 3 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni -#> 4 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni -#> 5 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni -#> 6 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni - -# non-parametric -pairwise_comparisons( - data = ggplot2::msleep, - x = vore, - y = brainwt, - type = "nonparametric", - paired = FALSE, - p.adjust.method = "none" -) -#> # A tibble: 6 x 8 -#> group1 group2 z.value p.value significance -#> -#> 1 carni herbi 0.582 0.561 ns -#> 2 carni insecti 1.88 0.0595 ns -#> 3 carni omni 1.14 0.254 ns -#> 4 herbi insecti 1.63 0.102 ns -#> 5 herbi omni 0.717 0.474 ns -#> 6 insecti omni 1.14 0.254 ns -#> label test.details p.value.adjustment -#> -#> 1 list(~italic(p)[ unadjusted ]== 0.561 ) Dunn test None -#> 2 list(~italic(p)[ unadjusted ]== 0.060 ) Dunn test None -#> 3 list(~italic(p)[ unadjusted ]== 0.254 ) Dunn test None -#> 4 list(~italic(p)[ unadjusted ]== 0.102 ) Dunn test None -#> 5 list(~italic(p)[ unadjusted ]== 0.474 ) Dunn test None -#> 6 list(~italic(p)[ unadjusted ]== 0.254 ) Dunn test None - -# robust -pairwise_comparisons( - data = ggplot2::msleep, - x = vore, - y = brainwt, - type = "robust", - paired = FALSE, - p.adjust.method = "fdr" -) -#> # A tibble: 6 x 10 -#> group1 group2 psihat conf.low conf.high p.value significance -#> -#> 1 carni herbi -0.0530 -0.274 0.168 0.969 ns -#> 2 carni insecti 0.0577 -0.0609 0.176 0.969 ns -#> 3 carni omni 0.00210 -0.151 0.155 0.969 ns -#> 4 herbi insecti 0.111 -0.0983 0.320 0.969 ns -#> 5 herbi omni 0.0551 -0.173 0.283 0.969 ns -#> 6 insecti omni -0.0556 -0.184 0.0728 0.969 ns -#> label test.details -#> -#> 1 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test -#> 2 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test -#> 3 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test -#> 4 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test -#> 5 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test -#> 6 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test -#> p.value.adjustment -#> -#> 1 Benjamini & Hochberg -#> 2 Benjamini & Hochberg -#> 3 Benjamini & Hochberg -#> 4 Benjamini & Hochberg -#> 5 Benjamini & Hochberg -#> 6 Benjamini & Hochberg - -# Bayes Factor -pairwise_comparisons( - data = ggplot2::msleep, - x = vore, - y = brainwt, - type = "bayes", - paired = FALSE -) -#> # A tibble: 6 x 11 -#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 -#> -#> 1 omni herbi 0.571 1.75 -0.560 0.560 -0.243 0.243 -#> 2 omni carni 0.427 2.34 -0.851 0.851 -0.369 0.369 -#> 3 omni insecti 0.545 1.83 -0.606 0.606 -0.263 0.263 -#> 4 herbi carni 0.540 1.85 -0.617 0.617 -0.268 0.268 -#> 5 herbi insecti 0.540 1.85 -0.616 0.616 -0.267 0.267 -#> 6 carni insecti 0.718 1.39 -0.332 0.332 -0.144 0.144 -#> bf.prior label test.details -#> -#> 1 0.707 list(~log[e](BF[10])==-0.56) Student's t-test -#> 2 0.707 list(~log[e](BF[10])==-0.85) Student's t-test -#> 3 0.707 list(~log[e](BF[10])==-0.61) Student's t-test -#> 4 0.707 list(~log[e](BF[10])==-0.62) Student's t-test -#> 5 0.707 list(~log[e](BF[10])==-0.62) Student's t-test -#> 6 0.707 list(~log[e](BF[10])==-0.33) Student's t-test -``` - -## Within-subjects design - -``` r -# for reproducibility -set.seed(123) - -# parametric -pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "parametric", - paired = TRUE, - p.adjust.method = "BH" -) -#> # A tibble: 6 x 8 -#> group1 group2 mean.difference p.value significance -#> -#> 1 HDHF HDLF -1.15 1.06e- 3 ** -#> 2 HDHF LDHF -0.472 7.02e- 2 ns -#> 3 HDHF LDLF -2.16 3.95e-12 *** -#> 4 HDLF LDHF 0.676 6.74e- 2 ns -#> 5 HDLF LDLF -1.02 1.99e- 3 ** -#> 6 LDHF LDLF -1.69 6.66e- 9 *** -#> label test.details p.value.adjustment -#> -#> 1 list(~italic(p)[ adjusted ]== 0.001 ) Student's t-test Benjamini & Hochberg -#> 2 list(~italic(p)[ adjusted ]== 0.070 ) Student's t-test Benjamini & Hochberg -#> 3 list(~italic(p)[ adjusted ]<= 0.001 ) Student's t-test Benjamini & Hochberg -#> 4 list(~italic(p)[ adjusted ]== 0.067 ) Student's t-test Benjamini & Hochberg -#> 5 list(~italic(p)[ adjusted ]== 0.002 ) Student's t-test Benjamini & Hochberg -#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Student's t-test Benjamini & Hochberg - -# non-parametric -pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "nonparametric", - paired = TRUE, - p.adjust.method = "BY" -) -#> # A tibble: 6 x 8 -#> group1 group2 W p.value significance -#> -#> 1 HDHF HDLF 4.78 1.44e- 5 *** -#> 2 HDHF LDHF 2.44 4.47e- 2 * -#> 3 HDHF LDLF 8.01 5.45e-13 *** -#> 4 HDLF LDHF 2.34 4.96e- 2 * -#> 5 HDLF LDLF 3.23 5.05e- 3 ** -#> 6 LDHF LDLF 5.57 4.64e- 7 *** -#> label test.details -#> -#> 1 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test -#> 2 list(~italic(p)[ adjusted ]== 0.045 ) Durbin-Conover test -#> 3 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test -#> 4 list(~italic(p)[ adjusted ]== 0.050 ) Durbin-Conover test -#> 5 list(~italic(p)[ adjusted ]== 0.005 ) Durbin-Conover test -#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test -#> p.value.adjustment -#> -#> 1 Benjamini & Yekutieli -#> 2 Benjamini & Yekutieli -#> 3 Benjamini & Yekutieli -#> 4 Benjamini & Yekutieli -#> 5 Benjamini & Yekutieli -#> 6 Benjamini & Yekutieli - -# robust -pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "robust", - paired = TRUE, - p.adjust.method = "hommel" -) -#> # A tibble: 6 x 10 -#> group1 group2 psihat conf.low conf.high p.value significance -#> -#> 1 HDLF HDHF -1.16 -2.00 -0.318 1.49e- 3 ** -#> 2 LDHF HDHF -0.5 -1.19 0.188 6.20e- 2 ns -#> 3 LDHF HDLF 0.701 -0.303 1.71 6.20e- 2 ns -#> 4 LDLF HDHF -2.10 -2.82 -1.37 1.79e-10 *** -#> 5 LDLF HDLF -0.938 -1.81 -0.0694 1.36e- 2 * -#> 6 LDLF LDHF -1.54 -2.27 -0.810 1.16e- 6 *** -#> label test.details -#> -#> 1 list(~italic(p)[ adjusted ]== 0.001 ) Yuen's trimmed means test -#> 2 list(~italic(p)[ adjusted ]== 0.062 ) Yuen's trimmed means test -#> 3 list(~italic(p)[ adjusted ]== 0.062 ) Yuen's trimmed means test -#> 4 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test -#> 5 list(~italic(p)[ adjusted ]== 0.014 ) Yuen's trimmed means test -#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test -#> p.value.adjustment -#> -#> 1 Hommel -#> 2 Hommel -#> 3 Hommel -#> 4 Hommel -#> 5 Hommel -#> 6 Hommel - -# Bayes Factor -pairwise_comparisons( - data = WRS2::WineTasting, - x = Wine, - y = Taste, - type = "bayes", - paired = TRUE, - bf.prior = 0.77 -) -#> # A tibble: 3 x 11 -#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 -#> -#> 1 Wine A Wine B 0.219 4.57 -1.52 1.52 -0.660 0.660 -#> 2 Wine A Wine C 3.60 0.277 1.28 -1.28 0.557 -0.557 -#> 3 Wine B Wine C 50.5 0.0198 3.92 -3.92 1.70 -1.70 -#> bf.prior label test.details -#> -#> 1 0.77 list(~log[e](BF[10])==-1.52) Student's t-test -#> 2 0.77 list(~log[e](BF[10])==1.28) Student's t-test -#> 3 0.77 list(~log[e](BF[10])==3.92) Student's t-test -``` - -# Using `pairwiseComparisons` with `ggsignif` to display results - -## Example-1: between-subjects - -``` r -# needed libraries -library(ggplot2) -library(pairwiseComparisons) -library(ggsignif) - -# converting to factor -mtcars$cyl <- as.factor(mtcars$cyl) - -# creating a basic plot -p <- ggplot(mtcars, aes(cyl, wt)) + geom_boxplot() - -# using `pairwiseComparisons` package to create a dataframe with results -(df <- - pairwise_comparisons(mtcars, cyl, wt, messages = FALSE) %>% - dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>% - dplyr::arrange(.data = ., group1)) -#> # A tibble: 3 x 12 -#> group1 group2 mean.difference se t.value df p.value significance -#> -#> 1 4 8 1.71 0.188 6.44 23.0 0 *** -#> 2 6 4 -0.831 0.154 3.81 16.0 0.008 ** -#> 3 6 8 0.882 0.172 3.62 19.0 0.008 ** -#> label test.details p.value.adjustment -#> -#> 1 list(~italic(p)[ adjusted ]<= 0.001 ) Games-Howell test Holm -#> 2 list(~italic(p)[ adjusted ]== 0.008 ) Games-Howell test Holm -#> 3 list(~italic(p)[ adjusted ]== 0.008 ) Games-Howell test Holm -#> groups -#> -#> 1 -#> 2 -#> 3 - -# using `geom_signif` to display results -p + - ggsignif::geom_signif( - comparisons = df$groups, - map_signif_level = TRUE, - tip_length = 0.01, - y_position = c(5.5, 5.75, 6), - annotations = df$label, - test = NULL, - na.rm = TRUE, - parse = TRUE - ) -``` +- designs (between or within subjects) +- statistics (parametric, non-parametric, robust, Bayes Factor) +- *p*-value adjustment methods + +Between-subjects design +----------------------- + + # for reproducibility + set.seed(123) + library(pairwiseComparisons) + + # parametric + # if `var.equal = TRUE`, then Student's *t*-test will be run + pairwise_comparisons( + data = ggplot2::msleep, + x = vore, + y = brainwt, + type = "parametric", + var.equal = TRUE, + paired = FALSE, + p.adjust.method = "bonferroni" + ) + #> # A tibble: 6 x 8 + #> group1 group2 mean.difference p.value significance + #> + #> 1 carni herbi 0.542 1 ns + #> 2 carni insecti -0.0577 1 ns + #> 3 carni omni 0.0665 1 ns + #> 4 herbi insecti -0.600 1 ns + #> 5 herbi omni -0.476 0.979 ns + #> 6 insecti omni 0.124 1 ns + #> label test.details p.value.adjustment + #> + #> 1 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni + #> 2 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni + #> 3 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni + #> 4 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni + #> 5 list(~italic(p)[adjusted]==0.979) Student's t-test Bonferroni + #> 6 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni + + # if `var.equal = FALSE`, then Games-Howell test will be run + pairwise_comparisons( + data = ggplot2::msleep, + x = vore, + y = brainwt, + type = "parametric", + var.equal = FALSE, + paired = FALSE, + p.adjust.method = "bonferroni" + ) + #> # A tibble: 6 x 11 + #> group1 group2 mean.difference se t.value df p.value significance + #> + #> 1 carni herbi 0.542 0.25 1.54 19.4 1 ns + #> 2 carni insecti -0.058 0.027 1.53 10.7 1 ns + #> 3 carni omni 0.066 0.061 0.774 21.1 1 ns + #> 4 herbi insecti -0.6 0.249 1.70 19.1 1 ns + #> 5 herbi omni -0.476 0.255 1.32 20.9 1 ns + #> 6 insecti omni 0.124 0.057 1.55 17.2 1 ns + #> label test.details p.value.adjustment + #> + #> 1 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni + #> 2 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni + #> 3 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni + #> 4 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni + #> 5 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni + #> 6 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni + + # non-parametric + pairwise_comparisons( + data = ggplot2::msleep, + x = vore, + y = brainwt, + type = "nonparametric", + paired = FALSE, + p.adjust.method = "none" + ) + #> # A tibble: 6 x 8 + #> group1 group2 z.value p.value significance + #> + #> 1 carni herbi 0.582 0.561 ns + #> 2 carni insecti 1.88 0.0595 ns + #> 3 carni omni 1.14 0.254 ns + #> 4 herbi insecti 1.63 0.102 ns + #> 5 herbi omni 0.717 0.474 ns + #> 6 insecti omni 1.14 0.254 ns + #> label test.details p.value.adjustment + #> + #> 1 list(~italic(p)[unadjusted]==0.561) Dunn test None + #> 2 list(~italic(p)[unadjusted]==0.060) Dunn test None + #> 3 list(~italic(p)[unadjusted]==0.254) Dunn test None + #> 4 list(~italic(p)[unadjusted]==0.102) Dunn test None + #> 5 list(~italic(p)[unadjusted]==0.474) Dunn test None + #> 6 list(~italic(p)[unadjusted]==0.254) Dunn test None + + # robust + pairwise_comparisons( + data = ggplot2::msleep, + x = vore, + y = brainwt, + type = "robust", + paired = FALSE, + p.adjust.method = "fdr" + ) + #> # A tibble: 6 x 10 + #> group1 group2 psihat conf.low conf.high p.value significance + #> + #> 1 carni herbi -0.0530 -0.274 0.168 0.969 ns + #> 2 carni insecti 0.0577 -0.0609 0.176 0.969 ns + #> 3 carni omni 0.00210 -0.151 0.155 0.969 ns + #> 4 herbi insecti 0.111 -0.0983 0.320 0.969 ns + #> 5 herbi omni 0.0551 -0.173 0.283 0.969 ns + #> 6 insecti omni -0.0556 -0.184 0.0728 0.969 ns + #> label test.details + #> + #> 1 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test + #> 2 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test + #> 3 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test + #> 4 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test + #> 5 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test + #> 6 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test + #> p.value.adjustment + #> + #> 1 Benjamini & Hochberg + #> 2 Benjamini & Hochberg + #> 3 Benjamini & Hochberg + #> 4 Benjamini & Hochberg + #> 5 Benjamini & Hochberg + #> 6 Benjamini & Hochberg + + # Bayes Factor + pairwise_comparisons( + data = ggplot2::msleep, + x = vore, + y = brainwt, + type = "bayes", + paired = FALSE + ) + #> # A tibble: 6 x 11 + #> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 + #> + #> 1 carni herbi 0.540 1.85 -0.617 0.617 -0.268 0.268 + #> 2 carni insecti 0.718 1.39 -0.332 0.332 -0.144 0.144 + #> 3 carni omni 0.427 2.34 -0.851 0.851 -0.369 0.369 + #> 4 herbi insecti 0.540 1.85 -0.616 0.616 -0.267 0.267 + #> 5 herbi omni 0.571 1.75 -0.560 0.560 -0.243 0.243 + #> 6 insecti omni 0.545 1.83 -0.606 0.606 -0.263 0.263 + #> bf.prior label test.details + #> + #> 1 0.707 list(~log[e](BF[10])==-0.62) Student's t-test + #> 2 0.707 list(~log[e](BF[10])==-0.33) Student's t-test + #> 3 0.707 list(~log[e](BF[10])==-0.85) Student's t-test + #> 4 0.707 list(~log[e](BF[10])==-0.62) Student's t-test + #> 5 0.707 list(~log[e](BF[10])==-0.56) Student's t-test + #> 6 0.707 list(~log[e](BF[10])==-0.61) Student's t-test + +Within-subjects design +---------------------- + + # for reproducibility + set.seed(123) + + # parametric + pairwise_comparisons( + data = bugs_long, + x = condition, + y = desire, + type = "parametric", + paired = TRUE, + p.adjust.method = "BH" + ) + #> # A tibble: 6 x 8 + #> group1 group2 mean.difference p.value significance + #> + #> 1 HDHF HDLF -1.15 1.06e- 3 ** + #> 2 HDHF LDHF -0.472 7.02e- 2 ns + #> 3 HDHF LDLF -2.16 3.95e-12 *** + #> 4 HDLF LDHF 0.676 6.74e- 2 ns + #> 5 HDLF LDLF -1.02 1.99e- 3 ** + #> 6 LDHF LDLF -1.69 6.66e- 9 *** + #> label test.details p.value.adjustment + #> + #> 1 list(~italic(p)[adjusted]==0.001) Student's t-test Benjamini & Hochberg + #> 2 list(~italic(p)[adjusted]==0.070) Student's t-test Benjamini & Hochberg + #> 3 list(~italic(p)[adjusted]<=0.001) Student's t-test Benjamini & Hochberg + #> 4 list(~italic(p)[adjusted]==0.067) Student's t-test Benjamini & Hochberg + #> 5 list(~italic(p)[adjusted]==0.002) Student's t-test Benjamini & Hochberg + #> 6 list(~italic(p)[adjusted]<=0.001) Student's t-test Benjamini & Hochberg + + # non-parametric + pairwise_comparisons( + data = bugs_long, + x = condition, + y = desire, + type = "nonparametric", + paired = TRUE, + p.adjust.method = "BY" + ) + #> # A tibble: 6 x 8 + #> group1 group2 W p.value significance label + #> + #> 1 HDHF HDLF 4.78 1.44e- 5 *** list(~italic(p)[adjusted]<=0.001) + #> 2 HDHF LDHF 2.44 4.47e- 2 * list(~italic(p)[adjusted]==0.045) + #> 3 HDHF LDLF 8.01 5.45e-13 *** list(~italic(p)[adjusted]<=0.001) + #> 4 HDLF LDHF 2.34 4.96e- 2 * list(~italic(p)[adjusted]==0.050) + #> 5 HDLF LDLF 3.23 5.05e- 3 ** list(~italic(p)[adjusted]==0.005) + #> 6 LDHF LDLF 5.57 4.64e- 7 *** list(~italic(p)[adjusted]<=0.001) + #> test.details p.value.adjustment + #> + #> 1 Durbin-Conover test Benjamini & Yekutieli + #> 2 Durbin-Conover test Benjamini & Yekutieli + #> 3 Durbin-Conover test Benjamini & Yekutieli + #> 4 Durbin-Conover test Benjamini & Yekutieli + #> 5 Durbin-Conover test Benjamini & Yekutieli + #> 6 Durbin-Conover test Benjamini & Yekutieli + + # robust + pairwise_comparisons( + data = bugs_long, + x = condition, + y = desire, + type = "robust", + paired = TRUE, + p.adjust.method = "hommel" + ) + #> # A tibble: 6 x 10 + #> group1 group2 psihat conf.low conf.high p.value significance + #> + #> 1 HDHF HDLF 1.16 0.318 2.00 1.49e- 3 ** + #> 2 HDHF LDHF 0.5 -0.188 1.19 6.20e- 2 ns + #> 3 HDHF LDLF 2.10 1.37 2.82 1.79e-10 *** + #> 4 HDLF LDHF -0.701 -1.71 0.303 6.20e- 2 ns + #> 5 HDLF LDLF 0.938 0.0694 1.81 1.36e- 2 * + #> 6 LDHF LDLF 1.54 0.810 2.27 1.16e- 6 *** + #> label test.details p.value.adjustment + #> + #> 1 list(~italic(p)[adjusted]==0.001) Yuen's trimmed means test Hommel + #> 2 list(~italic(p)[adjusted]==0.062) Yuen's trimmed means test Hommel + #> 3 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test Hommel + #> 4 list(~italic(p)[adjusted]==0.062) Yuen's trimmed means test Hommel + #> 5 list(~italic(p)[adjusted]==0.014) Yuen's trimmed means test Hommel + #> 6 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test Hommel + + # Bayes Factor + pairwise_comparisons( + data = WRS2::WineTasting, + x = Wine, + y = Taste, + type = "bayes", + paired = TRUE, + bf.prior = 0.77 + ) + #> # A tibble: 3 x 11 + #> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 + #> + #> 1 Wine A Wine B 0.219 4.57 -1.52 1.52 -0.660 0.660 + #> 2 Wine A Wine C 3.60 0.277 1.28 -1.28 0.557 -0.557 + #> 3 Wine B Wine C 50.5 0.0198 3.92 -3.92 1.70 -1.70 + #> bf.prior label test.details + #> + #> 1 0.77 list(~log[e](BF[10])==-1.52) Student's t-test + #> 2 0.77 list(~log[e](BF[10])==1.28) Student's t-test + #> 3 0.77 list(~log[e](BF[10])==3.92) Student's t-test + +Using `pairwiseComparisons` with `ggsignif` to display results +============================================================== + +Example-1: between-subjects +--------------------------- + + # needed libraries + library(ggplot2) + library(pairwiseComparisons) + library(ggsignif) + + # converting to factor + mtcars$cyl <- as.factor(mtcars$cyl) + + # creating a basic plot + p <- ggplot(mtcars, aes(cyl, wt)) + + geom_boxplot() + + # using `pairwiseComparisons` package to create a dataframe with results + (df <- + pairwise_comparisons(mtcars, cyl, wt, messages = FALSE) %>% + dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>% + dplyr::arrange(.data = ., group1)) + #> # A tibble: 3 x 12 + #> group1 group2 mean.difference se t.value df p.value significance + #> + #> 1 4 6 0.831 0.154 3.81 16.0 0.008 ** + #> 2 4 8 1.71 0.188 6.44 23.0 0 *** + #> 3 6 8 0.882 0.172 3.62 19.0 0.008 ** + #> label test.details p.value.adjustment + #> + #> 1 list(~italic(p)[adjusted]==0.008) Games-Howell test Holm + #> 2 list(~italic(p)[adjusted]<=0.001) Games-Howell test Holm + #> 3 list(~italic(p)[adjusted]==0.008) Games-Howell test Holm + #> groups + #> + #> 1 + #> 2 + #> 3 + + # using `geom_signif` to display results + p + + ggsignif::geom_signif( + comparisons = df$groups, + map_signif_level = TRUE, + tip_length = 0.01, + y_position = c(5.5, 5.75, 6), + annotations = df$label, + test = NULL, + na.rm = TRUE, + parse = TRUE + ) -## Example-2: within-subjects - -``` r -# needed libraries -library(ggplot2) -library(pairwiseComparisons) -library(ggsignif) - -# creating a basic plot -p <- ggplot(WRS2::WineTasting, aes(Wine, Taste)) + geom_boxplot() - -# using `pairwiseComparisons` package to create a dataframe with results -(df <- - pairwise_comparisons(WRS2::WineTasting, Wine, Taste, type = "bayes", paired = TRUE) %>% - dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>% - dplyr::arrange(.data = ., group1)) -#> # A tibble: 3 x 12 -#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 -#> -#> 1 Wine A Wine B 0.235 4.25 -1.45 1.45 -0.628 0.628 -#> 2 Wine A Wine C 3.71 0.269 1.31 -1.31 0.570 -0.570 -#> 3 Wine B Wine C 50.5 0.0198 3.92 -3.92 1.70 -1.70 -#> bf.prior label test.details groups -#> -#> 1 0.707 list(~log[e](BF[10])==-1.45) Student's t-test -#> 2 0.707 list(~log[e](BF[10])==1.31) Student's t-test -#> 3 0.707 list(~log[e](BF[10])==3.92) Student's t-test - -# using `geom_signif` to display results -p + - ggsignif::geom_signif( - comparisons = df$groups, - map_signif_level = TRUE, - tip_length = 0.01, - y_position = c(6.5, 6.65, 6.8), - annotations = df$label, - test = NULL, - na.rm = TRUE, - parse = TRUE - ) -``` +Example-2: within-subjects +-------------------------- + + # needed libraries + library(ggplot2) + library(pairwiseComparisons) + library(ggsignif) + + # creating a basic plot + p <- ggplot(WRS2::WineTasting, aes(Wine, Taste)) + geom_boxplot() + + # using `pairwiseComparisons` package to create a dataframe with results + (df <- + pairwise_comparisons(WRS2::WineTasting, Wine, Taste, type = "bayes", paired = TRUE) %>% + dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>% + dplyr::arrange(.data = ., group1)) + #> # A tibble: 3 x 12 + #> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 + #> + #> 1 Wine A Wine B 0.235 4.25 -1.45 1.45 -0.628 0.628 + #> 2 Wine A Wine C 3.71 0.269 1.31 -1.31 0.570 -0.570 + #> 3 Wine B Wine C 50.5 0.0198 3.92 -3.92 1.70 -1.70 + #> bf.prior label test.details groups + #> + #> 1 0.707 list(~log[e](BF[10])==-1.45) Student's t-test + #> 2 0.707 list(~log[e](BF[10])==1.31) Student's t-test + #> 3 0.707 list(~log[e](BF[10])==3.92) Student's t-test + + # using `geom_signif` to display results + p + + ggsignif::geom_signif( + comparisons = df$groups, + map_signif_level = TRUE, + tip_length = 0.01, + y_position = c(6.5, 6.65, 6.8), + annotations = df$label, + test = NULL, + na.rm = TRUE, + parse = TRUE + ) -# Acknowledgments +Acknowledgments +=============== The hexsticker was generously designed by Sarah Otterstetter (Max Planck Institute for Human Development, Berlin). -# Contributing +Contributing +============ I’m happy to receive bug reports, suggestions, questions, and (most of all) contributions to fix problems and add features. I personally prefer @@ -486,15 +471,14 @@ are encouraged. Here are some simple ways in which you can contribute (in the increasing order of commitment): - - Read and correct any inconsistencies in the +- Read and correct any inconsistencies in the [documentation](https://indrajeetpatil.github.io/pairwiseComparisons/) - - Raise issues about bugs or wanted features +- Raise issues about bugs or wanted features - - Review code +- Review code - - Add new functionality (in the form of new plotting functions or - helpers for preparing subtitles) +- Add new functionality Please note that this project is released with a [Contributor Code of Conduct](https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/.github/CODE_OF_CONDUCT.md). diff --git a/appveyor.yml b/appveyor.yml index c6cc3c1..7282e3a 100644 --- a/appveyor.yml +++ b/appveyor.yml @@ -31,6 +31,7 @@ environment: R_ARCH: x64 GCC_PATH: mingw_64 + # `utf8` not available # - R_VERSION: devel # R_ARCH: x64 # GCC_PATH: mingw_64 diff --git a/codemeta.json b/codemeta.json index 4da7a66..ac88329 100644 --- a/codemeta.json +++ b/codemeta.json @@ -14,13 +14,13 @@ ], "issueTracker": "\n https://github.com/IndrajeetPatil/pairwiseComparisons/issues", "license": "https://spdx.org/licenses/GPL-3.0", - "version": "1.1.2.9000", + "version": "2.0.0", "programmingLanguage": { "@type": "ComputerLanguage", "name": "R", "url": "https://r-project.org" }, - "runtimePlatform": "R Under development (unstable) (2020-06-27 r78747)", + "runtimePlatform": "R Under development (unstable) (2020-09-01 r79114)", "author": [ { "@type": "Person", @@ -255,7 +255,7 @@ ], "releaseNotes": "https://github.com/IndrajeetPatil/pairwiseComparisons/blob/master/NEWS.md", "contIntegration": ["https://travis-ci.org/IndrajeetPatil/pairwiseComparisons", "https://ci.appveyor.com/project/IndrajeetPatil/pairwiseComparisons", "https://coveralls.io/github/IndrajeetPatil/pairwiseComparisons?branch=master", "https://codecov.io/gh/IndrajeetPatil/pairwiseComparisons?branch=master"], - "developmentStatus": ["https://www.tidyverse.org/lifecycle/", "http://www.repostatus.org/#active"], + "developmentStatus": ["https://www.tidyverse.org/lifecycle/", "https://www.repostatus.org/#active"], "citation": [ { "@type": "SoftwareSourceCode", @@ -278,5 +278,5 @@ "name": "Comprehensive R Archive Network (CRAN)", "url": "https://cran.r-project.org" }, - "fileSize": "1487.595KB" + "fileSize": "1320.873KB" } diff --git a/cran-comments.md b/cran-comments.md index fc3bff3..f5fec68 100644 --- a/cran-comments.md +++ b/cran-comments.md @@ -5,7 +5,7 @@ ## R CMD check results -0 errors | 0 warnings | 1 note +0 errors | 0 warnings | 0 note - - I see 1 `NOTE`: "Days since last update: 2" - This is a hot fix release to address failing tests on the old release of `R` (`3.6`). \ No newline at end of file + - Fixes a bug which affected results for within-subjects design when the + dataframe wasn't sorted by `x`. diff --git a/data-raw/bugs_long.R b/data-raw/bugs_long.R deleted file mode 100644 index 2ae4f36..0000000 --- a/data-raw/bugs_long.R +++ /dev/null @@ -1,18 +0,0 @@ -# loading the needed libraries -library(jmv) -library(tibble) -library(tidyr) - -# loading dataset -data("bugs", package = "jmv") - -# converting to long format -bugs_long <- bugs %>% - tibble::as_tibble(.) %>% - tidyr::gather(data = ., key = "condition", value = "desire", LDLF:HDHF) - -# all column names in lower case -names(bugs_long) <- tolower(names(bugs_long)) - -# saving the data -save(bugs_long, file = "data/bugs_long.rdata") diff --git a/data-raw/iris_long.R b/data-raw/iris_long.R deleted file mode 100644 index 21b8960..0000000 --- a/data-raw/iris_long.R +++ /dev/null @@ -1,50 +0,0 @@ -# needed libraries -library(dplyr) -library(tidyr) -library(readr) -library(purrr) - -# for reproducibility -set.seed(123) - -# having a look at iris before converting to long format -dplyr::glimpse(iris) - -# converting the iris dataset to long format -iris_long <- datasets::iris %>% - dplyr::mutate(.data = ., id = dplyr::row_number(x = Species)) %>% - tidyr::gather( - data = ., - key = "condition", - value = "value", - Sepal.Length:Petal.Width, - convert = TRUE, - factor_key = TRUE - ) %>% - tidyr::separate( - col = "condition", - into = c("attribute", "measure"), - remove = FALSE, - sep = "\\.", - convert = TRUE - ) %>% - # converting column types - dplyr::mutate_if( - .tbl = ., - .predicate = purrr::is_bare_character, - .funs = ~ base::as.factor(.) - ) %>% - dplyr::mutate_if( - .tbl = ., - .predicate = base::is.factor, - .funs = ~ base::droplevels(.) - ) %>% - dplyr::select(.data = ., id, dplyr::everything()) %>% - tibble::as_tibble(x = .) - -# looking at the long format data -dplyr::glimpse(x = iris_long) - -# saving the files -readr::write_csv(x = iris_long, path = "data-raw/iris_long.csv") -base::save(iris_long, file = "data/iris_long.rdata") diff --git a/data-raw/iris_long.csv b/data-raw/iris_long.csv deleted file mode 100644 index b29e177..0000000 --- a/data-raw/iris_long.csv +++ /dev/null @@ -1,601 +0,0 @@ -id,Species,condition,attribute,measure,value -1,setosa,Sepal.Length,Sepal,Length,5.1 -2,setosa,Sepal.Length,Sepal,Length,4.9 -3,setosa,Sepal.Length,Sepal,Length,4.7 -4,setosa,Sepal.Length,Sepal,Length,4.6 -5,setosa,Sepal.Length,Sepal,Length,5 -6,setosa,Sepal.Length,Sepal,Length,5.4 -7,setosa,Sepal.Length,Sepal,Length,4.6 -8,setosa,Sepal.Length,Sepal,Length,5 -9,setosa,Sepal.Length,Sepal,Length,4.4 -10,setosa,Sepal.Length,Sepal,Length,4.9 -11,setosa,Sepal.Length,Sepal,Length,5.4 -12,setosa,Sepal.Length,Sepal,Length,4.8 -13,setosa,Sepal.Length,Sepal,Length,4.8 -14,setosa,Sepal.Length,Sepal,Length,4.3 -15,setosa,Sepal.Length,Sepal,Length,5.8 -16,setosa,Sepal.Length,Sepal,Length,5.7 -17,setosa,Sepal.Length,Sepal,Length,5.4 -18,setosa,Sepal.Length,Sepal,Length,5.1 -19,setosa,Sepal.Length,Sepal,Length,5.7 -20,setosa,Sepal.Length,Sepal,Length,5.1 -21,setosa,Sepal.Length,Sepal,Length,5.4 -22,setosa,Sepal.Length,Sepal,Length,5.1 -23,setosa,Sepal.Length,Sepal,Length,4.6 -24,setosa,Sepal.Length,Sepal,Length,5.1 -25,setosa,Sepal.Length,Sepal,Length,4.8 -26,setosa,Sepal.Length,Sepal,Length,5 -27,setosa,Sepal.Length,Sepal,Length,5 -28,setosa,Sepal.Length,Sepal,Length,5.2 -29,setosa,Sepal.Length,Sepal,Length,5.2 -30,setosa,Sepal.Length,Sepal,Length,4.7 -31,setosa,Sepal.Length,Sepal,Length,4.8 -32,setosa,Sepal.Length,Sepal,Length,5.4 -33,setosa,Sepal.Length,Sepal,Length,5.2 -34,setosa,Sepal.Length,Sepal,Length,5.5 -35,setosa,Sepal.Length,Sepal,Length,4.9 -36,setosa,Sepal.Length,Sepal,Length,5 -37,setosa,Sepal.Length,Sepal,Length,5.5 -38,setosa,Sepal.Length,Sepal,Length,4.9 -39,setosa,Sepal.Length,Sepal,Length,4.4 -40,setosa,Sepal.Length,Sepal,Length,5.1 -41,setosa,Sepal.Length,Sepal,Length,5 -42,setosa,Sepal.Length,Sepal,Length,4.5 -43,setosa,Sepal.Length,Sepal,Length,4.4 -44,setosa,Sepal.Length,Sepal,Length,5 -45,setosa,Sepal.Length,Sepal,Length,5.1 -46,setosa,Sepal.Length,Sepal,Length,4.8 -47,setosa,Sepal.Length,Sepal,Length,5.1 -48,setosa,Sepal.Length,Sepal,Length,4.6 -49,setosa,Sepal.Length,Sepal,Length,5.3 -50,setosa,Sepal.Length,Sepal,Length,5 -51,versicolor,Sepal.Length,Sepal,Length,7 -52,versicolor,Sepal.Length,Sepal,Length,6.4 -53,versicolor,Sepal.Length,Sepal,Length,6.9 -54,versicolor,Sepal.Length,Sepal,Length,5.5 -55,versicolor,Sepal.Length,Sepal,Length,6.5 -56,versicolor,Sepal.Length,Sepal,Length,5.7 -57,versicolor,Sepal.Length,Sepal,Length,6.3 -58,versicolor,Sepal.Length,Sepal,Length,4.9 -59,versicolor,Sepal.Length,Sepal,Length,6.6 -60,versicolor,Sepal.Length,Sepal,Length,5.2 -61,versicolor,Sepal.Length,Sepal,Length,5 -62,versicolor,Sepal.Length,Sepal,Length,5.9 -63,versicolor,Sepal.Length,Sepal,Length,6 -64,versicolor,Sepal.Length,Sepal,Length,6.1 -65,versicolor,Sepal.Length,Sepal,Length,5.6 -66,versicolor,Sepal.Length,Sepal,Length,6.7 -67,versicolor,Sepal.Length,Sepal,Length,5.6 -68,versicolor,Sepal.Length,Sepal,Length,5.8 -69,versicolor,Sepal.Length,Sepal,Length,6.2 -70,versicolor,Sepal.Length,Sepal,Length,5.6 -71,versicolor,Sepal.Length,Sepal,Length,5.9 -72,versicolor,Sepal.Length,Sepal,Length,6.1 -73,versicolor,Sepal.Length,Sepal,Length,6.3 -74,versicolor,Sepal.Length,Sepal,Length,6.1 -75,versicolor,Sepal.Length,Sepal,Length,6.4 -76,versicolor,Sepal.Length,Sepal,Length,6.6 -77,versicolor,Sepal.Length,Sepal,Length,6.8 -78,versicolor,Sepal.Length,Sepal,Length,6.7 -79,versicolor,Sepal.Length,Sepal,Length,6 -80,versicolor,Sepal.Length,Sepal,Length,5.7 -81,versicolor,Sepal.Length,Sepal,Length,5.5 -82,versicolor,Sepal.Length,Sepal,Length,5.5 -83,versicolor,Sepal.Length,Sepal,Length,5.8 -84,versicolor,Sepal.Length,Sepal,Length,6 -85,versicolor,Sepal.Length,Sepal,Length,5.4 -86,versicolor,Sepal.Length,Sepal,Length,6 -87,versicolor,Sepal.Length,Sepal,Length,6.7 -88,versicolor,Sepal.Length,Sepal,Length,6.3 -89,versicolor,Sepal.Length,Sepal,Length,5.6 -90,versicolor,Sepal.Length,Sepal,Length,5.5 -91,versicolor,Sepal.Length,Sepal,Length,5.5 -92,versicolor,Sepal.Length,Sepal,Length,6.1 -93,versicolor,Sepal.Length,Sepal,Length,5.8 -94,versicolor,Sepal.Length,Sepal,Length,5 -95,versicolor,Sepal.Length,Sepal,Length,5.6 -96,versicolor,Sepal.Length,Sepal,Length,5.7 -97,versicolor,Sepal.Length,Sepal,Length,5.7 -98,versicolor,Sepal.Length,Sepal,Length,6.2 -99,versicolor,Sepal.Length,Sepal,Length,5.1 -100,versicolor,Sepal.Length,Sepal,Length,5.7 -101,virginica,Sepal.Length,Sepal,Length,6.3 -102,virginica,Sepal.Length,Sepal,Length,5.8 -103,virginica,Sepal.Length,Sepal,Length,7.1 -104,virginica,Sepal.Length,Sepal,Length,6.3 -105,virginica,Sepal.Length,Sepal,Length,6.5 -106,virginica,Sepal.Length,Sepal,Length,7.6 -107,virginica,Sepal.Length,Sepal,Length,4.9 -108,virginica,Sepal.Length,Sepal,Length,7.3 -109,virginica,Sepal.Length,Sepal,Length,6.7 -110,virginica,Sepal.Length,Sepal,Length,7.2 -111,virginica,Sepal.Length,Sepal,Length,6.5 -112,virginica,Sepal.Length,Sepal,Length,6.4 -113,virginica,Sepal.Length,Sepal,Length,6.8 -114,virginica,Sepal.Length,Sepal,Length,5.7 -115,virginica,Sepal.Length,Sepal,Length,5.8 -116,virginica,Sepal.Length,Sepal,Length,6.4 -117,virginica,Sepal.Length,Sepal,Length,6.5 -118,virginica,Sepal.Length,Sepal,Length,7.7 -119,virginica,Sepal.Length,Sepal,Length,7.7 -120,virginica,Sepal.Length,Sepal,Length,6 -121,virginica,Sepal.Length,Sepal,Length,6.9 -122,virginica,Sepal.Length,Sepal,Length,5.6 -123,virginica,Sepal.Length,Sepal,Length,7.7 -124,virginica,Sepal.Length,Sepal,Length,6.3 -125,virginica,Sepal.Length,Sepal,Length,6.7 -126,virginica,Sepal.Length,Sepal,Length,7.2 -127,virginica,Sepal.Length,Sepal,Length,6.2 -128,virginica,Sepal.Length,Sepal,Length,6.1 -129,virginica,Sepal.Length,Sepal,Length,6.4 -130,virginica,Sepal.Length,Sepal,Length,7.2 -131,virginica,Sepal.Length,Sepal,Length,7.4 -132,virginica,Sepal.Length,Sepal,Length,7.9 -133,virginica,Sepal.Length,Sepal,Length,6.4 -134,virginica,Sepal.Length,Sepal,Length,6.3 -135,virginica,Sepal.Length,Sepal,Length,6.1 -136,virginica,Sepal.Length,Sepal,Length,7.7 -137,virginica,Sepal.Length,Sepal,Length,6.3 -138,virginica,Sepal.Length,Sepal,Length,6.4 -139,virginica,Sepal.Length,Sepal,Length,6 -140,virginica,Sepal.Length,Sepal,Length,6.9 -141,virginica,Sepal.Length,Sepal,Length,6.7 -142,virginica,Sepal.Length,Sepal,Length,6.9 -143,virginica,Sepal.Length,Sepal,Length,5.8 -144,virginica,Sepal.Length,Sepal,Length,6.8 -145,virginica,Sepal.Length,Sepal,Length,6.7 -146,virginica,Sepal.Length,Sepal,Length,6.7 -147,virginica,Sepal.Length,Sepal,Length,6.3 -148,virginica,Sepal.Length,Sepal,Length,6.5 -149,virginica,Sepal.Length,Sepal,Length,6.2 -150,virginica,Sepal.Length,Sepal,Length,5.9 -1,setosa,Sepal.Width,Sepal,Width,3.5 -2,setosa,Sepal.Width,Sepal,Width,3 -3,setosa,Sepal.Width,Sepal,Width,3.2 -4,setosa,Sepal.Width,Sepal,Width,3.1 -5,setosa,Sepal.Width,Sepal,Width,3.6 -6,setosa,Sepal.Width,Sepal,Width,3.9 -7,setosa,Sepal.Width,Sepal,Width,3.4 -8,setosa,Sepal.Width,Sepal,Width,3.4 -9,setosa,Sepal.Width,Sepal,Width,2.9 -10,setosa,Sepal.Width,Sepal,Width,3.1 -11,setosa,Sepal.Width,Sepal,Width,3.7 -12,setosa,Sepal.Width,Sepal,Width,3.4 -13,setosa,Sepal.Width,Sepal,Width,3 -14,setosa,Sepal.Width,Sepal,Width,3 -15,setosa,Sepal.Width,Sepal,Width,4 -16,setosa,Sepal.Width,Sepal,Width,4.4 -17,setosa,Sepal.Width,Sepal,Width,3.9 -18,setosa,Sepal.Width,Sepal,Width,3.5 -19,setosa,Sepal.Width,Sepal,Width,3.8 -20,setosa,Sepal.Width,Sepal,Width,3.8 -21,setosa,Sepal.Width,Sepal,Width,3.4 -22,setosa,Sepal.Width,Sepal,Width,3.7 -23,setosa,Sepal.Width,Sepal,Width,3.6 -24,setosa,Sepal.Width,Sepal,Width,3.3 -25,setosa,Sepal.Width,Sepal,Width,3.4 -26,setosa,Sepal.Width,Sepal,Width,3 -27,setosa,Sepal.Width,Sepal,Width,3.4 -28,setosa,Sepal.Width,Sepal,Width,3.5 -29,setosa,Sepal.Width,Sepal,Width,3.4 -30,setosa,Sepal.Width,Sepal,Width,3.2 -31,setosa,Sepal.Width,Sepal,Width,3.1 -32,setosa,Sepal.Width,Sepal,Width,3.4 -33,setosa,Sepal.Width,Sepal,Width,4.1 -34,setosa,Sepal.Width,Sepal,Width,4.2 -35,setosa,Sepal.Width,Sepal,Width,3.1 -36,setosa,Sepal.Width,Sepal,Width,3.2 -37,setosa,Sepal.Width,Sepal,Width,3.5 -38,setosa,Sepal.Width,Sepal,Width,3.6 -39,setosa,Sepal.Width,Sepal,Width,3 -40,setosa,Sepal.Width,Sepal,Width,3.4 -41,setosa,Sepal.Width,Sepal,Width,3.5 -42,setosa,Sepal.Width,Sepal,Width,2.3 -43,setosa,Sepal.Width,Sepal,Width,3.2 -44,setosa,Sepal.Width,Sepal,Width,3.5 -45,setosa,Sepal.Width,Sepal,Width,3.8 -46,setosa,Sepal.Width,Sepal,Width,3 -47,setosa,Sepal.Width,Sepal,Width,3.8 -48,setosa,Sepal.Width,Sepal,Width,3.2 -49,setosa,Sepal.Width,Sepal,Width,3.7 -50,setosa,Sepal.Width,Sepal,Width,3.3 -51,versicolor,Sepal.Width,Sepal,Width,3.2 -52,versicolor,Sepal.Width,Sepal,Width,3.2 -53,versicolor,Sepal.Width,Sepal,Width,3.1 -54,versicolor,Sepal.Width,Sepal,Width,2.3 -55,versicolor,Sepal.Width,Sepal,Width,2.8 -56,versicolor,Sepal.Width,Sepal,Width,2.8 -57,versicolor,Sepal.Width,Sepal,Width,3.3 -58,versicolor,Sepal.Width,Sepal,Width,2.4 -59,versicolor,Sepal.Width,Sepal,Width,2.9 -60,versicolor,Sepal.Width,Sepal,Width,2.7 -61,versicolor,Sepal.Width,Sepal,Width,2 -62,versicolor,Sepal.Width,Sepal,Width,3 -63,versicolor,Sepal.Width,Sepal,Width,2.2 -64,versicolor,Sepal.Width,Sepal,Width,2.9 -65,versicolor,Sepal.Width,Sepal,Width,2.9 -66,versicolor,Sepal.Width,Sepal,Width,3.1 -67,versicolor,Sepal.Width,Sepal,Width,3 -68,versicolor,Sepal.Width,Sepal,Width,2.7 -69,versicolor,Sepal.Width,Sepal,Width,2.2 -70,versicolor,Sepal.Width,Sepal,Width,2.5 -71,versicolor,Sepal.Width,Sepal,Width,3.2 -72,versicolor,Sepal.Width,Sepal,Width,2.8 -73,versicolor,Sepal.Width,Sepal,Width,2.5 -74,versicolor,Sepal.Width,Sepal,Width,2.8 -75,versicolor,Sepal.Width,Sepal,Width,2.9 -76,versicolor,Sepal.Width,Sepal,Width,3 -77,versicolor,Sepal.Width,Sepal,Width,2.8 -78,versicolor,Sepal.Width,Sepal,Width,3 -79,versicolor,Sepal.Width,Sepal,Width,2.9 -80,versicolor,Sepal.Width,Sepal,Width,2.6 -81,versicolor,Sepal.Width,Sepal,Width,2.4 -82,versicolor,Sepal.Width,Sepal,Width,2.4 -83,versicolor,Sepal.Width,Sepal,Width,2.7 -84,versicolor,Sepal.Width,Sepal,Width,2.7 -85,versicolor,Sepal.Width,Sepal,Width,3 -86,versicolor,Sepal.Width,Sepal,Width,3.4 -87,versicolor,Sepal.Width,Sepal,Width,3.1 -88,versicolor,Sepal.Width,Sepal,Width,2.3 -89,versicolor,Sepal.Width,Sepal,Width,3 -90,versicolor,Sepal.Width,Sepal,Width,2.5 -91,versicolor,Sepal.Width,Sepal,Width,2.6 -92,versicolor,Sepal.Width,Sepal,Width,3 -93,versicolor,Sepal.Width,Sepal,Width,2.6 -94,versicolor,Sepal.Width,Sepal,Width,2.3 -95,versicolor,Sepal.Width,Sepal,Width,2.7 -96,versicolor,Sepal.Width,Sepal,Width,3 -97,versicolor,Sepal.Width,Sepal,Width,2.9 -98,versicolor,Sepal.Width,Sepal,Width,2.9 -99,versicolor,Sepal.Width,Sepal,Width,2.5 -100,versicolor,Sepal.Width,Sepal,Width,2.8 -101,virginica,Sepal.Width,Sepal,Width,3.3 -102,virginica,Sepal.Width,Sepal,Width,2.7 -103,virginica,Sepal.Width,Sepal,Width,3 -104,virginica,Sepal.Width,Sepal,Width,2.9 -105,virginica,Sepal.Width,Sepal,Width,3 -106,virginica,Sepal.Width,Sepal,Width,3 -107,virginica,Sepal.Width,Sepal,Width,2.5 -108,virginica,Sepal.Width,Sepal,Width,2.9 -109,virginica,Sepal.Width,Sepal,Width,2.5 -110,virginica,Sepal.Width,Sepal,Width,3.6 -111,virginica,Sepal.Width,Sepal,Width,3.2 -112,virginica,Sepal.Width,Sepal,Width,2.7 -113,virginica,Sepal.Width,Sepal,Width,3 -114,virginica,Sepal.Width,Sepal,Width,2.5 -115,virginica,Sepal.Width,Sepal,Width,2.8 -116,virginica,Sepal.Width,Sepal,Width,3.2 -117,virginica,Sepal.Width,Sepal,Width,3 -118,virginica,Sepal.Width,Sepal,Width,3.8 -119,virginica,Sepal.Width,Sepal,Width,2.6 -120,virginica,Sepal.Width,Sepal,Width,2.2 -121,virginica,Sepal.Width,Sepal,Width,3.2 -122,virginica,Sepal.Width,Sepal,Width,2.8 -123,virginica,Sepal.Width,Sepal,Width,2.8 -124,virginica,Sepal.Width,Sepal,Width,2.7 -125,virginica,Sepal.Width,Sepal,Width,3.3 -126,virginica,Sepal.Width,Sepal,Width,3.2 -127,virginica,Sepal.Width,Sepal,Width,2.8 -128,virginica,Sepal.Width,Sepal,Width,3 -129,virginica,Sepal.Width,Sepal,Width,2.8 -130,virginica,Sepal.Width,Sepal,Width,3 -131,virginica,Sepal.Width,Sepal,Width,2.8 -132,virginica,Sepal.Width,Sepal,Width,3.8 -133,virginica,Sepal.Width,Sepal,Width,2.8 -134,virginica,Sepal.Width,Sepal,Width,2.8 -135,virginica,Sepal.Width,Sepal,Width,2.6 -136,virginica,Sepal.Width,Sepal,Width,3 -137,virginica,Sepal.Width,Sepal,Width,3.4 -138,virginica,Sepal.Width,Sepal,Width,3.1 -139,virginica,Sepal.Width,Sepal,Width,3 -140,virginica,Sepal.Width,Sepal,Width,3.1 -141,virginica,Sepal.Width,Sepal,Width,3.1 -142,virginica,Sepal.Width,Sepal,Width,3.1 -143,virginica,Sepal.Width,Sepal,Width,2.7 -144,virginica,Sepal.Width,Sepal,Width,3.2 -145,virginica,Sepal.Width,Sepal,Width,3.3 -146,virginica,Sepal.Width,Sepal,Width,3 -147,virginica,Sepal.Width,Sepal,Width,2.5 -148,virginica,Sepal.Width,Sepal,Width,3 -149,virginica,Sepal.Width,Sepal,Width,3.4 -150,virginica,Sepal.Width,Sepal,Width,3 -1,setosa,Petal.Length,Petal,Length,1.4 -2,setosa,Petal.Length,Petal,Length,1.4 -3,setosa,Petal.Length,Petal,Length,1.3 -4,setosa,Petal.Length,Petal,Length,1.5 -5,setosa,Petal.Length,Petal,Length,1.4 -6,setosa,Petal.Length,Petal,Length,1.7 -7,setosa,Petal.Length,Petal,Length,1.4 -8,setosa,Petal.Length,Petal,Length,1.5 -9,setosa,Petal.Length,Petal,Length,1.4 -10,setosa,Petal.Length,Petal,Length,1.5 -11,setosa,Petal.Length,Petal,Length,1.5 -12,setosa,Petal.Length,Petal,Length,1.6 -13,setosa,Petal.Length,Petal,Length,1.4 -14,setosa,Petal.Length,Petal,Length,1.1 -15,setosa,Petal.Length,Petal,Length,1.2 -16,setosa,Petal.Length,Petal,Length,1.5 -17,setosa,Petal.Length,Petal,Length,1.3 -18,setosa,Petal.Length,Petal,Length,1.4 -19,setosa,Petal.Length,Petal,Length,1.7 -20,setosa,Petal.Length,Petal,Length,1.5 -21,setosa,Petal.Length,Petal,Length,1.7 -22,setosa,Petal.Length,Petal,Length,1.5 -23,setosa,Petal.Length,Petal,Length,1 -24,setosa,Petal.Length,Petal,Length,1.7 -25,setosa,Petal.Length,Petal,Length,1.9 -26,setosa,Petal.Length,Petal,Length,1.6 -27,setosa,Petal.Length,Petal,Length,1.6 -28,setosa,Petal.Length,Petal,Length,1.5 -29,setosa,Petal.Length,Petal,Length,1.4 -30,setosa,Petal.Length,Petal,Length,1.6 -31,setosa,Petal.Length,Petal,Length,1.6 -32,setosa,Petal.Length,Petal,Length,1.5 -33,setosa,Petal.Length,Petal,Length,1.5 -34,setosa,Petal.Length,Petal,Length,1.4 -35,setosa,Petal.Length,Petal,Length,1.5 -36,setosa,Petal.Length,Petal,Length,1.2 -37,setosa,Petal.Length,Petal,Length,1.3 -38,setosa,Petal.Length,Petal,Length,1.4 -39,setosa,Petal.Length,Petal,Length,1.3 -40,setosa,Petal.Length,Petal,Length,1.5 -41,setosa,Petal.Length,Petal,Length,1.3 -42,setosa,Petal.Length,Petal,Length,1.3 -43,setosa,Petal.Length,Petal,Length,1.3 -44,setosa,Petal.Length,Petal,Length,1.6 -45,setosa,Petal.Length,Petal,Length,1.9 -46,setosa,Petal.Length,Petal,Length,1.4 -47,setosa,Petal.Length,Petal,Length,1.6 -48,setosa,Petal.Length,Petal,Length,1.4 -49,setosa,Petal.Length,Petal,Length,1.5 -50,setosa,Petal.Length,Petal,Length,1.4 -51,versicolor,Petal.Length,Petal,Length,4.7 -52,versicolor,Petal.Length,Petal,Length,4.5 -53,versicolor,Petal.Length,Petal,Length,4.9 -54,versicolor,Petal.Length,Petal,Length,4 -55,versicolor,Petal.Length,Petal,Length,4.6 -56,versicolor,Petal.Length,Petal,Length,4.5 -57,versicolor,Petal.Length,Petal,Length,4.7 -58,versicolor,Petal.Length,Petal,Length,3.3 -59,versicolor,Petal.Length,Petal,Length,4.6 -60,versicolor,Petal.Length,Petal,Length,3.9 -61,versicolor,Petal.Length,Petal,Length,3.5 -62,versicolor,Petal.Length,Petal,Length,4.2 -63,versicolor,Petal.Length,Petal,Length,4 -64,versicolor,Petal.Length,Petal,Length,4.7 -65,versicolor,Petal.Length,Petal,Length,3.6 -66,versicolor,Petal.Length,Petal,Length,4.4 -67,versicolor,Petal.Length,Petal,Length,4.5 -68,versicolor,Petal.Length,Petal,Length,4.1 -69,versicolor,Petal.Length,Petal,Length,4.5 -70,versicolor,Petal.Length,Petal,Length,3.9 -71,versicolor,Petal.Length,Petal,Length,4.8 -72,versicolor,Petal.Length,Petal,Length,4 -73,versicolor,Petal.Length,Petal,Length,4.9 -74,versicolor,Petal.Length,Petal,Length,4.7 -75,versicolor,Petal.Length,Petal,Length,4.3 -76,versicolor,Petal.Length,Petal,Length,4.4 -77,versicolor,Petal.Length,Petal,Length,4.8 -78,versicolor,Petal.Length,Petal,Length,5 -79,versicolor,Petal.Length,Petal,Length,4.5 -80,versicolor,Petal.Length,Petal,Length,3.5 -81,versicolor,Petal.Length,Petal,Length,3.8 -82,versicolor,Petal.Length,Petal,Length,3.7 -83,versicolor,Petal.Length,Petal,Length,3.9 -84,versicolor,Petal.Length,Petal,Length,5.1 -85,versicolor,Petal.Length,Petal,Length,4.5 -86,versicolor,Petal.Length,Petal,Length,4.5 -87,versicolor,Petal.Length,Petal,Length,4.7 -88,versicolor,Petal.Length,Petal,Length,4.4 -89,versicolor,Petal.Length,Petal,Length,4.1 -90,versicolor,Petal.Length,Petal,Length,4 -91,versicolor,Petal.Length,Petal,Length,4.4 -92,versicolor,Petal.Length,Petal,Length,4.6 -93,versicolor,Petal.Length,Petal,Length,4 -94,versicolor,Petal.Length,Petal,Length,3.3 -95,versicolor,Petal.Length,Petal,Length,4.2 -96,versicolor,Petal.Length,Petal,Length,4.2 -97,versicolor,Petal.Length,Petal,Length,4.2 -98,versicolor,Petal.Length,Petal,Length,4.3 -99,versicolor,Petal.Length,Petal,Length,3 -100,versicolor,Petal.Length,Petal,Length,4.1 -101,virginica,Petal.Length,Petal,Length,6 -102,virginica,Petal.Length,Petal,Length,5.1 -103,virginica,Petal.Length,Petal,Length,5.9 -104,virginica,Petal.Length,Petal,Length,5.6 -105,virginica,Petal.Length,Petal,Length,5.8 -106,virginica,Petal.Length,Petal,Length,6.6 -107,virginica,Petal.Length,Petal,Length,4.5 -108,virginica,Petal.Length,Petal,Length,6.3 -109,virginica,Petal.Length,Petal,Length,5.8 -110,virginica,Petal.Length,Petal,Length,6.1 -111,virginica,Petal.Length,Petal,Length,5.1 -112,virginica,Petal.Length,Petal,Length,5.3 -113,virginica,Petal.Length,Petal,Length,5.5 -114,virginica,Petal.Length,Petal,Length,5 -115,virginica,Petal.Length,Petal,Length,5.1 -116,virginica,Petal.Length,Petal,Length,5.3 -117,virginica,Petal.Length,Petal,Length,5.5 -118,virginica,Petal.Length,Petal,Length,6.7 -119,virginica,Petal.Length,Petal,Length,6.9 -120,virginica,Petal.Length,Petal,Length,5 -121,virginica,Petal.Length,Petal,Length,5.7 -122,virginica,Petal.Length,Petal,Length,4.9 -123,virginica,Petal.Length,Petal,Length,6.7 -124,virginica,Petal.Length,Petal,Length,4.9 -125,virginica,Petal.Length,Petal,Length,5.7 -126,virginica,Petal.Length,Petal,Length,6 -127,virginica,Petal.Length,Petal,Length,4.8 -128,virginica,Petal.Length,Petal,Length,4.9 -129,virginica,Petal.Length,Petal,Length,5.6 -130,virginica,Petal.Length,Petal,Length,5.8 -131,virginica,Petal.Length,Petal,Length,6.1 -132,virginica,Petal.Length,Petal,Length,6.4 -133,virginica,Petal.Length,Petal,Length,5.6 -134,virginica,Petal.Length,Petal,Length,5.1 -135,virginica,Petal.Length,Petal,Length,5.6 -136,virginica,Petal.Length,Petal,Length,6.1 -137,virginica,Petal.Length,Petal,Length,5.6 -138,virginica,Petal.Length,Petal,Length,5.5 -139,virginica,Petal.Length,Petal,Length,4.8 -140,virginica,Petal.Length,Petal,Length,5.4 -141,virginica,Petal.Length,Petal,Length,5.6 -142,virginica,Petal.Length,Petal,Length,5.1 -143,virginica,Petal.Length,Petal,Length,5.1 -144,virginica,Petal.Length,Petal,Length,5.9 -145,virginica,Petal.Length,Petal,Length,5.7 -146,virginica,Petal.Length,Petal,Length,5.2 -147,virginica,Petal.Length,Petal,Length,5 -148,virginica,Petal.Length,Petal,Length,5.2 -149,virginica,Petal.Length,Petal,Length,5.4 -150,virginica,Petal.Length,Petal,Length,5.1 -1,setosa,Petal.Width,Petal,Width,0.2 -2,setosa,Petal.Width,Petal,Width,0.2 -3,setosa,Petal.Width,Petal,Width,0.2 -4,setosa,Petal.Width,Petal,Width,0.2 -5,setosa,Petal.Width,Petal,Width,0.2 -6,setosa,Petal.Width,Petal,Width,0.4 -7,setosa,Petal.Width,Petal,Width,0.3 -8,setosa,Petal.Width,Petal,Width,0.2 -9,setosa,Petal.Width,Petal,Width,0.2 -10,setosa,Petal.Width,Petal,Width,0.1 -11,setosa,Petal.Width,Petal,Width,0.2 -12,setosa,Petal.Width,Petal,Width,0.2 -13,setosa,Petal.Width,Petal,Width,0.1 -14,setosa,Petal.Width,Petal,Width,0.1 -15,setosa,Petal.Width,Petal,Width,0.2 -16,setosa,Petal.Width,Petal,Width,0.4 -17,setosa,Petal.Width,Petal,Width,0.4 -18,setosa,Petal.Width,Petal,Width,0.3 -19,setosa,Petal.Width,Petal,Width,0.3 -20,setosa,Petal.Width,Petal,Width,0.3 -21,setosa,Petal.Width,Petal,Width,0.2 -22,setosa,Petal.Width,Petal,Width,0.4 -23,setosa,Petal.Width,Petal,Width,0.2 -24,setosa,Petal.Width,Petal,Width,0.5 -25,setosa,Petal.Width,Petal,Width,0.2 -26,setosa,Petal.Width,Petal,Width,0.2 -27,setosa,Petal.Width,Petal,Width,0.4 -28,setosa,Petal.Width,Petal,Width,0.2 -29,setosa,Petal.Width,Petal,Width,0.2 -30,setosa,Petal.Width,Petal,Width,0.2 -31,setosa,Petal.Width,Petal,Width,0.2 -32,setosa,Petal.Width,Petal,Width,0.4 -33,setosa,Petal.Width,Petal,Width,0.1 -34,setosa,Petal.Width,Petal,Width,0.2 -35,setosa,Petal.Width,Petal,Width,0.2 -36,setosa,Petal.Width,Petal,Width,0.2 -37,setosa,Petal.Width,Petal,Width,0.2 -38,setosa,Petal.Width,Petal,Width,0.1 -39,setosa,Petal.Width,Petal,Width,0.2 -40,setosa,Petal.Width,Petal,Width,0.2 -41,setosa,Petal.Width,Petal,Width,0.3 -42,setosa,Petal.Width,Petal,Width,0.3 -43,setosa,Petal.Width,Petal,Width,0.2 -44,setosa,Petal.Width,Petal,Width,0.6 -45,setosa,Petal.Width,Petal,Width,0.4 -46,setosa,Petal.Width,Petal,Width,0.3 -47,setosa,Petal.Width,Petal,Width,0.2 -48,setosa,Petal.Width,Petal,Width,0.2 -49,setosa,Petal.Width,Petal,Width,0.2 -50,setosa,Petal.Width,Petal,Width,0.2 -51,versicolor,Petal.Width,Petal,Width,1.4 -52,versicolor,Petal.Width,Petal,Width,1.5 -53,versicolor,Petal.Width,Petal,Width,1.5 -54,versicolor,Petal.Width,Petal,Width,1.3 -55,versicolor,Petal.Width,Petal,Width,1.5 -56,versicolor,Petal.Width,Petal,Width,1.3 -57,versicolor,Petal.Width,Petal,Width,1.6 -58,versicolor,Petal.Width,Petal,Width,1 -59,versicolor,Petal.Width,Petal,Width,1.3 -60,versicolor,Petal.Width,Petal,Width,1.4 -61,versicolor,Petal.Width,Petal,Width,1 -62,versicolor,Petal.Width,Petal,Width,1.5 -63,versicolor,Petal.Width,Petal,Width,1 -64,versicolor,Petal.Width,Petal,Width,1.4 -65,versicolor,Petal.Width,Petal,Width,1.3 -66,versicolor,Petal.Width,Petal,Width,1.4 -67,versicolor,Petal.Width,Petal,Width,1.5 -68,versicolor,Petal.Width,Petal,Width,1 -69,versicolor,Petal.Width,Petal,Width,1.5 -70,versicolor,Petal.Width,Petal,Width,1.1 -71,versicolor,Petal.Width,Petal,Width,1.8 -72,versicolor,Petal.Width,Petal,Width,1.3 -73,versicolor,Petal.Width,Petal,Width,1.5 -74,versicolor,Petal.Width,Petal,Width,1.2 -75,versicolor,Petal.Width,Petal,Width,1.3 -76,versicolor,Petal.Width,Petal,Width,1.4 -77,versicolor,Petal.Width,Petal,Width,1.4 -78,versicolor,Petal.Width,Petal,Width,1.7 -79,versicolor,Petal.Width,Petal,Width,1.5 -80,versicolor,Petal.Width,Petal,Width,1 -81,versicolor,Petal.Width,Petal,Width,1.1 -82,versicolor,Petal.Width,Petal,Width,1 -83,versicolor,Petal.Width,Petal,Width,1.2 -84,versicolor,Petal.Width,Petal,Width,1.6 -85,versicolor,Petal.Width,Petal,Width,1.5 -86,versicolor,Petal.Width,Petal,Width,1.6 -87,versicolor,Petal.Width,Petal,Width,1.5 -88,versicolor,Petal.Width,Petal,Width,1.3 -89,versicolor,Petal.Width,Petal,Width,1.3 -90,versicolor,Petal.Width,Petal,Width,1.3 -91,versicolor,Petal.Width,Petal,Width,1.2 -92,versicolor,Petal.Width,Petal,Width,1.4 -93,versicolor,Petal.Width,Petal,Width,1.2 -94,versicolor,Petal.Width,Petal,Width,1 -95,versicolor,Petal.Width,Petal,Width,1.3 -96,versicolor,Petal.Width,Petal,Width,1.2 -97,versicolor,Petal.Width,Petal,Width,1.3 -98,versicolor,Petal.Width,Petal,Width,1.3 -99,versicolor,Petal.Width,Petal,Width,1.1 -100,versicolor,Petal.Width,Petal,Width,1.3 -101,virginica,Petal.Width,Petal,Width,2.5 -102,virginica,Petal.Width,Petal,Width,1.9 -103,virginica,Petal.Width,Petal,Width,2.1 -104,virginica,Petal.Width,Petal,Width,1.8 -105,virginica,Petal.Width,Petal,Width,2.2 -106,virginica,Petal.Width,Petal,Width,2.1 -107,virginica,Petal.Width,Petal,Width,1.7 -108,virginica,Petal.Width,Petal,Width,1.8 -109,virginica,Petal.Width,Petal,Width,1.8 -110,virginica,Petal.Width,Petal,Width,2.5 -111,virginica,Petal.Width,Petal,Width,2 -112,virginica,Petal.Width,Petal,Width,1.9 -113,virginica,Petal.Width,Petal,Width,2.1 -114,virginica,Petal.Width,Petal,Width,2 -115,virginica,Petal.Width,Petal,Width,2.4 -116,virginica,Petal.Width,Petal,Width,2.3 -117,virginica,Petal.Width,Petal,Width,1.8 -118,virginica,Petal.Width,Petal,Width,2.2 -119,virginica,Petal.Width,Petal,Width,2.3 -120,virginica,Petal.Width,Petal,Width,1.5 -121,virginica,Petal.Width,Petal,Width,2.3 -122,virginica,Petal.Width,Petal,Width,2 -123,virginica,Petal.Width,Petal,Width,2 -124,virginica,Petal.Width,Petal,Width,1.8 -125,virginica,Petal.Width,Petal,Width,2.1 -126,virginica,Petal.Width,Petal,Width,1.8 -127,virginica,Petal.Width,Petal,Width,1.8 -128,virginica,Petal.Width,Petal,Width,1.8 -129,virginica,Petal.Width,Petal,Width,2.1 -130,virginica,Petal.Width,Petal,Width,1.6 -131,virginica,Petal.Width,Petal,Width,1.9 -132,virginica,Petal.Width,Petal,Width,2 -133,virginica,Petal.Width,Petal,Width,2.2 -134,virginica,Petal.Width,Petal,Width,1.5 -135,virginica,Petal.Width,Petal,Width,1.4 -136,virginica,Petal.Width,Petal,Width,2.3 -137,virginica,Petal.Width,Petal,Width,2.4 -138,virginica,Petal.Width,Petal,Width,1.8 -139,virginica,Petal.Width,Petal,Width,1.8 -140,virginica,Petal.Width,Petal,Width,2.1 -141,virginica,Petal.Width,Petal,Width,2.4 -142,virginica,Petal.Width,Petal,Width,2.3 -143,virginica,Petal.Width,Petal,Width,1.9 -144,virginica,Petal.Width,Petal,Width,2.3 -145,virginica,Petal.Width,Petal,Width,2.5 -146,virginica,Petal.Width,Petal,Width,2.3 -147,virginica,Petal.Width,Petal,Width,1.9 -148,virginica,Petal.Width,Petal,Width,2 -149,virginica,Petal.Width,Petal,Width,2.3 -150,virginica,Petal.Width,Petal,Width,1.8 diff --git a/data-raw/movies_long.csv b/data-raw/movies_long.csv deleted file mode 100644 index 0e91143..0000000 --- a/data-raw/movies_long.csv +++ /dev/null @@ -1,1580 +0,0 @@ -title,year,length,budget,rating,votes,mpaa,genre -"Shawshank Redemption, The",1994,142,25,9.1,149494,R,Drama -"Lord of the Rings: The Return of the King, The",2003,251,94,9,103631,PG-13,Action -"Lord of the Rings: The Fellowship of the Ring, The",2001,208,93,8.8,157608,PG-13,Action -"Lord of the Rings: The Two Towers, The",2002,223,94,8.8,114797,PG-13,Action -Pulp Fiction,1994,168,8,8.8,132745,R,Drama -Schindler's List,1993,195,25,8.8,97667,R,Drama -Star Wars,1977,125,11,8.8,134640,PG,Action -Star Wars: Episode V - The Empire Strikes Back,1980,129,18,8.8,103706,PG,Action -C'era una volta il West,1968,158,5,8.7,17241,PG-13,Drama -Cidade de Deus,2002,135,3.3,8.7,25964,R,Drama -Dr. Strangelove or: How I Learned to Stop Worrying and Love the Bomb,1964,93,1.8,8.7,63471,PG,Comedy -Memento,2000,113,5,8.7,90317,R,Drama -Eternal Sunshine of the Spotless Mind,2004,108,20,8.6,46240,R,RomCom -American Beauty,1999,121,15,8.5,109991,R,Drama -Apocalypse Now,1979,202,31.5,8.5,64785,R,Action Drama -"Boot, Das",1981,216,14,8.5,28920,R,Drama -Fight Club,1999,139,63,8.5,112092,R,Drama -"Matrix, The",1999,136,63,8.5,143853,R,Action -"Pianist, The",2002,150,35,8.5,30467,R,Drama -Taegukgi hwinalrimyeo,2004,140,12.8,8.5,1792,R,Action Drama -American History X,1998,119,10,8.4,59677,R,Drama -Requiem for a Dream,2000,102,4.5,8.4,47845,R,Drama -Se7en,1995,127,30,8.4,88371,R,Drama -Aliens,1986,154,18.5,8.3,63961,R,Action -Amadeus,1984,180,18,8.3,36955,R,Drama -Before Sunset,2004,80,10,8.3,8789,R,Romance Drama -Braveheart,1995,177,53,8.3,92437,R,Action Drama -Crash,2004,113,6.5,8.3,1660,R,Drama -Donnie Darko,2001,133,4.5,8.3,51961,R,Drama -"Incredibles, The",2004,121,92,8.3,30749,PG,Animated -Kill Bill: Vol. 1,2003,111,55,8.3,65026,R,Action Drama -Kill Bill: Vol. 2,2004,136,30,8.3,44189,R,Action Drama -Million Dollar Baby,2004,132,30,8.3,20195,PG-13,Drama -Saving Private Ryan,1998,170,70,8.3,100267,R,Action Drama -Sin City,2005,124,45.5,8.3,23473,R,Action -Strangers on a Train,1951,103,1.2,8.3,10624,PG,Drama -"Adventures of Robin Hood, The",1938,102,1.9,8.2,7359,PG,Action -Amores perros,2000,153,2,8.2,15079,R,Drama -Fargo,1996,98,7,8.2,65597,R,Drama -Festen,1998,105,1.3,8.2,11983,R,Drama -Forrest Gump,1994,142,55,8.2,89722,PG-13,Comedy Drama -Once Upon a Time in America,1984,227,30,8.2,19292,R,Drama -"Sixth Sense, The",1999,107,55,8.2,96987,PG-13,Drama -Terminator 2: Judgment Day,1991,154,100,8.2,77614,R,Action Drama -Wo hu cang long,2000,120,15,8.2,52198,PG-13,Action -Big Fish,2003,125,70,8.1,31525,PG-13,Comedy Drama -Garden State,2004,109,2.5,8.1,23814,R,RomCom -"Green Mile, The",1999,188,60,8.1,60142,R,Drama -Star Wars: Episode VI - Return of the Jedi,1983,135,32.5,8.1,82471,PG,Action -"Station Agent, The",2003,88,0.5,8.1,7112,R,Drama -Ying xiong,2002,93,30,8.1,24128,PG-13,Action Drama -21 Grams,2003,124,20,8,21857,R,Drama -Almost Famous,2000,162,60,8,38648,R,Comedy Drama -"Big Lebowski, The",1998,117,15,8,50179,R,Comedy -Ed Wood,1994,127,18,8,22612,R,Comedy Drama -Gladiator,2000,155,103,8,92495,R,Action Drama -"Insider, The",1999,157,68,8,28780,R,Drama -"Intruder, The",1962,84,0.08,8,163,PG-13,Drama -"Last Picture Show, The",1971,118,1.3,8,5340,R,Drama -Lost in Translation,2003,102,4,8,42450,R,Comedy Drama -Magnolia,1999,188,37,8,45992,R,Drama -Mystic River,2003,137,30,8,28969,R,Drama -Pirates of the Caribbean: The Curse of the Black Pearl,2003,143,125,8,60812,PG-13,Action Comedy -Shrek,2001,90,60,8,65146,PG,Animated -Sideways,2004,123,16,8,17051,R,Comedy Drama -Trainspotting,1996,94,3.5,8,51887,R,Drama -Adaptation.,2002,114,19,7.9,25140,R,Comedy Drama -Clerks.,1994,92,0.23,7.9,39927,R,Comedy Drama -Doctor Zhivago,1965,200,11,7.9,10283,PG-13,Romance Drama -Gong fu,2004,99,20,7.9,5299,R,Action Comedy -Heat,1995,188,60,7.9,44588,R,Action Drama -Henry V,1989,137,9,7.9,8241,PG-13,Action Drama -"Invasions barbares, Les",2003,112,5,7.9,4900,R,Comedy Drama -"Iron Giant, The",1999,86,48,7.9,15151,PG,Animated -Lashou shentan,1992,131,4.5,7.9,6568,R,Action Drama -"Last Samurai, The",2003,154,100,7.9,31668,R,Action Drama -Mulholland Dr.,2001,147,15,7.9,35504,R,Drama -Secrets & Lies,1996,136,4.5,7.9,7747,R,Comedy Drama -Shaun of the Dead,2004,99,4,7.9,18685,R,Comedy -Snatch.,2000,102,10,7.9,44785,R,Comedy -Spider-Man 2,2004,127,200,7.9,40256,PG-13,Action -Twelve Monkeys,1995,129,29,7.9,62301,R,Drama -When Zachary Beaver Came to Town,2003,85,3,7.9,35,PG,Drama -X2,2003,133,110,7.9,38191,PG-13,Action -25th Hour,2002,135,15,7.8,15788,R,Drama -"Beautiful Mind, A",2001,135,60,7.8,43291,PG-13,Drama -Casino,1995,176,52,7.8,27234,R,Drama -E.T. the Extra-Terrestrial,1982,120,10.5,7.8,44175,PG,Drama -Ghost World,2000,111,7,7.8,17976,R,Comedy Drama -Good Will Hunting,1997,126,10,7.8,60858,R,Drama -House of Sand and Fog,2003,126,16,7.8,8164,R,Drama -In This World,2002,88,1.9,7.8,815,R,Drama -JFK,1991,206,40,7.8,26456,R,Drama -"Lunes al sol, Los",2002,113,4,7.8,1466,R,Drama -MASH,1970,112,3.5,7.8,14829,R,Comedy Drama -Minority Report,2002,145,102,7.8,51199,PG-13,Action Drama -"Notebook, The",2004,123,30,7.8,8830,PG-13,Romance Drama -"O Brother, Where Art Thou?",2000,106,26,7.8,37961,PG-13,Comedy -"Others, The",2001,104,17,7.8,36914,PG-13,Drama -Rebel Without a Cause,1955,111,1.5,7.8,11055,PG-13,Drama -Shrek 2,2004,92,75,7.8,27236,PG,Animated -Traffic,2000,147,48,7.8,41268,R,Drama -"Violon rouge, Le",1998,140,10,7.8,6995,R,Romance Drama -You Can Count on Me,2000,111,1.2,7.8,7630,R,Drama -As Good as It Gets,1997,139,50,7.7,47441,PG-13,RomCom -Billy Elliot,2000,110,5,7.7,16725,R,Drama -Carandiru,2003,147,6,7.7,1608,R,Drama -Collateral,2004,120,65,7.7,24499,R,Drama -Far from Heaven,2002,107,13.5,7.7,9167,PG-13,Romance Drama -Heavenly Creatures,1994,108,5,7.7,11453,R,Romance Drama -Hedwig and the Angry Inch,2001,93,6,7.7,6072,R,RomCom -Interstate 60,2002,116,7,7.7,2495,R,Comedy Drama -Karakter,1997,122,4.5,7.7,2687,R,Drama -Lone Star,1996,135,5,7.7,8518,R,Drama -"Man Who Wasn't There, The",2001,118,20,7.7,17028,R,Comedy Drama -"Maquinista, El",2004,102,5,7.7,4322,R,Drama -Moulin Rouge!,2001,127,52.5,7.7,47689,PG-13,Romance Drama -Office Space,1999,89,10,7.7,26134,R,Comedy -Rabbit-Proof Fence,2002,94,6,7.7,5079,PG,Drama -Road to Perdition,2002,117,80,7.7,30526,R,Drama -Rushmore,1998,93,10,7.7,22209,R,RomCom -Sense and Sensibility,1995,136,16.5,7.7,13904,PG,RomCom -"Triplettes de Belleville, Les",2003,78,8,7.7,6618,PG-13,Animated -"Truman Show, The",1998,103,60,7.7,62434,PG,Comedy Drama -2046,2004,129,12,7.6,2663,R,Romance Drama -Black Hawk Down,2001,142,90,7.6,32530,R,Action Drama -Bloody Sunday,2002,107,5,7.6,2388,R,Drama -Boogie Nights,1997,156,15,7.6,27380,R,Drama -Boys Don't Cry,1999,118,2,7.6,14456,R,Drama -"Butterfly Effect, The",2004,120,13,7.6,22975,R,Drama -Catch Me If You Can,2002,141,52,7.6,39915,PG-13,Drama -Chasing Amy,1997,111,0.25,7.6,32141,R,RomCom -Dead Man Walking,1995,122,11,7.6,16177,R,Drama -Dirty Pretty Things,2002,97,10,7.6,6274,R,Drama -Donnie Brasco,1997,127,35,7.6,20029,R,Drama -Elizabeth,1998,124,25,7.6,14733,R,Drama -Equilibrium,2002,107,20,7.6,17579,R,Action -Foreign Correspondents,1999,102,0.5,7.6,117,PG-13,Romance Drama -Gattaca,1997,101,36,7.6,26071,PG-13,Drama -Gods and Monsters,1998,105,3.5,7.6,9020,R,Drama -High Fidelity,2000,113,20,7.6,29704,R,RomCom -"Hours, The",2002,114,25,7.6,16692,PG-13,Drama -Kinsey,2004,118,11,7.6,3225,R,Drama -"Leggenda del pianista sull'oceano, La",1998,120,9,7.6,3599,R,Drama -Nueve reinas,2000,114,1.5,7.6,3721,R,Drama -"Postino, Il",1994,108,3,7.6,8342,PG,RomCom -"Royal Tenenbaums, The",2001,111,21,7.6,31227,R,Comedy Drama -Samsara,2001,138,3,7.6,636,R,Action Drama -"Sand Pebbles, The",1966,193,12,7.6,1773,PG-13,Romance Drama -Shine,1996,105,5.5,7.6,12425,PG-13,Romance Drama -"Simple Plan, A",1998,121,17,7.6,15398,R,Drama -South Park: Bigger Longer & Uncut,1999,81,21,7.6,33188,R,Animated -Star Trek: The Wrath of Khan,1982,116,11,7.6,16333,PG,Action -Swingers,1996,96,0.2,7.6,15827,R,Comedy Drama -Utomlyonnye solntsem,1994,132,2.8,7.6,2173,R,Drama -Waiting for Guffman,1996,84,4,7.6,7337,R,Comedy -Wonder Boys,2000,111,35,7.6,15668,R,Comedy Drama -About a Boy,2002,101,27,7.5,18318,PG-13,Comedy Drama -Apollo 13,1995,140,62,7.5,41098,PG,Drama -"Aviator, The",2004,170,116,7.5,16217,PG-13,Drama -Best in Show,2000,90,6,7.5,11790,PG-13,Comedy -Bound,1996,109,4.5,7.5,11911,R,Romance Drama -Bubba Ho-tep,2002,92,1,7.5,7142,R,Comedy -Chicago,2002,113,45,7.5,34933,PG-13,Comedy Drama -"Cider House Rules, The",1999,126,24,7.5,18950,PG-13,Romance Drama -Frida,2002,123,12,7.5,8614,R,Drama -"Ice Storm, The",1997,112,18,7.5,13115,R,Drama -Jackie Brown,1997,154,12,7.5,28891,R,Drama -Jui kuen II,1994,99,2,7.5,4628,R,Action Comedy -Lawn Dogs,1997,101,8,7.5,1856,R,Drama -Leaving Las Vegas,1995,111,4,7.5,18027,R,Romance Drama -Life as a House,2001,127,18,7.5,7696,R,Comedy Drama -Master and Commander: The Far Side of the World,2003,138,150,7.5,21328,PG-13,Action Drama -Ocean's Eleven,2001,116,85,7.5,44662,PG-13,Comedy -Open Range,2003,139,26,7.5,8799,R,Drama -Osama,2003,83,0.046,7.5,1546,PG-13,Drama -Pleasantville,1998,124,40,7.5,22561,PG-13,Comedy Drama -Primal Fear,1996,129,30,7.5,12467,R,Drama -Punch-Drunk Love,2002,95,25,7.5,18169,R,RomCom -Seabiscuit,2003,141,86,7.5,11552,PG-13,Drama -Shakespeare in Love,1998,122,25,7.5,41999,R,RomCom -Shattered Glass,2003,95,6,7.5,4108,PG-13,Drama -"Abyss, The",1989,171,69.5,7.4,21987,PG-13,Action Drama -Antwone Fisher,2002,117,12.5,7.4,4472,PG-13,Drama -Army of Darkness,1993,96,11,7.4,22118,R,Action Comedy -Cold Mountain,2003,152,83,7.4,15712,R,Romance Drama -"Count of Monte Cristo, The",2002,134,35,7.4,13907,PG-13,Action Drama -Dawn of the Dead,2004,109,28,7.4,16283,R,Action Drama -Election,1999,103,8.5,7.4,17521,R,Comedy -Enter the Dragon,1973,99,0.85,7.4,8078,R,Action -"Espinazo del diablo, El",2001,108,4.5,7.4,3474,R,Drama -Frailty,2001,100,11,7.4,10551,R,Drama -Frequency,2000,118,31,7.4,15317,PG-13,Drama -Go,1999,103,6.5,7.4,20663,R,Comedy -Grosse Pointe Blank,1997,107,15,7.4,20400,R,RomCom -In the Bedroom,2001,130,1.7,7.4,10177,R,Drama -Man on Fire,2004,146,70,7.4,14358,R,Action Drama -Monster,2003,109,8,7.4,12306,R,Drama -Nicholas Nickleby,2002,132,10,7.4,1651,PG,Drama -"Passion of the Christ, The",2004,127,30,7.4,34046,R,Drama -"Quiet American, The",2002,101,30,7.4,5957,R,Romance Drama -Remember the Titans,2000,113,30,7.4,14195,PG,Drama -"Ring, The",2002,115,45,7.4,30687,PG-13,Drama -Ryan's Daughter,1970,202,15,7.4,965,R,Romance Drama -"School of Rock, The",2003,108,20,7.4,16452,PG-13,Comedy -Secondhand Lions,2003,120,30,7.4,5543,PG,Comedy Drama -Shallow Grave,1994,93,2.5,7.4,9401,R,Drama -Siunin Wong Fei-hung tsi titmalau,1993,90,2,7.4,3173,PG-13,Action Comedy -Smoke,1995,112,7,7.4,8111,R,Comedy Drama -Spider-Man,2002,121,139,7.4,63228,PG-13,Action -Thirteen Days,2000,145,80,7.4,10926,PG-13,Drama -Welcome to the Dollhouse,1995,88,0.8,7.4,5851,R,Comedy Drama -"Whole Wide World, The",1996,111,1.3,7.4,956,PG,Drama -1776,1972,180,4,7.3,1754,PG,Drama -About Schmidt,2002,125,30,7.3,23279,R,Comedy Drama -Better Luck Tomorrow,2002,98,0.25,7.3,2697,R,Drama -Bigger Than the Sky,2005,106,0.75,7.3,32,PG-13,RomCom -"Bourne Identity, The",2002,119,75,7.3,29871,PG-13,Action Drama -"Bourne Supremacy, The",2004,108,75,7.3,19878,PG-13,Action Drama -Cast Away,2000,143,90,7.3,34580,PG-13,Drama -Contact,1997,153,90,7.3,36390,PG,Drama -Dellamorte Dellamore,1994,105,4,7.3,2313,R,RomCom -Dogma,1999,130,10,7.3,43391,R,Comedy -Elephant,2003,81,3,7.3,9203,R,Drama -Enemy at the Gates,2001,131,70,7.3,19169,R,Action Drama -Erin Brockovich,2000,130,51,7.3,24301,R,Drama -EvenHand,2002,92,0.5,7.3,169,R,Drama -Finding Forrester,2000,136,43,7.3,13439,PG-13,Drama -Gangs of New York,2002,166,97,7.3,34808,R,Drama -Gosford Park,2001,137,15,7.3,16831,R,Drama -"Grey Zone, The",2001,108,5,7.3,1553,R,Drama -Heaven,2002,96,11,7.3,3857,R,Drama -"Hurricane, The",1999,145,38,7.3,12445,R,Drama -Ice Age,2002,81,60,7.3,22302,PG,Animated -Identity,2003,90,30,7.3,18747,R,Drama -In the Company of Men,1997,97,0.025,7.3,3618,R,Comedy -Insomnia,2002,118,46,7.3,22235,R,Drama -Jerry Maguire,1996,139,50,7.3,34623,R,RomCom -Julie Walking Home,2002,118,5,7.3,190,R,Romance Drama -Latter Days,2003,107,0.85,7.3,1396,R,RomCom -"Life Aquatic with Steve Zissou, The",2004,118,25,7.3,9170,R,Comedy Drama -Lilo & Stitch,2002,86,80,7.3,10944,PG,Animated -Lost Highway,1997,135,15,7.3,15936,R,Drama -Man on the Moon,1999,118,52,7.3,19826,R,Comedy Drama -Mean Creek,2004,89,0.5,7.3,2094,R,Drama -Menace II Society,1993,97,3.5,7.3,4704,R,Action Drama -"Merchant of Venice, The",2004,138,30,7.3,1400,R,Comedy Drama -Metoroporisu,2001,107,14.5,7.3,3380,PG-13,Animated -Monster's Ball,2001,112,4,7.3,15037,R,Romance Drama -Narc,2002,105,7.5,7.3,7185,R,Drama -Pieces of April,2003,80,0.3,7.3,4604,PG-13,Comedy Drama -Star Trek: First Contact,1996,106,45,7.3,25046,PG-13,Action -Team America: World Police,2004,98,30,7.3,13104,R,Action Comedy -Three Kings,1999,114,48,7.3,31503,R,Action Comedy -Training Day,2001,120,45,7.3,22776,R,Drama -Waking Ned,1998,92,3,7.3,7232,PG,Comedy -X-Men,2000,104,75,7.3,45332,PG-13,Action -"Apostle, The",1997,134,5,7.2,4231,PG-13,Drama -Bad Santa,2003,98,18,7.2,11189,R,Comedy -Being Julia,2004,104,18,7.2,1671,R,Comedy Drama -Bon voyage,2003,115,20,7.2,1061,PG-13,Comedy Drama -Buffalo '66,1998,110,1.5,7.2,6652,R,Comedy Drama -"Comunidad, La",2000,110,2,7.2,1270,R,Comedy -Cypher,2002,95,7.5,7.2,3160,R,Action -"Dangerous Lives of Altar Boys, The",2002,105,12,7.2,3274,R,Drama -Eve's Bayou,1997,109,5,7.2,2302,R,Drama -Four Weddings and a Funeral,1994,117,6,7.2,17820,R,RomCom -"Full Monty, The",1997,91,3.5,7.2,22115,R,Comedy -Galaxy Quest,1999,102,45,7.2,22341,PG,Comedy -Holes,2003,117,30,7.2,5235,PG,Comedy Drama -I Am Sam,2001,132,22,7.2,9945,PG-13,Drama -K-PAX,2001,120,48,7.2,17235,PG-13,Drama -"Limey, The",1999,89,9,7.2,7732,R,Drama -My Cousin Vinny,1992,120,11,7.2,10877,R,Comedy -Napoleon Dynamite,2004,86,0.4,7.2,17524,PG,Comedy -"Negotiator, The",1998,139,50,7.2,19100,R,Action Drama -Peter Pan,2003,113,100,7.2,5596,PG,Action -"Phantom of the Opera, The",2004,143,60,7.2,11283,PG-13,Romance Drama -Rounders,1998,121,12,7.2,13621,R,Drama -"Salton Sea, The",2002,107,18,7.2,5070,R,Drama -Santa sangre,1989,123,0.787,7.2,1165,R,Drama -Savior,1998,104,10,7.2,1775,R,Drama -Smoke Signals,1998,88,2,7.2,2665,PG-13,Comedy Drama -Songcatcher,2000,109,1.8,7.2,927,PG-13,Drama -There's Something About Mary,1998,134,23,7.2,46343,R,RomCom -"Thin Red Line, The",1998,170,52,7.2,25637,R,Action Drama -Thirteen Conversations About One Thing,2001,104,3,7.2,2883,R,Drama -"Upside of Anger, The",2005,118,13.2,7.2,1160,R,RomCom -"Virgin Suicides, The",1999,90,6,7.2,17524,R,Drama -Vor,1997,110,2,7.2,841,R,Drama -Arlington Road,1999,117,21.5,7.1,17189,R,Drama -Bananas,1971,82,2,7.1,4252,PG-13,Comedy -Blow,2001,124,30,7.1,18670,R,Drama -Brigham City,2001,119,1,7.1,405,PG-13,Drama -Cape Fear,1991,128,35,7.1,15585,R,Drama -Confessions of a Dangerous Mind,2002,113,29,7.1,11487,R,Drama -Crimson Tide,1995,116,53,7.1,14033,R,Action Drama -Deconstructing Harry,1997,96,20,7.1,7342,R,Comedy -Dracula,1992,128,40,7.1,19972,R,Romance Drama -Enemy of the State,1998,131,90,7.1,23263,R,Action Drama -"English Patient, The",1996,160,27,7.1,25210,R,Romance Drama -Evelyn,2002,94,10,7.1,1163,PG,Drama -Everything Put Together,2000,87,0.5,7.1,151,R,Drama -Face/Off,1997,133,80,7.1,37506,R,Action Drama -"Fifth Element, The",1997,126,90,7.1,55398,PG-13,Action Drama -Harold & Kumar Go to White Castle,2004,90,9,7.1,8376,R,Comedy -Highlander,1986,116,16,7.1,18146,R,Action -Igby Goes Down,2002,99,9,7.1,7958,R,Comedy Drama -Kundun,1997,128,28,7.1,4306,PG-13,Drama -Lana's Rain,2002,107,0.215,7.1,56,R,Drama -Last Orders,2001,109,12,7.1,1583,R,Drama -"Life of David Gale, The",2003,130,50,7.1,10580,R,Drama -Limbo,1999,126,8.3,7.1,2063,R,Drama -Mallrats,1995,94,6.1,7.1,22837,R,Comedy Drama -"Matrix Reloaded, The",2003,138,127,7.1,57225,R,Action -Mother Night,1996,114,5.5,7.1,1232,R,Romance Drama -Muriel's Wedding,1994,106,3,7.1,6685,R,RomCom -My Dog Skip,2000,95,7,7.1,3109,PG,Drama -One Hour Photo,2002,96,12,7.1,17130,R,Drama -Playing by Heart,1998,121,14,7.1,4958,R,Romance Drama -Pollock,2000,132,6,7.1,4013,R,Drama -Runaway Jury,2003,127,60,7.1,10761,PG-13,Drama -Saved!,2004,92,5,7.1,6504,PG-13,Comedy Drama -Signs,2002,108,72,7.1,40285,PG-13,Drama -Slam,1998,100,1,7.1,569,R,Drama -Speed,1994,116,28,7.1,32979,R,Action -Spring Forward,1999,110,2,7.1,307,R,Drama -Superman,1978,151,55,7.1,17327,PG,Action -Swimming with Sharks,1994,101,0.7,7.1,4837,R,Comedy Drama -"Terminal, The",2004,128,60,7.1,15809,PG-13,RomCom -Thirteen,2003,100,1.5,7.1,8652,R,Drama -Trees Lounge,1996,95,1.3,7.1,3155,R,Comedy Drama -Troy,2004,162,185,7.1,33979,R,Action Drama -Twin Falls Idaho,1999,111,0.5,7.1,1547,R,Drama -Unbreakable,2000,106,75,7.1,35842,PG-13,Drama -We Were Soldiers,2002,143,75,7.1,14939,R,Action Drama -Alferd Packer: The Musical,1996,97,0.125,7,2298,R,RomCom -Amistad,1997,152,40,7,10543,R,Drama -Antz,1998,83,60,7,16312,PG,Animated -Austin Powers: International Man of Mystery,1997,94,17,7,33755,PG-13,Action Comedy -Bridget Jones's Diary,2001,97,26,7,24791,R,RomCom -Buffalo Soldiers,2001,98,15,7,3753,R,Comedy Drama -"Crimen del padre Amaro, El",2002,118,1.8,7,2469,R,Romance Drama -"Devil's Advocate, The",1997,144,57,7,26904,R,Drama -Die Hard: With a Vengeance,1995,131,90,7,25258,R,Action -Edges of the Lord,2001,95,7.5,7,639,R,Drama -Elf,2003,95,33,7,10165,PG,Comedy -"End of the Affair, The",1999,102,23,7,4808,R,Romance Drama -Ever After,1998,121,26,7,10250,PG,RomCom -Eyes Wide Shut,1999,159,65,7,37868,R,Drama -Final Solution,2001,110,1.5,7,32,R,Action Drama -Friday Night Lights,2004,117,30,7,4290,PG-13,Drama -Get Shorty,1995,105,30.25,7,14825,R,Comedy Drama -"Girl, Interrupted",1999,127,24,7,16362,R,Drama -How to Kill Your Neighbor's Dog,2000,107,7.3,7,907,R,Comedy Drama -Husbands,1970,131,1,7,373,PG-13,Drama -I Capture the Castle,2003,111,8,7,947,R,Romance Drama -I Heart Huckabees,2004,106,22,7,7262,R,Comedy -"I, Robot",2004,115,105,7,22330,PG-13,Action -"Ideal Husband, An",1999,97,14,7,4584,PG-13,RomCom -Imaginary Heroes,2004,112,10,7,411,R,Comedy Drama -Jake's Booty Call,2003,77,0.05,7,10,R,Comedy -Japanese Story,2003,105,5.74,7,1330,R,Drama -Kingdom of Heaven,2005,145,130,7,6498,R,Action Drama -Kissing Jessica Stein,2001,97,1,7,4236,R,RomCom -Mean Girls,2004,97,17,7,11591,PG-13,Comedy Drama -Meet the Parents,2000,108,55,7,30804,PG-13,Comedy -Mighty Aphrodite,1995,95,15,7,7083,R,Comedy -Modigliani,2004,128,12,7,155,R,Drama -My Family,1995,128,5.5,7,859,R,Drama -Notting Hill,1999,124,42,7,27285,PG-13,RomCom -One True Thing,1998,127,30,7,2534,R,Drama -Owning Mahowny,2003,104,10,7,1999,R,Drama -Panic Room,2002,113,48,7,24302,R,Drama -Real Women Have Curves,2002,87,3,7,1944,PG-13,Comedy Drama -"Rock, The",1996,136,75,7,46184,R,Action Drama -Ronin,1998,121,55,7,21982,R,Action -Sleepers,1996,147,44,7,17896,R,Drama -Spy Game,2001,126,92,7,16736,R,Action Drama -Star Wars: Episode II - Attack of the Clones,2002,120,120,7,63889,PG,Action -Suicide Kings,1997,106,5,7,6117,R,Comedy Drama -Sunshine State,2002,141,5.6,7,1481,PG-13,Drama -"Talented Mr. Ripley, The",1999,139,40,7,25974,R,Drama -Wag the Dog,1997,97,15,7,16434,R,Comedy -Zero Effect,1998,116,5,7,4820,R,Comedy -Affliction,1997,114,6,6.9,3679,R,Drama -"American President, The",1995,114,62,6.9,11834,PG-13,RomCom -"Beautiful Country, The",2004,137,6,6.9,115,R,Drama -"Bridges of Madison County, The",1995,135,22,6.9,7633,PG-13,Romance Drama -"Contender, The",2000,126,9,6.9,7023,R,Drama -Emma,1996,121,6,6.9,6431,PG,RomCom -Everyone Says I Love You,1996,101,20,6.9,7314,R,RomCom -Freaky Friday,2003,97,26,6.9,8052,PG,Comedy Drama -"Good Girl, The",2002,93,5,6.9,8254,R,Comedy Drama -"Great White Hope, The",1970,103,6,6.9,369,PG-13,Drama -"Hitchhiker's Guide to the Galaxy, The",2005,110,50,6.9,7644,PG,Comedy -"House of Mirth, The",2000,140,10,6.9,2167,PG,Romance Drama -"Italian Job, The",2003,111,60,6.9,18496,PG-13,Action -Jay and Silent Bob Strike Back,2001,104,22,6.9,24211,R,Comedy -Jesus' Son,1999,107,2.5,6.9,2291,R,Drama -Little Secrets,2001,97,2.5,6.9,457,PG,Drama -Lovely & Amazing,2001,91,0.25,6.9,1813,R,Comedy Drama -Manny & Lo,1996,88,0.5,6.9,395,R,Drama -Moonlight Mile,2002,117,20,6.9,3479,PG-13,Romance Drama -Mumford,1999,112,28,6.9,3384,R,Comedy Drama -My Big Fat Greek Wedding,2002,95,5,6.9,21675,PG,RomCom -Nil by Mouth,1997,128,9,6.9,1159,R,Drama -Panic,2000,88,1,6.9,2524,R,Comedy Drama -"Pledge, The",2001,123,45,6.9,9852,R,Drama -"Prince of Egypt, The",1998,99,60,6.9,9212,PG,Animated -Radio,2003,109,35,6.9,3594,PG,Drama -Return to Me,2000,115,24,6.9,5057,PG,RomCom -Saints and Soldiers,2003,90,0.78,6.9,689,PG-13,Action Drama -"Shape of Things, The",2003,96,4,6.9,1816,R,Drama -"Shipping News, The",2001,111,35,6.9,7695,R,Romance Drama -Strange Days,1995,145,42,6.9,11869,R,Action Drama -Terminator 3: Rise of the Machines,2003,109,175,6.9,32111,R,Action -"Time to Kill, A",1996,149,40,6.9,15577,R,Drama -Titanic,1997,194,200,6.9,90195,PG-13,Romance Drama -Tumbleweeds,1999,102,0.312,6.9,1146,PG-13,Comedy Drama -Urbania,2000,106,0.225,6.9,1089,R,Drama -Vanilla Sky,2001,136,68,6.9,31250,R,Romance Drama -Walking Across Egypt,1999,100,4.5,6.9,247,PG-13,Drama -White Oleander,2002,109,16,6.9,4545,PG-13,Drama -Wilde,1997,118,10,6.9,2545,R,Drama -50 First Dates,2004,99,75,6.8,13497,PG-13,RomCom -8 Mile,2002,110,41,6.8,17900,R,Drama -All the Real Girls,2003,108,1,6.8,1745,R,Romance Drama -American Pie,1999,95,11,6.8,41126,R,Comedy -American Psycho,2000,102,8,6.8,21639,R,Drama -Artificial Intelligence: AI,2001,146,90,6.8,36623,PG-13,Drama -Avalon,2001,106,8,6.8,2723,R,Animated -Blade,1998,110,45,6.8,24372,R,Action -Boiler Room,2000,118,9,6.8,8586,R,Drama -"Bread, My Sweet, The",2001,105,0.6,6.8,257,PG-13,Romance Drama -Clockers,1995,129,25,6.8,3099,R,Drama -Confidence,2003,97,15,6.8,6168,R,Drama -"Curse of the Jade Scorpion, The",2001,103,26,6.8,5846,PG-13,Comedy Drama -"Deep End, The",2001,101,3,6.8,3524,R,Drama -Desperado,1995,106,7,6.8,17929,R,Action -Dom durakov,2002,104,2.5,6.8,382,R,Drama -From Dusk Till Dawn,1996,108,20,6.8,28473,R,Action Comedy -"Gift, The",2000,111,10,6.8,12440,R,Drama -GoldenEye,1995,130,80,6.8,22991,PG-13,Action -Happy Gilmore,1996,92,10,6.8,17746,PG-13,Comedy -"Importance of Being Earnest, The",2002,97,15,6.8,3598,PG,RomCom -"Intended, The",2002,110,3.8,6.8,40,R,Drama -Keeping the Faith,2000,128,30,6.8,11351,PG-13,RomCom -Lolita,1997,137,58,6.8,5757,R,Romance Drama -"Man from Elysian Fields, The",2001,106,6.5,6.8,1198,R,Drama -"Mask of Zorro, The",1998,136,65,6.8,18220,PG-13,Action Comedy -May,2002,93,1.7,6.8,3324,R,Drama -Men in Black,1997,98,90,6.8,53231,PG-13,Action Comedy -"Mudge Boy, The",2003,94,0.8,6.8,204,R,Drama -Mute Witness,1994,95,2,6.8,1202,R,Comedy -Nixon,1995,212,50,6.8,5837,R,Drama -Othello,1995,123,11,6.8,1852,R,Drama -"Outsiders, The",1983,91,10,6.8,7125,PG-13,Drama -"Patriot, The",2000,164,110,6.8,29665,R,Action Drama -Primary Colors,1998,143,65,6.8,7756,R,Comedy Drama -"Rainmaker, The",1997,135,40,6.8,8620,PG-13,Drama -Rob Roy,1995,133,28,6.8,6652,R,Action Drama -Rosewood,1997,140,31,6.8,1840,R,Action Drama -"Score, The",2001,124,68,6.8,16106,R,Drama -Simon Birch,1998,113,20,6.8,4612,PG,Comedy Drama -Spider,2002,94,8,6.8,5193,R,Drama -Stripes,1981,106,10,6.8,7406,R,Comedy -Veronica Guerin,2003,92,17,6.8,2688,R,Drama -"Walk to Remember, A",2002,101,11,6.8,7124,PG,Romance Drama -Welcome to Sarajevo,1997,103,9,6.8,1465,R,Drama -Without Limits,1998,117,25,6.8,1249,PG-13,Drama -10 Things I Hate About You,1999,97,16,6.7,19095,PG-13,RomCom -Auto Focus,2002,105,7,6.7,3276,R,Drama -Bandits,2001,123,80,6.7,12382,PG-13,RomCom -Beyond the Sea,2004,118,24,6.7,1051,PG-13,Drama -Breakdown,1997,95,36,6.7,7099,R,Action -Bringing Out the Dead,1999,121,32,6.7,13989,R,Drama -"Brother from Another Planet, The",1984,106,0.3,6.7,1133,R,Comedy Drama -Clueless,1995,97,20,6.7,16521,PG-13,RomCom -Cop Land,1997,116,15,6.7,12677,R,Drama -Courage Under Fire,1996,117,46,6.7,8884,R,Action Drama -Cradle Will Rock,1999,132,32,6.7,3375,R,Drama -"Emperor's Club, The",2002,109,12.5,6.7,3056,PG-13,Drama -Friday,1995,91,3.5,6.7,7020,R,Comedy Drama -Hearts in Atlantis,2001,101,31,6.7,6577,PG-13,Drama -Hellboy,2004,132,66,6.7,15565,PG-13,Action -Hit and Runway,1999,108,1.2,6.7,189,R,Comedy -How Harry Became a Tree,2001,99,6,6.7,115,R,Drama -Interview with the Assassin,2002,88,0.75,6.7,409,R,Drama -Jerry and Tom,1998,106,5,6.7,447,R,Comedy Drama -Jing cha gu shi III: Chao ji jing cha,1992,95,0.9,6.7,2024,R,Action Comedy -Lemony Snicket's A Series of Unfortunate Events,2004,108,125,6.7,8402,PG,Comedy -Love & Basketball,2000,124,15,6.7,2093,PG-13,Romance Drama -"Majestic, The",2001,156,72,6.7,8649,PG,Romance Drama -Next Stop Wonderland,1998,104,1,6.7,1467,R,RomCom -Old School,2003,92,24,6.7,14283,R,Comedy -"Otra conquista, La",1998,106,3.5,6.7,140,R,Drama -Pay It Forward,2000,123,40,6.7,13531,PG-13,Romance Drama -Raising Victor Vargas,2002,88,0.8,6.7,1785,R,RomCom -Ravenous,1999,108,12,6.7,5915,R,Comedy Drama -Romeo + Juliet,1996,120,14.5,6.7,22306,PG-13,Action Drama -"Rules of Attraction, The",2002,110,4,6.7,8552,R,RomCom -Rush Hour,1998,93,35,6.7,18336,PG-13,Action Comedy -Shanghai Noon,2000,110,55,6.7,12258,PG-13,Action Comedy -Snow Falling on Cedars,1999,127,36,6.7,4536,PG-13,Drama -Spanglish,2004,130,80,6.7,4698,PG-13,RomCom -Starship Troopers,1997,129,95,6.7,32618,R,Action -Tea with Mussolini,1999,117,12,6.7,2711,PG,Comedy Drama -"Thomas Crown Affair, The",1999,113,48,6.7,17220,R,RomCom -Under the Tuscan Sun,2003,113,18,6.7,4183,PG-13,RomCom -"X Files, The",1998,121,66,6.7,18314,PG-13,Action -Analyze This,1999,109,30,6.6,24521,R,Comedy -Anna and the King,1999,148,75,6.6,6739,PG-13,Romance Drama -Barbershop,2002,102,12,6.6,4943,PG-13,Comedy Drama -Blade II,2002,108,55,6.6,17139,R,Action -Blue Hill Avenue,2001,120,1.2,6.6,85,R,Drama -Changing Lanes,2002,99,45,6.6,12779,R,Drama -Chuck&Buck,2000,96,0.25,6.6,1919,R,Comedy Drama -Coach Carter,2005,136,30,6.6,1636,PG-13,Drama -Dark Blue,2002,118,15,6.6,3882,R,Action Drama -Dodgeball: A True Underdog Story,2004,92,20,6.6,14584,PG-13,Comedy -Dumb & Dumber,1994,101,16,6.6,27713,PG-13,Comedy -Fever Pitch,2005,98,39.69,6.6,1712,PG-13,RomCom -Finding Graceland,1998,106,10,6.6,504,PG-13,Drama -"Firm, The",1993,154,42,6.6,14708,R,Drama -Get on the Bus,1996,120,2.4,6.6,1142,R,Drama -He Got Game,1998,137,25,6.6,4198,R,Drama -Hidalgo,2004,136,78,6.6,7328,PG-13,Action Drama -Hurricane,1997,91,0.5,6.6,424,R,Drama -"Interpreter, The",2005,128,80,6.6,4678,PG-13,Drama -Intolerable Cruelty,2003,100,60,6.6,11967,PG-13,RomCom -James and the Giant Peach,1996,79,38,6.6,3144,PG,Animated -K-19: The Widowmaker,2002,140,100,6.6,8292,PG-13,Drama -Kingpin,1996,117,25,6.6,10643,PG-13,Comedy -Love Liza,2002,90,1,6.6,1588,R,Drama -Meet Joe Black,1998,178,90,6.6,16796,PG-13,Romance Drama -Men of Honor,2000,129,32,6.6,9684,R,Drama -Mission: Impossible,1996,110,75,6.6,33496,PG-13,Action -"Molly Maguires, The",1970,124,11,6.6,455,PG,Drama -Music of the Heart,1999,124,27,6.6,2348,PG,Drama -National Treasure,2004,131,100,6.6,12361,PG,Action -No Way Home,1996,99,4,6.6,328,R,Drama -Nurse Betty,2000,110,24,6.6,10441,R,RomCom -Poolhall Junkies,2002,94,4,6.6,1411,R,Drama -Private Parts,1997,109,20,6.6,9289,R,Comedy Drama -Ransom,1996,139,80,6.6,17678,R,Action Drama -Restoration,1995,117,18,6.6,1874,R,Drama -Ripley's Game,2002,112,30,6.6,2680,R,Drama -Serendipity,2001,90,28,6.6,10795,PG-13,RomCom -Session 9,2001,97,1.5,6.6,3718,R,Drama -Seven Years in Tibet,1997,139,70,6.6,9426,PG-13,Drama -Shooting Fish,1997,103,3,6.6,2701,PG,RomCom -Steamboy,2004,126,20,6.6,529,PG-13,Animated -"Sum of All Fears, The",2002,123,68,6.6,15835,PG-13,Action Drama -Swiri,1999,125,5,6.6,1704,R,Action -Things to Do in Denver When You're Dead,1995,115,8,6.6,5703,R,Romance Drama -Treasure Planet,2002,95,140,6.6,3724,PG,Animated -Unfaithful,2002,125,50,6.6,8713,R,Drama -"Village, The",2004,108,60,6.6,25729,PG-13,Drama -"Walk on the Moon, A",1999,105,14,6.6,1815,R,Romance Drama -Walking and Talking,1996,86,1,6.6,888,R,RomCom -War and Peace,1956,208,6,6.6,795,PG,Romance Drama -What Lies Beneath,2000,130,90,6.6,20584,PG-13,Drama -Anchorman: The Legend of Ron Burgundy,2004,104,26,6.5,11553,PG-13,Comedy -Anything Else,2003,108,18,6.5,3678,R,RomCom -Austin Powers: The Spy Who Shagged Me,1999,95,33,6.5,37019,PG-13,Action Comedy -Cherish,2002,99,1.5,6.5,743,R,Comedy Drama -Copycat,1995,123,20,6.5,7804,R,Drama -Crazy/Beautiful,2001,135,14,6.5,4503,PG-13,Romance Drama -Cruel Intentions,1999,97,11,6.5,25634,R,Romance Drama -Ella Enchanted,2004,96,35,6.5,2502,PG,RomCom -Eulogy,2004,91,10,6.5,773,R,Comedy Drama -"Family Man, The",2000,125,60,6.5,11220,PG-13,RomCom -Final Fantasy: The Spirits Within,2001,106,137,6.5,16451,PG-13,Animated -Freeway,1996,102,3,6.5,4961,R,Drama -Grace of My Heart,1996,116,5,6.5,982,R,Comedy Drama -"Home at the End of the World, A",2004,96,6.5,6.5,1693,R,Romance Drama -Hong faan kui,1996,91,7.5,6.5,4644,R,Action Comedy -"House of Yes, The",1997,85,1.5,6.5,2345,R,Comedy Drama -"Incredibly True Adventure of Two Girls in Love, The",1995,94,0.25,6.5,795,R,RomCom -"Knight's Tale, A",2001,132,41,6.5,15006,PG-13,Action Comedy -Liar Liar,1997,86,45,6.5,22969,PG-13,Comedy -Living Out Loud,1998,103,12,6.5,1774,R,RomCom -"Long Kiss Goodnight, The",1996,120,65,6.5,12516,R,Action Drama -Love and Other Catastrophes,1996,78,0.25,6.5,783,R,RomCom -Made,2001,94,5,6.5,4487,R,Comedy Drama -Marvin's Room,1996,98,23,6.5,4005,PG-13,Comedy Drama -Matilda,1996,102,36,6.5,4351,PG,Comedy Drama -Meet the Fockers,2004,115,80,6.5,11950,PG-13,Comedy -"Mummy, The",1999,124,76,6.5,36216,PG-13,Action Comedy -"Other Side of Heaven, The",2001,113,7,6.5,683,PG,Drama -Paint Your Wagon,1969,158,20,6.5,2011,PG-13,Comedy -Rat Race,2001,112,48,6.5,13913,PG-13,Comedy -"Rundown, The",2003,104,85,6.5,8067,PG-13,Action Comedy -Rush Hour 2,2001,86,90,6.5,16581,PG-13,Action Comedy -Shade,2003,101,6.8,6.5,1616,R,Drama -Sidewalks of New York,2001,108,1,6.5,1998,R,RomCom -Sinbad: Legend of the Seven Seas,2003,86,60,6.5,2340,PG,Animated -Sky Captain and the World of Tomorrow,2004,106,40,6.5,12579,PG,Action -Small Time Crooks,2000,94,18,6.5,6218,PG,RomCom -Soul Food,1997,114,7.5,6.5,1166,R,Comedy Drama -"SpongeBob SquarePants Movie, The",2004,90,30,6.5,2672,PG,Animated -Star Trek: Nemesis,2002,116,70,6.5,11785,PG-13,Action Drama -Summer of Sam,1999,142,22,6.5,8151,R,Romance Drama -THX 1138,1971,88,0.777,6.5,4274,R,Drama -Tuck Everlasting,2002,96,15,6.5,2055,PG,Romance Drama -Twin Peaks: Fire Walk with Me,1992,135,10,6.5,6927,R,Drama -U Turn,1997,125,19,6.5,10306,R,Drama -U-571,2000,116,62,6.5,15792,PG-13,Action Drama -While You Were Sleeping,1995,103,17,6.5,13035,PG,RomCom -13 Going On 30,2004,98,37,6.4,7859,PG-13,RomCom -Absolute Power,1997,121,50,6.4,7995,R,Drama -Ali,2001,165,107,6.4,9294,R,Drama -Any Given Sunday,1999,156,62,6.4,19531,R,Drama -Apt Pupil,1998,112,14,6.4,6728,R,Drama -Atlantis: The Lost Empire,2001,95,90,6.4,6323,PG,Animated -Bad Boys,1995,118,23,6.4,15326,R,Action Comedy -Beyond Rangoon,1995,100,23,6.4,1285,R,Drama -Big Trouble,2002,85,40,6.4,4088,PG-13,Comedy -Blast from the Past,1999,112,35,6.4,9483,PG-13,RomCom -Bowfinger,1999,97,55,6.4,15000,PG-13,Comedy -"Brothers McMullen, The",1995,98,0.0238,6.4,2325,R,Comedy Drama -Bruce Almighty,2003,101,81,6.4,23905,PG-13,RomCom -Cellular,2004,94,25,6.4,6182,PG-13,Action -"Civil Action, A",1998,112,60,6.4,6847,PG-13,Drama -Clay Pigeons,1998,104,8,6.4,2658,R,Comedy Drama -Code 46,2003,92,7.5,6.4,2094,R,Romance Drama -Conspiracy Theory,1997,135,75,6.4,15470,R,Romance Drama -CQ,2001,91,7,6.4,1315,R,Comedy Drama -Dancing in September,2000,102,0.85,6.4,166,R,Drama -Die Another Day,2002,133,142,6.4,22136,PG-13,Action -Drive,1997,117,3.5,6.4,1086,R,Action Comedy -"Game of Their Lives, The",2005,101,20,6.4,125,PG,Drama -"Ghost and the Darkness, The",1996,109,55,6.4,8360,R,Action Drama -God's Army,2000,108,0.3,6.4,354,PG,Drama -"Happy, Texas",1999,98,1.7,6.4,3453,PG-13,Comedy -"Horse Whisperer, The",1998,170,60,6.4,6744,PG-13,Romance Drama -Incident at Loch Ness,2004,94,1.4,6.4,251,PG-13,Comedy -Intermission,2003,102,5,6.4,1971,R,Comedy Drama -Jersey Girl,2004,102,35,6.4,6853,PG-13,Comedy Drama -John Q,2002,116,36,6.4,8952,PG-13,Drama -Kiss the Girls,1997,111,27,6.4,9041,R,Drama -"Ladykillers, The",2004,104,35,6.4,10580,R,Comedy -"Last Castle, The",2001,131,60,6.4,7233,R,Action Drama -Legally Blonde,2001,96,18,6.4,17572,PG-13,Comedy -"Legend of Bagger Vance, The",2000,126,60,6.4,7123,PG-13,RomCom -Levity,2003,100,7.5,6.4,1459,R,Drama -"Life Less Ordinary, A",1997,103,12,6.4,8209,R,RomCom -Midnight in the Garden of Good and Evil,1997,155,30,6.4,8517,R,Drama -Mutant Aliens,2001,81,0.2,6.4,223,R,Animated -My Best Friend's Wedding,1997,105,46,6.4,16648,PG-13,RomCom -"Mystery, Alaska",1999,119,28,6.4,5440,R,Comedy Drama -Outbreak,1995,127,50,6.4,13796,R,Drama -Pecker,1998,87,6,6.4,4013,R,Comedy -Primer,2004,77,0.007,6.4,1466,PG-13,Drama -Rare Birds,2001,99,5,6.4,471,R,Comedy Drama -Robots,2005,91,75,6.4,4089,PG,Animated -Slums of Beverly Hills,1998,92,5,6.4,2914,R,Comedy Drama -Star Wars: Episode I - The Phantom Menace,1999,133,115,6.4,84488,PG,Action -Titan A.E.,2000,94,75,6.4,9373,PG,Animated -Tomorrow Never Dies,1997,119,110,6.4,19397,PG-13,Action -Under Suspicion,2000,111,25,6.4,3718,R,Drama -Vatel,2000,125,36,6.4,1322,PG-13,Romance Drama -What Women Want,2000,127,65,6.4,20138,PG-13,RomCom -Where the Heart Is,2000,120,15,6.4,5042,PG-13,RomCom -White Squall,1996,129,38,6.4,3445,PG-13,Drama -Wicker Park,2004,114,30,6.4,3143,PG-13,Romance Drama -Your Friends & Neighbors,1998,100,5,6.4,2659,R,Comedy Drama -Air Force One,1997,124,85,6.3,26156,R,Action Drama -American Pie 2,2001,105,30,6.3,22752,R,Comedy -American Wedding,2003,103,55,6.3,13590,R,Comedy -Assault on Precinct 13,2005,109,20,6.3,2960,R,Action Drama -"Badge, The",2002,103,6,6.3,740,R,Action Drama -Bamboozled,2000,135,10,6.3,2356,R,Comedy Drama -"Basket, The",1999,105,3,6.3,200,PG,Drama -Best Laid Plans,1999,92,7,6.3,1795,R,Drama -Blood Work,2002,110,50,6.3,5965,R,Drama -Bride & Prejudice,2004,122,7,6.3,1503,PG-13,RomCom -City by the Sea,2002,108,60,6.3,4886,R,Drama -Crime Spree,2003,98,10,6.3,953,R,Comedy -"Day After Tomorrow, The",2004,124,125,6.3,23749,PG-13,Action Drama -Dead Presidents,1995,119,15,6.3,2641,R,Action Drama -Death to Smoochy,2002,109,55,6.3,8003,R,Comedy -"Defender, The",2004,90,6,6.3,58,R,Action -Dick,1999,94,13,6.3,5004,PG-13,Comedy -Dinosaur,2000,82,127.5,6.3,5839,PG,Animated -Feng yun xiong ba tian xia,1998,85,10,6.3,922,PG-13,Action -Goat on Fire and Smiling Fish,1999,90,0.04,6.3,254,R,RomCom -Guinevere,1999,104,2.6,6.3,804,R,Romance Drama -Hollywood Ending,2002,112,16,6.3,3673,PG-13,Comedy Drama -Kate & Leopold,2001,123,48,6.3,8060,PG-13,RomCom -Keane,2004,100,0.85,6.3,34,R,Drama -Lethal Weapon 4,1998,127,140,6.3,17758,R,Action Comedy -Love Object,2003,88,1,6.3,427,R,Comedy -Lucky Break,2001,108,6,6.3,707,PG-13,Comedy -"Matrix Revolutions, The",2003,125,110,6.3,40058,R,Action -Mindhunters,2004,102,27,6.3,3925,R,Action -Muertos de risa,1999,111,3.5,6.3,334,R,Comedy -My Fellow Americans,1996,101,21.5,6.3,2752,PG-13,Comedy -Nochnoy dozor,2004,115,4.2,6.3,1020,R,Action -O,2001,95,5,6.3,4555,R,Romance Drama -One Eight Seven,1997,119,23,6.3,2958,R,Drama -Onegin,1999,106,14,6.3,1327,R,Romance Drama -Phenomenon,1996,123,32,6.3,12075,PG,Romance Drama -Proof of Life,2000,135,65,6.3,9592,R,Action Drama -"Road to El Dorado, The",2000,89,95,6.3,2838,PG,Animated -Road Trip,2000,94,15.6,6.3,15981,R,Comedy -Rules of Engagement,2000,128,60,6.3,7903,R,Drama -Secret Window,2004,96,40,6.3,13260,PG-13,Drama -Serial Mom,1994,95,13,6.3,4750,R,Comedy -Shanghai Knights,2003,114,50,6.3,7279,PG-13,Action Comedy -"Shot at Glory, A",2000,114,9,6.3,286,R,Drama -Smilla's Sense of Snow,1997,120,35,6.3,3722,R,Action Drama -Solaris,2002,99,47,6.3,11808,PG-13,Romance Drama -Star Trek: Insurrection,1998,103,58,6.3,13395,PG,Action Drama -Starsky & Hutch,2004,101,60,6.3,13529,PG-13,Action Comedy -Super Troopers,2001,100,3,6.3,7728,R,Comedy -Tadpole,2002,78,0.15,6.3,1769,PG-13,RomCom -What Dreams May Come,1998,113,85,6.3,11706,PG-13,Romance Drama -Wimbledon,2004,98,31,6.3,4297,PG-13,RomCom -"Work and the Glory, The",2004,118,7.5,6.3,180,PG,Romance Drama -"World Is Not Enough, The",1999,128,135,6.3,24205,PG-13,Action -"Yards, The",2000,115,20,6.3,3386,R,Drama -Ace Ventura: Pet Detective,1994,86,12,6.2,20705,PG-13,Comedy -Austin Powers in Goldmember,2002,94,63,6.2,22870,PG-13,Action Comedy -Baby Boy,2001,130,16,6.2,1476,R,Romance Drama -"Ballad of Jack and Rose, The",2005,112,1.5,6.2,269,R,Drama -Basic,2003,98,50,6.2,8370,R,Drama -Beavis and Butt-Head Do America,1996,81,12,6.2,9491,PG-13,Animated -Bicentennial Man,1999,132,100,6.2,8925,PG,Romance Drama -"Bone Collector, The",1999,118,48,6.2,17766,R,Drama -But I'm a Cheerleader,1999,85,1.2,6.2,3897,R,RomCom -Can't Hardly Wait,1998,101,10,6.2,8191,PG-13,RomCom -"Chronicles of Riddick, The",2004,135,110,6.2,11438,PG-13,Action -City of Angels,1998,114,55,6.2,15333,PG-13,Romance Drama -"Company, The",2003,112,15,6.2,1505,PG-13,Drama -Don't Say a Word,2001,113,50,6.2,10098,R,Drama -Edtv,1999,122,60,6.2,10085,PG-13,Comedy -Emmett's Mark,2002,104,4.5,6.2,427,R,Drama -Evita,1996,134,55,6.2,8371,PG,Drama -"Four Feathers, The",2002,125,80,6.2,4400,PG-13,Drama -Grumpier Old Men,1995,101,25,6.2,3711,PG-13,RomCom -Hart's War,2002,125,70,6.2,6368,R,Drama -"Heart of Me, The",2002,96,7,6.2,336,R,Romance Drama -Heartbreakers,2001,110,40,6.2,8037,PG-13,RomCom -High Strung,1991,93,0.3,6.2,391,PG,Comedy -I Married a Strange Person!,1997,74,0.25,6.2,391,R,Animated -I'm with Lucy,2002,90,15,6.2,646,R,RomCom -In & Out,1997,92,35,6.2,10352,PG-13,Comedy -Just Looking,1999,97,3,6.2,436,R,Comedy -Kiss of the Dragon,2001,98,25,6.2,7887,R,Action Drama -Love Story,1970,99,2.2,6.2,2844,PG,Romance Drama -Miss Congeniality,2000,109,45,6.2,16235,PG-13,Comedy -Northfork,2003,103,1.9,6.2,1521,PG-13,Drama -Osmosis Jones,2001,95,75,6.2,3410,PG,Animated -Pandaemonium,2000,124,15,6.2,244,PG-13,Drama -"Perfect Storm, The",2000,130,120,6.2,24946,PG-13,Action Drama -"Powerpuff Girls, The",2002,73,10,6.2,1334,PG,Animated -Price of Glory,2000,118,10,6.2,265,PG-13,Drama -Prozac Nation,2001,99,9,6.2,940,R,Drama -"Punisher, The",2004,124,33,6.2,9989,R,Action -"Replacements, The",2000,114,50,6.2,7617,PG-13,Comedy -Resident Evil,2002,100,35,6.2,18978,R,Action -Riding in Cars with Boys,2001,132,48,6.2,4627,PG-13,Comedy Drama -Six-String Samurai,1998,91,2,6.2,1163,PG-13,Action -Snitch,1998,90,11,6.2,412,R,Action Drama -Spun,2002,106,2.8,6.2,3924,R,Comedy Drama -Stark Raving Mad,2002,102,5,6.2,601,R,Comedy -Stolen Summer,2002,91,1.5,6.2,801,PG,Drama -Swordfish,2001,99,80,6.2,20455,R,Action -Tears of the Sun,2003,121,70,6.2,8690,R,Action Drama -Timecode,2000,97,4,6.2,2320,R,Comedy Drama -Tin Cup,1996,135,45,6.2,7521,R,RomCom -"Walk in the Clouds, A",1995,102,20,6.2,4085,PG-13,Romance Drama -Where the Money Is,2000,89,18,6.2,1461,PG-13,Comedy Drama -Where's Marlowe?,1998,97,3.5,6.2,188,R,Comedy -Willard,2003,100,22,6.2,2913,PG-13,Comedy Drama -"Wood, The",1999,102,6,6.2,1170,R,RomCom -You've Got Mail,1998,119,65,6.2,20053,PG,RomCom -"13th Warrior, The",1999,102,85,6.1,14344,R,Action -15 Minutes,2001,120,42,6.1,10866,R,Drama -"51st State, The",2001,92,28,6.1,6752,R,Action Comedy -Along Came a Spider,2001,104,28,6.1,9456,R,Drama -Bad Boys II,2003,145,130,6.1,13087,R,Action Comedy -Basil,1998,113,10,6.1,367,R,Romance Drama -Behind Enemy Lines,2001,106,40,6.1,10856,PG-13,Action Drama -Beyond Re-Animator,2003,96,3,6.1,908,R,Comedy -"Big Tease, The",1999,86,4,6.1,670,R,Comedy -Birthday Girl,2001,93,13,6.1,5340,R,RomCom -Bring It On,2000,98,10,6.1,11784,PG-13,Comedy -Broken Vessels,1998,90,0.6,6.1,223,R,Drama -Celebrity,1998,113,12,6.1,4820,R,Comedy -Chain of Fools,2000,96,20,6.1,845,R,Comedy -City Hall,1996,111,40,6.1,4381,R,Drama -Crazy in Alabama,1999,111,15,6.1,2086,PG-13,Comedy Drama -Entrapment,1999,113,66,6.1,18543,PG-13,RomCom -EuroTrip,2004,90,25,6.1,8390,R,Comedy -"Everlasting Piece, An",2000,103,14,6.1,475,R,Comedy -Flawless,1999,112,27,6.1,3287,R,Comedy Drama -For Love of the Game,1999,137,50,6.1,5782,PG-13,Romance Drama -Freddy Vs. Jason,2003,97,25,6.1,11109,R,Action -"General's Daughter, The",1999,116,60,6.1,11128,R,Drama -Heart of America,2003,87,3,6.1,204,R,Drama -Hideous Kinky,1998,98,12,6.1,1615,R,Drama -High Crimes,2002,115,42,6.1,6043,PG-13,Drama -How to Lose a Guy in 10 Days,2003,116,50,6.1,9257,PG-13,RomCom -Hulk,2003,138,120,6.1,20710,PG-13,Action Drama -Independence Day,1996,153,75,6.1,61831,PG-13,Action -Instinct,1999,126,55,6.1,6298,R,Drama -"Kid, The",2000,104,65,6.1,5418,PG,Comedy Drama -Looney Tunes: Back in Action,2003,91,80,6.1,2559,PG,Animated -Losing Isaiah,1995,111,17,6.1,794,R,Drama -Mars Attacks!,1996,106,70,6.1,27363,PG-13,Action Comedy -Mona Lisa Smile,2003,117,65,6.1,6838,PG-13,RomCom -Montana,1998,92,4,6.1,417,R,Action Drama -"Mummy Returns, The",2001,130,98,6.1,23551,PG-13,Action -Open Water,2003,79,0.13,6.1,7204,R,Drama -Orange County,2002,82,18,6.1,8526,PG-13,Comedy Drama -Outside Providence,1999,96,7,6.1,2735,R,RomCom -Patch Adams,1998,115,50,6.1,12110,PG-13,Comedy Drama -Paycheck,2003,119,60,6.1,10383,PG-13,Action -Sabrina,1995,127,58,6.1,7547,PG,RomCom -Safe Men,1998,88,1,6.1,590,R,Comedy -Save the Last Dance,2001,112,13,6.1,7613,PG-13,Romance Drama -Selena,1997,127,20,6.1,2870,PG,Drama -Set It Off,1996,123,9,6.1,1619,R,Action Drama -Shallow Hal,2001,113,40,6.1,13217,PG-13,RomCom -"Sleeping Dictionary, The",2003,109,12,6.1,696,R,Romance Drama -"Statement, The",2003,120,23,6.1,710,R,Drama -Stepmom,1998,124,50,6.1,7470,PG-13,Comedy Drama -Surviving Picasso,1996,125,16,6.1,1139,R,Romance Drama -Switchback,1997,118,38,6.1,2195,R,Action -"Tailor of Panama, The",2001,109,18,6.1,5997,R,Comedy Drama -There Goes My Baby,1994,110,10.5,6.1,253,R,Comedy Drama -U.S. Marshals,1998,131,60,6.1,10315,PG-13,Action Drama -Vanity Fair,2004,141,23,6.1,2151,PG-13,Romance Drama -We Don't Live Here Anymore,2004,101,3,6.1,1387,R,Drama -Welcome to Collinwood,2002,86,12,6.1,2831,R,Comedy -Zoolander,2001,89,28,6.1,18277,PG-13,Comedy -28 Days,2000,103,43,6,7465,PG-13,Drama -After the Sunset,2004,97,58,6,3431,PG-13,Action Comedy -Albino Alligator,1996,97,5,6,2077,R,Drama -Alfie,2004,103,60,6,3492,R,Comedy Drama -Alien: Resurrection,1997,116,70,6,24358,R,Action -Anger Management,2003,106,75,6,14280,PG-13,Comedy -Antitrust,2001,108,30,6,7326,PG-13,Drama -"Battle of Shaker Heights, The",2003,90,1,6,854,PG-13,RomCom -Birth,2004,100,20,6,2600,R,Romance Drama -Blood and Wine,1996,101,26,6,2134,R,Drama -Bruno,2000,108,10,6,295,PG-13,Comedy Drama -"Brylcreem Boys, The",1998,106,6,6,199,PG-13,Romance Drama -Cecil B. DeMented,2000,87,10,6,3464,R,Comedy -Children On Their Birthdays,2002,102,10,6,163,PG,Drama -D.E.B.S.,2004,91,3.5,6,300,PG-13,Action Comedy -Detroit Rock City,1999,95,15,6,4607,R,Comedy -"Dog of Flanders, A",1999,100,7,6,179,PG,Drama -Down and Out with the Dolls,2001,88,1.2,6,37,R,Comedy -Empire,2002,90,3.5,6,1718,R,Action Drama -Flight of the Phoenix,2004,113,45,6,2732,PG-13,Action -Four Rooms,1995,98,4,6,10675,R,Comedy Drama -Frankenstein,1994,123,45,6,6941,R,Drama -Gerry,2002,105,3.5,6,1944,R,Drama -"Golden Bowl, The",2000,130,15,6,1145,R,Drama -Groove,2000,86,0.5,6,1171,R,Drama -Hard Ball,2001,109,21,6,3083,PG-13,Drama -Jumanji,1995,104,65,6,14874,PG,Action Comedy -King Arthur,2004,140,90,6,14272,R,Action Drama -Mad City,1997,115,50,6,3965,PG-13,Drama -"Man in the Iron Mask, The",1998,132,35,6,11127,PG-13,Action Drama -"Me, Myself & Irene",2000,116,51,6,21305,R,Comedy -"Mexican, The",2001,123,38,6,13935,R,RomCom -"Object of My Affection, The",1998,111,15,6,4027,R,RomCom -Ocean's Twelve,2004,125,110,6,14797,PG-13,Comedy -Once Upon a Time in Mexico,2003,102,29,6,14732,R,Action -"Perez Family, The",1995,113,11,6,517,R,RomCom -Queen's Messenger II,2001,90,4,6,27,R,Action -"Rainbow Thief, The",1990,87,10,6,49,R,Drama -Shaft,2000,99,46,6,13742,R,Action -Shall We Dance,2004,106,40,6,3479,PG-13,RomCom -She's the One,1996,96,3.5,6,3779,R,RomCom -"Slaughter Rule, The",2002,112,0.5,6,356,R,Drama -Stigmata,1999,103,32,6,14062,R,Drama -Stuart Little,1999,81,103,6,8009,PG,Comedy -Three to Tango,1999,98,20,6,5719,PG-13,RomCom -Twist,2003,97,0.35,6,197,R,Drama -Undercover Brother,2002,85,25,6,5138,PG-13,Action Comedy -Varsity Blues,1999,100,16,6,7974,R,Drama -Wide Awake,1998,88,7,6,655,PG,Comedy Drama -"6th Day, The",2000,123,82,5.9,12064,PG-13,Action -"Alamo, The",2004,137,95,5.9,3060,PG-13,Action Drama -Anywhere But Here,1999,114,23,5.9,4007,PG-13,Drama -Baptists at Our Barbecue,2004,92,0.5,5.9,62,PG,RomCom -Because of Winn-Dixie,2005,106,14,5.9,483,PG,Comedy Drama -Bedazzled,2000,93,48,5.9,11439,PG-13,Comedy -Big Daddy,1999,93,34.2,5.9,18258,PG-13,Comedy -Brown Sugar,2002,109,8,5.9,941,PG-13,RomCom -Captain Corelli's Mandolin,2001,131,57,5.9,5281,R,Romance Drama -"Craft, The",1996,101,15,5.9,9187,R,Comedy Drama -"Deep End of the Ocean, The",1999,106,40,5.9,2890,PG-13,Drama -Deep Impact,1998,120,75,5.9,22684,PG-13,Drama -Dirty Work,1998,82,13,5.9,4252,PG-13,Comedy -Double Jeopardy,1999,105,40,5.9,13587,R,Drama -"Guru, The",2002,94,11,5.9,3505,R,RomCom -Jakob the Liar,1999,120,15,5.9,2544,PG-13,Comedy Drama -Love's Labour's Lost,2000,93,13,5.9,1254,PG,RomCom -Men with Brooms,2002,102,7.5,5.9,1096,R,RomCom -Novocaine,2001,95,6,5.9,2829,R,Comedy Drama -Overnight Delivery,1998,87,12,5.9,1229,PG-13,RomCom -"Peacemaker, The",1997,124,50,5.9,8994,R,Action -Pushing Tin,1999,119,33,5.9,7528,R,Comedy Drama -S.W.A.T.,2003,117,80,5.9,12732,PG-13,Action -Shark Tale,2004,90,75,5.9,7819,PG,Animated -"Siege, The",1998,116,70,5.9,9725,R,Action Drama -Stuart Little 2,2002,82,120,5.9,2324,PG,Comedy -"Texas Chainsaw Massacre, The",2003,98,9.2,5.9,9587,R,Action -Twister,1996,113,92,5.9,28315,PG-13,Action Drama -Walking Tall,2004,87,56,5.9,4839,PG-13,Action Drama -Wild in the Streets,1968,94,1,5.9,329,R,Drama -Windtalkers,2002,153,115,5.9,9081,R,Action Drama -Along Came Polly,2004,90,42,5.8,9785,PG-13,RomCom -America's Sweethearts,2001,102,48,5.8,11849,PG-13,RomCom -"Awfully Big Adventure, An",1995,112,4,5.8,608,R,Drama -"Beach, The",2000,119,50,5.8,15020,R,Drama -Bounce,2000,106,35,5.8,5390,PG-13,Romance Drama -Charlie's Angels,2000,94,92,5.8,25705,PG-13,Action Comedy -Cheaper by the Dozen,2003,98,40,5.8,5977,PG,Comedy Drama -"Confession, The",1999,114,4,5.8,519,R,Drama -Critical Care,1997,107,12,5.8,397,R,Comedy Drama -Dragonfly,2002,104,60,5.8,5431,PG-13,Drama -Duets,2000,112,15,5.8,2414,R,Comedy Drama -Eraser,1996,115,100,5.8,14641,R,Action Drama -Evolution,2001,101,80,5.8,14232,PG-13,Comedy -"Forgotten, The",2004,94,42,5.8,8234,PG-13,Drama -Freeze Frame,2004,99,2,5.8,189,R,Drama -Go Fish,1994,84,0.015,5.8,621,R,Romance Drama -Harriet the Spy,1996,100,13,5.8,845,PG,Comedy Drama -Impostor,2002,102,40,5.8,3292,R,Action Drama -Kansas City,1996,116,19,5.8,1077,R,Drama -Life,1999,108,75,5.8,4857,R,Comedy Drama -Mickey Blue Eyes,1999,102,40,5.8,7247,PG-13,RomCom -Mousehunt,1997,99,38,5.8,4637,PG,Action Comedy -Mrs. Winterbourne,1996,105,25,5.8,1310,PG-13,RomCom -Mystery Men,1999,121,68,5.8,13331,PG-13,Action Comedy -"Nutty Professor, The",1996,95,54,5.8,12273,PG-13,RomCom -Party Monster,2003,98,5,5.8,1976,R,Drama -Reign of Fire,2002,101,95,5.8,11452,PG-13,Action -"Replacement Killers, The",1998,87,30,5.8,6825,R,Action -Rock Star,2001,105,38,5.8,5100,R,Comedy Drama -Romeo Must Die,2000,115,25,5.8,10229,R,Action Drama -Sahara,2005,124,130,5.8,3004,PG-13,Action Comedy -Small Soldiers,1998,110,40,5.8,6938,PG-13,Action Comedy -Spy Kids 2: Island of Lost Dreams,2002,99,39,5.8,3175,PG,Action Comedy -Sugar Town,1999,92,0.25,5.8,307,R,Comedy -Sweet Home Alabama,2002,108,38,5.8,9943,PG-13,RomCom -Triggermen,2002,96,12,5.8,317,R,Comedy -Tromeo and Juliet,1996,108,0.35,5.8,1030,R,Comedy Drama -Two Can Play That Game,2001,93,6,5.8,843,R,RomCom -Two Weeks Notice,2002,101,60,5.8,15010,PG-13,RomCom -Van Wilder,2002,94,6,5.8,7799,R,Comedy -Very Bad Things,1998,100,10,5.8,10001,R,Comedy -Win a Date with Tad Hamilton!,2004,95,24,5.8,2933,PG-13,RomCom -Armageddon,1998,153,140,5.7,45330,PG-13,Action -Around the World in 80 Days,2004,120,110,5.7,3887,PG,Action Comedy -Assassins,1995,132,50,5.7,7354,R,Action -At First Sight,1999,128,40,5.7,3441,PG-13,Drama -Barbershop 2: Back in Business,2004,106,18,5.7,1580,PG-13,Comedy -"Big Hit, The",1998,91,13,5.7,6206,R,Action Comedy -Blade: Trinity,2004,124,65,5.7,7439,R,Action -Blue Crush,2002,104,30,5.7,4791,PG-13,Romance Drama -Bridget Jones: The Edge of Reason,2004,108,70,5.7,6636,R,RomCom -Broken Arrow,1996,108,65,5.7,14415,R,Action -Cafe Society,1995,104,3.5,5.7,137,R,Drama -Can't Be Heaven,2000,94,2,5.7,104,PG,RomCom -"Chamber, The",1996,113,50,5.7,2540,R,Drama -Chasing Liberty,2004,111,23,5.7,1911,PG-13,RomCom -Daddy Day Care,2003,92,60,5.7,3803,PG,Comedy -Daredevil,2003,133,75,5.7,20642,R,Action -Dead Man's Curve,1998,90,1,5.7,1241,R,Comedy Drama -"Devil's Own, The",1997,111,80,5.7,8485,R,Action Drama -Duplex,2003,89,40,5.7,4334,PG-13,Comedy -"Falls, The",2003,85,0.075,5.7,29,R,Drama -"Fast and the Furious, The",2001,106,38,5.7,21428,PG-13,Action -Get Over It,2001,87,10,5.7,3561,PG-13,RomCom -Global Heresy,2002,106,12,5.7,373,R,Drama -Gods and Generals,2003,209,56,5.7,3002,PG-13,Action Drama -Gone in Sixty Seconds,2000,117,90,5.7,25400,PG-13,Action -Grey Owl,1999,118,30,5.7,629,PG-13,Drama -HipHopBattle.com: Hip Hop 4 Life,2001,98,0.012,5.7,15,PG-13,RomCom -Hollywood North,2003,89,7,5.7,114,R,Comedy -How the Grinch Stole Christmas,2000,104,123,5.7,12680,PG,Comedy Drama -Last Man Standing,1996,101,67,5.7,6751,R,Action Drama -Laws of Attraction,2004,90,28,5.7,2349,PG-13,RomCom -Light It Up,1999,99,13,5.7,856,R,Drama -Lucky 13,2004,95,1.2,5.7,151,R,RomCom -"Mirror Has Two Faces, The",1996,122,42,5.7,2775,PG-13,RomCom -Mission: Impossible II,2000,123,125,5.7,35958,PG-13,Action -Mr 3000,2004,104,30,5.7,1459,PG-13,Comedy Drama -Multiplicity,1996,117,45,5.7,5241,PG-13,Comedy -Nadja,1994,93,1,5.7,781,R,Drama -Never Again,2001,98,0.5,5.7,309,R,RomCom -"Newton Boys, The",1998,113,27,5.7,2003,PG-13,Action Drama -One Night Stand,1997,102,24,5.7,1709,R,Drama -"Saint, The",1997,116,70,5.7,12591,PG-13,Action -She's So Lovely,1997,100,18,5.7,2280,R,RomCom -"Singles Ward, The",2002,102,0.5,5.7,291,PG,RomCom -Someone Like You...,2001,97,23,5.7,4249,PG-13,RomCom -Suspect Zero,2004,99,27,5.7,1310,R,Drama -"Taxman, The",1999,104,1,5.7,169,R,Action Comedy -"Triumph of Love, The",2001,112,5,5.7,423,PG-13,RomCom -Up Close & Personal,1996,124,60,5.7,3201,PG-13,Romance Drama -What a Girl Wants,2003,105,20,5.7,3533,PG,RomCom -Wisegirls,2002,96,11,5.7,792,R,Drama -100 Mile Rule,2002,98,1.1,5.6,181,R,Comedy -"24 Hour Woman, The",1999,93,2.5,5.6,149,R,Comedy -All the Pretty Horses,2000,116,45,5.6,3133,PG-13,Drama -Angel Eyes,2001,102,38,5.6,4829,R,Romance Drama -Bait,2000,119,35,5.6,1884,R,Action Comedy -"Banger Sisters, The",2002,98,10,5.6,3189,R,Comedy Drama -Beloved,1998,172,53,5.6,1934,R,Drama -"Borrowers, The",1997,89,29,5.6,1457,PG,Comedy -"Brady Bunch Movie, The",1995,90,12,5.6,4636,PG-13,Comedy -Bringing Down the House,2003,105,35,5.6,6501,PG-13,Comedy -Casper,1995,100,55,5.6,8798,PG,Comedy -Dante's Peak,1997,104,104,5.6,9203,PG-13,Action Drama -Deuce Bigalow: Male Gigolo,1999,88,18,5.6,9897,R,Comedy -Devil's Pond,2003,92,5,5.6,370,R,Drama -Double Whammy,2001,100,4,5.6,886,R,Comedy Drama -Eye for an Eye,1996,101,20,5.6,1843,R,Drama -Faithful,1996,91,13,5.6,414,R,Comedy -Father of the Bride Part II,1995,106,30,5.6,4089,PG,Comedy -First Knight,1995,134,75,5.6,8708,PG-13,Romance Drama -Garage Days,2002,106,6,5.6,597,R,Comedy Drama -Gojira ni-sen mireniamu,1999,99,1,5.6,1150,PG,Action -"Grave, The",1996,90,4,5.6,303,R,Comedy -Jefferson in Paris,1995,139,14,5.6,665,PG-13,Drama -Johnny English,2003,87,35,5.6,8125,PG,Action Comedy -Jurassic Park III,2001,92,93,5.6,20690,PG-13,Action -Kiss the Sky,1999,107,6,5.6,263,R,Romance Drama -Liberty Stands Still,2002,92,11,5.6,1560,R,Drama -"Little Vampire, The",2000,91,22,5.6,601,PG,Comedy -Mayerling,1968,140,5,5.6,154,PG-13,Romance Drama -Men in Black II,2002,88,140,5.6,21580,PG-13,Action Comedy -Mercury Rising,1998,108,60,5.6,8202,R,Action Drama -Monster-in-Law,2005,102,60,5.6,147,PG-13,RomCom -"Muse, The",1999,97,15,5.6,3513,PG-13,Comedy -"Net, The",1995,114,22,5.6,12201,PG-13,Action Drama -No Looking Back,1998,96,5,5.6,622,R,RomCom -Paparazzi,2004,84,20,5.6,2028,PG-13,Drama -Picture Perfect,1997,105,19,5.6,3019,PG-13,RomCom -Planet of the Apes,2001,119,100,5.6,28601,PG-13,Action -Repli-Kate,2002,121,4,5.6,791,R,Comedy -Resident Evil: Apocalypse,2004,94,50,5.6,10486,R,Action -"Stand-In, The",1999,100,0.4,5.6,42,PG,Drama -"Story of Us, The",1999,95,50,5.6,4953,R,RomCom -Teacher's Pet,2004,74,10,5.6,218,PG,Animated -Terror Tract,2000,96,11,5.6,281,R,Comedy -Undisputed,2002,96,20,5.6,1769,R,Action Drama -Vampires,1998,106,20,5.6,7908,R,Action -Vertical Limit,2000,124,75,5.6,10273,PG-13,Action -What Planet Are You From?,2000,104,50,5.6,2574,R,Comedy -Wicked Spring,2002,102,0.5,5.6,158,PG-13,Drama -Agent Cody Banks,2003,102,26,5.5,2655,PG,Action Comedy -Alexander,2004,175,150,5.5,11254,R,Drama -American Outlaws,2001,94,35,5.5,2878,PG-13,Action Comedy -Be Cool,2005,118,53,5.5,4560,PG-13,Comedy -Big Fat Liar,2002,88,15,5.5,2453,PG,Comedy -Blind Horizon,2003,99,5.1,5.5,801,R,Drama -"Cable Guy, The",1996,96,47,5.5,16266,PG-13,Comedy Drama -Changing Habits,1997,95,1.2,5.5,134,R,Comedy Drama -Charly,2002,103,0.95,5.5,149,PG,RomCom -Curdled,1996,88,2.309723,5.5,959,R,Comedy -Deep Blue Sea,1999,105,78,5.5,17666,R,Action -Dickie Roberts: Former Child Star,2003,98,17,5.5,2076,PG-13,Comedy -Divine Secrets of the Ya-Ya Sisterhood,2002,116,27,5.5,4288,PG-13,Comedy Drama -Eight Legged Freaks,2002,99,30,5.5,6362,PG-13,Action Comedy -Escanaba in da Moonlight,2001,91,1,5.5,373,PG-13,Comedy -Forever Lulu,2000,99,20,5.5,257,R,RomCom -George of the Jungle,1997,92,55,5.5,6430,PG,Comedy -Hard Rain,1998,97,70,5.5,6161,R,Action Drama -"House on Turk Street, The",2002,103,12,5.5,1048,R,Drama -How to Deal,2003,102,16,5.5,1537,PG-13,RomCom -Joe Somebody,2001,98,38,5.5,1937,PG,RomCom -Just the Ticket,1999,115,12,5.5,610,R,RomCom -Kama Sutra: A Tale of Love,1996,114,3,5.5,1491,R,Romance Drama -"Lost World: Jurassic Park, The",1997,129,73,5.5,28055,PG-13,Action -Mary Reilly,1996,108,47,5.5,2806,R,Drama -"Million Dollar Hotel, The",2000,122,8,5.5,4746,R,Drama -Molly,1999,102,21,5.5,610,PG-13,RomCom -Money Talks,1997,97,25,5.5,2720,R,Action Comedy -Mr. Deeds,2002,96,50,5.5,11729,PG-13,RomCom -Original Sin,2001,116,26,5.5,4592,R,Romance Drama -Reindeer Games,2000,124,36,5.5,7120,R,Action Drama -Saturn,1999,94,0.35,5.5,43,R,Drama -Scary Movie,2000,88,19,5.5,23293,R,Comedy -Shakes the Clown,1992,87,1.4,5.5,838,R,Comedy -She's All That,1999,95,10,5.5,13070,PG-13,RomCom -Showtime,2002,96,85,5.5,7689,PG-13,Action Comedy -Sweet November,2001,115,40,5.5,5458,PG-13,RomCom -"Time Machine, The",2002,96,80,5.5,12424,PG-13,Action -"Waterboy, The",1998,90,23,5.5,15539,PG-13,Comedy -xXx,2002,132,85,5.5,18514,PG-13,Action -200 Cigarettes,1999,101,6,5.4,4514,R,Comedy Drama -3000 Miles to Graceland,2001,125,62,5.4,7298,R,Action Comedy -40 Days and 40 Nights,2002,96,17,5.4,8609,R,RomCom -54,1998,100,13,5.4,6905,R,Drama -All About the Benjamins,2002,95,14,5.4,1250,R,Action Comedy -AVP: Alien Vs. Predator,2004,102,45,5.4,14651,PG-13,Action -Bad Company,2002,116,70,5.4,6175,PG-13,Action Comedy -Batman Forever,1995,122,100,5.4,24025,PG-13,Action -Bean,1997,90,22,5.4,9018,PG-13,Comedy -Beyond Borders,2003,127,35,5.4,1905,R,Romance Drama -"Big Brass Ring, The",1999,104,7,5.4,271,R,Drama -Cats & Dogs,2001,87,60,5.4,6487,PG,Comedy -Commandments,1997,88,5,5.4,468,R,RomCom -"Core, The",2003,135,74,5.4,7860,PG-13,Action Drama -Coyote Ugly,2000,100,45,5.4,13221,R,RomCom -Daylight,1996,110,80,5.4,6979,PG-13,Action Drama -Dead Man on Campus,1998,96,14,5.4,2829,R,Comedy -Deep Rising,1998,97,45,5.4,4626,R,Action -Doctor Dolittle,1998,85,71.5,5.4,8287,PG-13,Comedy -Domestic Disturbance,2001,91,53,5.4,4445,PG-13,Drama -Drowning Mona,2000,95,16,5.4,3454,PG-13,Comedy -"End of Violence, The",1997,122,5,5.4,1575,R,Drama -Gun Shy,2000,101,10,5.4,1701,R,RomCom -Home on the Range,2004,76,110,5.4,1510,PG,Animated -Idle Hands,1999,92,20,5.4,5892,R,Comedy -Jeepers Creepers,2001,90,10,5.4,10973,R,Drama -Killing Me Softly,2002,104,25,5.4,1771,R,Drama -"League of Extraordinary Gentlemen, The",2003,110,78,5.4,15647,PG-13,Action -"Man Apart, A",2003,110,36,5.4,4231,R,Action Drama -Message in a Bottle,1999,126,30,5.4,5582,PG-13,Romance Drama -Mickey,2004,90,6,5.4,52,PG,Drama -New Jersey Drive,1995,98,5,5.4,348,R,Drama -Pearl Harbor,2001,184,135.25,5.4,33409,R,Action Drama -Practical Magic,1998,103,60,5.4,7786,PG-13,Romance Drama -Runaway Bride,1999,116,70,5.4,12624,PG,RomCom -Saving Silverman,2001,96,22,5.4,6684,R,RomCom -Skeletons in the Closet,2000,86,1.5,5.4,239,R,Drama -Sol Goode,2001,99,3,5.4,291,R,Comedy -Species,1995,108,35,5.4,8963,R,Action Drama -Stateside,2004,97,16,5.4,247,R,Drama -"Trigger Effect, The",1996,94,8,5.4,1591,R,Action Drama -Van Helsing,2004,132,160,5.4,19787,PG-13,Action -Waterworld,1995,176,175,5.4,19325,PG-13,Action Drama -Wind River,1998,97,5.5,5.4,97,PG-13,Drama -Without a Paddle,2004,95,19,5.4,3605,PG-13,Comedy -World Traveler,2001,103,2,5.4,350,R,Drama -Beautiful,2000,112,9,5.3,991,PG-13,Comedy Drama -"Blood, Guts, Bullets and Octane",1998,87,0.0073,5.3,285,R,Action Comedy -Cotton Mary,1999,124,3.5,5.3,164,R,Drama -Cradle 2 the Grave,2003,101,25,5.3,4164,R,Action -"Crew, The",2000,84,23,5.3,1297,PG-13,Comedy -"Crocodile Hunter: Collision Course, The",2002,90,13,5.3,1648,PG,Comedy -Deuces Wild,2002,100,10,5.3,1511,R,Action Drama -Double Tap,1997,87,8,5.3,184,R,Action -Drumline,2002,118,20,5.3,7368,PG-13,RomCom -End of Days,1999,121,83,5.3,18237,R,Action -Exit Wounds,2001,101,33,5.3,5370,R,Action -"Guy Thing, A",2003,101,20,5.3,2885,PG-13,RomCom -Hav Plenty,1997,84,0.65,5.3,256,R,Comedy -"Hollywood Sign, The",2001,90,12,5.3,196,R,Comedy -Hope Floats,1998,114,30,5.3,4382,PG-13,RomCom -I Spy,2002,97,70,5.3,5521,PG-13,Action Comedy -"Juror, The",1996,118,44,5.3,2920,R,Drama -Kimberly,1999,106,2,5.3,231,R,RomCom -"Last Time I Committed Suicide, The",1997,92,4,5.3,530,R,Drama -"Loss of Sexual Innocence, The",1999,106,4,5.3,977,R,Drama -Love Stinks,1999,94,4,5.3,1311,R,Comedy -Lover Girl,1997,87,1,5.3,102,R,Comedy Drama -Max Keeble's Big Move,2001,86,12,5.3,587,PG,Comedy -Original Gangstas,1996,99,4.8,5.3,216,R,Drama -Pavilion of Women,2001,111,5,5.3,209,R,Drama -Possums,1998,97,1.4,5.3,66,PG,Comedy Drama -"R.M., The",2003,101,0.5,5.3,213,PG,Comedy -Red Planet,2000,106,75,5.3,8623,PG-13,Action -Scary Movie 3,2003,84,45,5.3,9225,PG-13,Comedy -"Scorpion King, The",2002,92,60,5.3,10111,PG-13,Action -"Serpent's Kiss, The",1997,104,13,5.3,368,R,Drama -"Singing Detective, The",2003,109,10,5.3,1184,R,Comedy Drama -"Skulls, The",2000,106,15,5.3,6530,PG-13,Drama -Speedway Junky,1999,105,1,5.3,469,R,Drama -"Stepford Wives, The",2004,93,90,5.3,7773,PG-13,Comedy Drama -Sugar & Spice,2001,84,11,5.3,2901,PG-13,Comedy -Urban Ghost Story,1998,82,0.3,5.3,167,R,Drama -"Very Brady Sequel, A",1996,90,15,5.3,2183,PG-13,Comedy -Virtuosity,1995,106,30,5.3,4183,R,Action -Welcome to Mooseport,2004,117,26,5.3,2356,PG-13,Comedy -Woman on Top,2000,92,8,5.3,2094,R,RomCom -Black and White,1999,98,10,5.2,1699,R,Drama -Bride of Chucky,1998,89,25,5.2,4449,R,Comedy -Bride of the Wind,2001,99,12,5.2,201,R,Drama -Bulletproof Monk,2003,104,52,5.2,5405,PG-13,Action Comedy -"Climb, The",2002,98,2.5,5.2,83,PG,Action Drama -Club Dread,2004,119,9,5.2,3432,R,Comedy -Collateral Damage,2002,108,85,5.2,8590,R,Action -Committed,2000,98,3,5.2,739,R,Comedy Drama -Elvira's Haunted Hills,2001,90,1.5,5.2,307,PG-13,Comedy -Final,2001,111,0.08,5.2,330,R,Drama -Hardware,1990,93,1.5,5.2,1323,R,Action -Hide and Seek,2005,101,30,5.2,3784,R,Drama -Hollywood Homicide,2003,116,75,5.2,5312,PG-13,Action Comedy -I Dreamed of Africa,2000,114,34,5.2,1113,PG-13,Drama -Jack,1996,113,45,5.2,5256,PG-13,Comedy Drama -Jackpot,2001,97,0.4,5.2,213,R,Comedy Drama -Josie and the Pussycats,2001,98,22,5.2,4508,PG-13,Comedy -Lake Placid,1999,82,27,5.2,7836,R,Action Comedy -Lara Croft Tomb Raider: The Cradle of Life,2003,117,90,5.2,9103,PG-13,Action -Lara Croft: Tomb Raider,2001,100,80,5.2,21861,PG-13,Action -"Learning Curve, The",2001,113,1,5.2,177,R,Drama -"Love Letter, The",1999,88,15,5.2,1258,PG-13,Comedy Drama -Man of the House,2005,97,40,5.2,511,PG-13,Action Comedy -Metro,1997,117,55,5.2,3560,R,Action Comedy -"Mystic Masseur, The",2001,117,2.5,5.2,157,PG,Drama -"New Guy, The",2002,89,13,5.2,4266,PG-13,Comedy -Next Friday,2000,98,9.5,5.2,3457,R,Comedy -Not Another Teen Movie,2001,89,16,5.2,10295,R,Comedy -Out Cold,2001,92,11,5.2,1990,PG-13,Comedy -Soldier,1998,98,75,5.2,5590,R,Action -Space Jam,1996,87,80,5.2,7995,PG,Animated -Ted Bundy,2002,99,1.2,5.2,852,R,Drama -Volcano,1997,104,90,5.2,8627,PG-13,Action Drama -"Wedding Party, The",1969,92,0.043,5.2,94,R,Comedy -Whatever It Takes,2000,94,15,5.2,1771,PG-13,RomCom -2 Fast 2 Furious,2003,107,76,5.1,9556,PG-13,Action -Break Up,1998,100,9,5.1,393,R,Drama -Bubble Boy,2001,84,13,5.1,2904,PG-13,RomCom -Chain Reaction,1996,106,55,5.1,5936,PG-13,Action Drama -Country of My Skull,2004,104,12,5.1,194,R,Drama -Cutaway,2000,104,9,5.1,390,R,Action -Cutthroat Island,1995,119,92,5.1,3942,PG-13,Action -Delivered,1998,93,1,5.1,73,R,Comedy Drama -Dill Scallion,1999,91,0.5,5.1,136,PG-13,Comedy -Down to Earth,2001,87,30,5.1,3720,PG-13,RomCom -Dr. Dolittle 2,2001,87,72,5.1,4920,PG,Comedy -Drive Me Crazy,1999,91,8,5.1,2934,PG-13,RomCom -Heavy Metal 2000,2000,88,15,5.1,1148,R,Animated -Joe Dirt,2001,91,16,5.1,5514,PG-13,RomCom -Kung Pow: Enter the Fist,2002,82,10,5.1,5871,PG-13,Action Comedy -Loser,2000,92,20,5.1,5152,PG-13,RomCom -Money Train,1995,103,68,5.1,5081,R,Action Comedy -One Eyed King,2001,105,6.5,5.1,81,R,Drama -Play It to the Bone,1999,124,24,5.1,2645,R,Comedy Drama -Riders,2002,83,15,5.1,922,R,Action -Seed of Chucky,2004,87,12,5.1,1342,R,Comedy -Sgt. Bilko,1996,93,39,5.1,3712,PG,Comedy -Snow Dogs,2002,99,35,5.1,2379,PG,Comedy -Sorority Boys,2002,93,12,5.1,2398,R,Comedy -Tales from the Hood,1995,98,6,5.1,548,R,Action -Texas Rangers,2001,86,38,5.1,945,PG-13,Drama -Thir13en Ghosts,2001,87,20,5.1,8292,R,Comedy -"Tuxedo, The",2002,98,60,5.1,6070,PG-13,Action Comedy -Waiting to Exhale,1995,127,15,5.1,1611,R,Comedy Drama -All the Queen's Men,2001,105,25,5,353,PG-13,Action Comedy -"American Werewolf in Paris, An",1997,105,22,5,4302,R,RomCom -"Bachelor, The",1999,101,21,5,4183,PG-13,RomCom -Bogus,1996,110,32,5,1007,PG,Comedy Drama -Charlie,2004,94,5,5,141,R,Drama -Charlie's Angels: Full Throttle,2003,107,120,5,13990,PG-13,Action Comedy -Chill Factor,1999,101,34,5,2542,R,Action Comedy -Daddy and Them,2001,101,4,5,364,R,Comedy Drama -"Day Without a Mexican, A",2004,100,1.5,5,561,R,Comedy Drama -"Different Loyalty, A",2004,96,13,5,135,R,Romance Drama -Dominion,1995,95,1.3,5,85,R,Drama -Exorcist: The Beginning,2004,114,30,5,4130,R,Action -"First Love, Last Rites",1997,94,0.3,5,147,R,Romance Drama -Full Frontal,2002,101,2,5,3056,R,RomCom -Girl 6,1996,108,12,5,1453,R,Comedy Drama -Gravesend,1997,85,0.065,5,111,R,Drama -"Haunted Mansion, The",2003,87,90,5,3341,PG,Comedy -How Stella Got Her Groove Back,1998,124,20,5,1475,R,Romance Drama -Joe's Apartment,1996,80,13,5,2169,PG-13,Comedy -"Last Resort, The",1997,86,5,5,62,PG-13,Action -"Lizzie McGuire Movie, The",2003,94,17,5,2541,PG,Comedy -Lucky Numbers,2000,105,65,5,2396,R,Comedy -Mortal Kombat,1995,101,20,5,8779,PG-13,Action -"Out-of-Towners, The",1999,90,40,5,2919,PG-13,Comedy -"Phantom, The",1996,100,45,5,3329,PG,Action -Search and Destroy,1995,90,4,5,402,R,Comedy Drama -See Spot Run,2001,94,16,5,1193,PG,Comedy -"Simple Wish, A",1997,89,28,5,423,PG,Comedy -Teaching Mrs. Tingle,1999,96,13,5,5244,PG-13,Comedy -"Wedding Date, The",2005,90,15,5,953,PG-13,RomCom -What's the Worst That Could Happen?,2001,97,45,5,2531,PG-13,Comedy -Ace Ventura: When Nature Calls,1995,90,30,4.9,15161,PG-13,Comedy -Boys and Girls,2000,94,16,4.9,3483,PG-13,RomCom -Cherry Falls,2000,92,14,4.9,2165,R,Comedy -"Cinderella Story, A",2004,95,20,4.9,2755,PG,RomCom -"Crow: Salvation, The",2000,102,25,4.9,1383,R,Action Drama -Eddie,1996,100,30,4.9,1348,PG-13,Comedy -Elektra,2005,96,43,4.9,5120,PG-13,Action -Enough,2002,115,38,4.9,4339,PG-13,Drama -Friday After Next,2002,85,20,4.9,1659,R,Comedy -Gloria,1999,108,30,4.9,1144,R,Drama -Harvard Man,2001,99,5.5,4.9,1157,R,Romance Drama -Head Over Heels,2001,86,14,4.9,2632,PG-13,RomCom -Holy Man,1998,114,60,4.9,3497,PG,Comedy Drama -Home Fries,1998,91,15,4.9,2374,PG-13,RomCom -How High,2001,95,12,4.9,2916,R,Comedy -Like Mike,2002,99,30,4.9,1484,PG,Comedy -Little Nicky,2000,90,80,4.9,9485,PG-13,RomCom -Malibu's Most Wanted,2003,86,16,4.9,2099,PG-13,Comedy -"Pacifier, The",2005,95,56,4.9,2179,PG,Action Comedy -"Red Baron, The",1971,97,0.9,4.9,120,PG-13,Action Drama -"Shrink Is In, The",2001,87,6,4.9,319,R,RomCom -Soho Square,2000,79,0.007,4.9,45,R,Drama -Under Siege 2: Dark Territory,1995,99,60,4.9,5551,R,Action Drama -"Wedding Planner, The",2001,103,35,4.9,7393,PG-13,RomCom -'Til There Was You,1997,113,23,4.8,799,PG-13,RomCom -"Animal, The",2001,84,22,4.8,5605,R,Comedy -Ciao America,2002,100,5,4.8,27,R,RomCom -Company Man,2000,86,16,4.8,492,PG-13,Comedy -Double Take,2001,91,24,4.8,1503,PG-13,Action Comedy -Dr T and the Women,2000,122,12,4.8,4776,R,RomCom -Escape from L.A.,1996,101,50,4.8,7955,R,Action -Facade,2000,93,6,4.8,93,R,Action -Garfield,2004,80,50,4.8,4775,PG,Animated -Going Greek,2001,90,0.198,4.8,261,R,Comedy -Here on Earth,2000,93,15,4.8,2187,PG-13,Romance Drama -Hey Arnold! The Movie,2002,76,10,4.8,425,PG,Animated -In the Shadows,2001,105,10,4.8,268,R,Drama -Isn't She Great,2000,95,36,4.8,688,R,RomCom -Jade,1995,107,50,4.8,2380,R,Action Drama -On the Border,1998,103,3,4.8,165,R,Drama -Random Hearts,1999,133,64,4.8,5919,R,Romance Drama -Rugrats Go Wild!,2003,81,25,4.8,423,PG,Animated -Scooby-Doo,2002,86,84,4.8,9618,PG,Comedy -Screwed,2000,78,10,4.8,1592,PG-13,Comedy -Solitaire for 2,1995,106,1.5,4.8,122,R,RomCom -Spanish Judges,1999,98,3.5,4.8,178,R,Drama -Trois 3: The Escort,2004,95,1,4.8,38,R,Drama -Unstoppable,2004,96,15,4.8,579,R,Action Comedy -"Whole Ten Yards, The",2004,98,40,4.8,4133,PG-13,Comedy -Abandon,2002,99,25,4.7,2364,PG-13,Drama -Air Bud,1997,98,3,4.7,1276,PG,Comedy Drama -Autumn in New York,2000,103,40,4.7,3731,PG-13,Romance Drama -"Big Bounce, The",2004,88,50,4.7,2505,PG-13,Comedy -Big Momma's House,2000,98,30,4.7,7509,PG-13,Comedy -"Breed, The",2001,91,4,4.7,582,R,Action -Crocodile Dundee in Los Angeles,2001,92,25,4.7,2698,PG,Comedy Drama -D-Tox,2002,92,55,4.7,2742,R,Drama -Down to You,2000,91,9,4.7,3232,PG-13,RomCom -Fathers' Day,1997,98,85,4.7,2714,PG-13,Comedy -Free Money,1998,91,30,4.7,619,R,Comedy -Get Carter,2000,104,40,4.7,4927,R,Action Drama -Good Boy!,2003,88,18,4.7,683,PG,Comedy Drama -"Greenskeeper, The",2002,90,0.08,4.7,38,R,Comedy -Jingle All the Way,1996,88,60,4.7,6246,PG,Action Comedy -Little Black Book,2004,111,35,4.7,1894,PG-13,RomCom -Lost in Space,1998,130,80,4.7,15209,PG-13,Action -Monkeybone,2001,92,75,4.7,3112,PG-13,Animated -Monsoon Wife,2004,92,1,4.7,15,R,Drama -"Next Best Thing, The",2000,108,25,4.7,3131,PG-13,Comedy Drama -Out-of-Sync,1995,105,1.5,4.7,37,R,Drama -P.S. Your Cat Is Dead,2002,88,2,4.7,185,R,Comedy -Raising the Stakes,1999,88,0.1,4.7,24,R,Romance Drama -Silent Trigger,1996,90,15,4.7,432,R,Action Drama -Simply Irresistible,1999,94,6,4.7,3083,PG-13,RomCom -Slackers,2002,86,11,4.7,2755,R,Comedy -Slap Her... She's French,2002,92,10,4.7,811,PG-13,Comedy -Spy Kids 3-D: Game Over,2003,84,39,4.7,2597,PG,Action Comedy -Stealing Harvard,2002,82,25,4.7,2547,PG-13,Comedy Drama -"Sweetest Thing, The",2002,90,43,4.7,8284,R,RomCom -Tomcats,2001,95,11,4.7,3717,R,Comedy -"Velocity of Gary, The",1998,100,4,4.7,570,R,RomCom -"Wild Angels, The",1966,93,0.36,4.7,212,R,Action Drama -"Wild Thornberrys Movie, The",2002,85,35,4.7,4008,PG,Animated -Charlotte Sometimes,2002,85,0.08,4.6,555,R,Drama -Corky Romano,2001,86,11,4.6,2463,PG-13,Comedy -"Dude, Where's My Car?",2000,83,13,4.6,13330,PG-13,Comedy -"Eighteenth Angel, The",1998,95,25,4.6,557,R,Action -Frankenfish,2004,84,3,4.6,309,R,Action Comedy -Freeway II: Confessions of a Trickbaby,1999,90,2,4.6,666,R,Drama -Ghosts of Mars,2001,98,28,4.6,6368,R,Action -Held Up,1999,89,8,4.6,555,PG-13,Comedy -Hometown Legend,2002,108,2,4.6,186,PG,Drama -"Jimmy Show, The",2001,99,1,4.6,145,R,Comedy Drama -Judge Dredd,1995,96,90,4.6,9979,R,Action -Judgment,2001,105,11,4.6,106,PG-13,Drama -"Lot Like Love, A",2005,107,30,4.6,786,PG-13,RomCom -Maid in Manhattan,2002,105,55,4.6,12237,PG-13,RomCom -Men of War,1994,99,12,4.6,397,R,Action Drama -Mercy Streets,2000,106,0.6,4.6,149,PG-13,Action Drama -"Peacekeeper, The",1997,98,10,4.6,505,R,Action -"Point Men, The",2001,88,6.1,4.6,266,R,Action -Resurrection Man,1998,102,4,4.6,214,R,Drama -Say It Isn't So,2001,93,25,4.6,3144,R,RomCom -Serving Sara,2002,99,29,4.6,2990,PG-13,RomCom -Snow Day,2000,89,13,4.6,1645,PG,RomCom -Spawn,1997,98,40,4.6,7523,PG-13,Action -Starkweather,2004,92,1,4.6,89,R,Drama -Steal Big Steal Little,1995,135,35,4.6,263,PG-13,Comedy -Tank Girl,1995,104,25,4.6,4400,R,Action Comedy -Tart,2001,94,3.3,4.6,714,R,Drama -Belly,1998,96,10,4.5,1034,R,Drama -Blues Brothers 2000,1998,123,28,4.5,5267,PG-13,Comedy -Boat Trip,2002,97,20,4.5,2991,R,Comedy -Carpool,1996,89,17,4.5,829,PG,Comedy -Catch That Kid,2004,91,18,4.5,598,PG,Action Comedy -Christmas with the Kranks,2004,98,60,4.5,1520,PG,Comedy -Coronado,2003,88,4.7,4.5,411,PG-13,Action Comedy -Fire Over Afghanistan,2003,92,0.155,4.5,67,R,Action Drama -Jack Frost,1998,101,50,4.5,2130,PG,Comedy Drama -Legionnaire,1998,98,35,4.5,1773,R,Action -"Medallion, The",2003,88,41,4.5,2765,PG-13,Action Comedy -My Favorite Martian,1999,93,60,4.5,1942,PG,Comedy -Nutty Professor II: The Klumps,2000,109,84,4.5,5825,PG-13,Comedy -"Packing Suburbia, A",1999,90,0.04,4.5,38,R,Drama -Revelation,1999,98,5,4.5,203,PG-13,Action Drama -Shadow Conspiracy,1997,103,45,4.5,1078,R,Action -"Smile Like Yours, A",1997,98,18,4.5,348,R,RomCom -Space Truckers,1996,95,25,4.5,1460,PG-13,Comedy -Spy Hard,1996,81,18,4.5,4686,PG-13,Action Comedy -Summer Catch,2001,105,17,4.5,2581,PG-13,RomCom -Superstar,1999,81,14,4.5,2880,PG-13,Comedy -Swimfan,2002,85,8.5,4.5,3863,PG-13,Drama -Time Changer,2002,95,0.825,4.5,304,PG,Drama -"Touch, The",2002,103,20,4.5,417,PG-13,Action -Town & Country,2001,104,90,4.5,1434,R,Comedy -Bad Moon,1996,80,7,4.4,519,R,Action -Confessions of a Teenage Drama Queen,2004,89,15,4.4,2205,PG,Comedy -Congo,1995,109,50,4.4,8058,PG-13,Action -Driven,2001,116,72,4.4,7129,PG-13,Action Drama -Firestorm,1998,89,19,4.4,987,R,Action -Hanging Up,2000,94,40,4.4,3129,PG-13,Comedy Drama -Hidden Assassin,1995,89,11,4.4,245,R,Action Drama -Highlander: Endgame,2000,101,15,4.4,3773,R,Action -"Legally Blonde 2: Red, White & Blonde",2003,95,45,4.4,6293,PG-13,Comedy -"Musketeer, The",2001,104,40,4.4,3966,PG-13,Action Drama -No Code of Conduct,1998,95,12,4.4,314,R,Action Drama -Pep Squad,1998,94,0.5,4.4,120,R,Comedy -"Scarlet Letter, The",1995,135,50,4.4,2426,R,Romance Drama -"Thin Line Between Love and Hate, A",1996,108,8,4.4,458,R,RomCom -Thunderbirds,2004,95,57,4.4,1419,PG,Action Comedy -Vampire in Brooklyn,1995,100,14,4.4,2716,R,RomCom -Whipped,2000,82,3,4.4,1562,R,RomCom -"Adventures of Rocky & Bullwinkle, The",2000,88,76,4.3,4815,PG,Animated -Dead Babies,2000,100,1,4.3,172,R,Comedy -"Dead Hate the Living!, The",2000,90,0.15,4.3,496,R,Comedy -Envy,2004,99,40,4.3,3417,PG-13,Comedy -Freddy's Dead: The Final Nightmare,1991,93,5,4.3,3618,R,Comedy -Raise Your Voice,2004,103,15,4.3,1626,PG,Romance Drama -Rock 'n' Roll Frankenstein,1999,88,0.25,4.3,66,R,Comedy -Sons of Provo,2004,93,0.2,4.3,35,PG,Comedy -Yo puta,2004,76,6,4.3,151,R,Drama -Belly of the Beast,2003,91,18,4.2,638,R,Action -Big Bully,1996,90,15,4.2,781,PG,Comedy Drama -Breakfast of Champions,1999,110,12,4.2,2250,R,Comedy -Brooklyn Bound,2004,90,0.07,4.2,30,R,Drama -Claustrophobia,2003,79,0.114,4.2,90,R,Comedy -Decoys,2004,95,5,4.2,580,R,Comedy -Dr. Jekyll and Ms. Hyde,1995,90,8,4.2,573,PG-13,Comedy -"Era of Vampire, The",2002,90,1,4.2,329,R,Action -Fortress 2,1999,92,11,4.2,1027,R,Action -"Granny, The",1995,85,1,4.2,142,R,Comedy -Hairshirt,1998,89,0.065,4.2,242,R,RomCom -Hidden Agenda,2001,98,5,4.2,266,R,Action -Ice Cream Man,1995,84,2,4.2,349,R,Comedy -Kicked in the Head,1997,87,4,4.2,271,R,Comedy Drama -Perfect Target,1997,89,3.5,4.2,55,R,Action -Scary Movie 2,2001,83,45,4.2,12035,R,Comedy -Absolon,2003,96,8,4.1,548,R,Action -Black Knight,2001,95,50,4.1,3822,PG-13,Comedy -Boogeyman,2005,89,20,4.1,2055,PG-13,Drama -Civil Brand,2002,95,0.5,4.1,102,R,Drama -"Demolitionist, The",1995,100,1,4.1,238,R,Action -Detention,2003,98,10,4.1,223,R,Action Drama -Full Clip,2004,95,0.5,4.1,72,R,Action -My Boss's Daughter,2003,90,14,4.1,2765,R,RomCom -On the Line,2001,85,10,4.1,1013,PG,RomCom -Pootie Tang,2001,70,3,4.1,1921,PG-13,Action Comedy -Savage,1995,99,5,4.1,93,R,Action -Sleepover,2004,89,10,4.1,733,PG,Comedy -Breathing Room,1996,90,0.5,4,39,R,RomCom -Chopin. Pragnienie milosci,2002,134,3.5,4,55,R,Romance Drama -Dungeons & Dragons,2000,107,35,4,7435,PG-13,Action -Extreme Ops,2002,94,40,4,1337,PG-13,Action -Good Burger,1997,103,9,4,1714,PG,Comedy -"In Crowd, The",2000,104,15,4,1342,PG-13,Drama -Inspector Gadget,1999,78,75,4,5288,PG,Action Comedy -Into the Sun,2005,97,16,4,481,R,Action -"Lengua asesina, La",1996,98,4,4,244,R,Comedy -Route 666,2001,86,2.3,4,487,R,Action -Soul Assassin,2001,96,7,4,376,R,Action -Wild Wild West,1999,107,170,4,19078,PG-13,Action Comedy -"Adventures of Pluto Nash, The",2002,95,100,3.9,2543,PG-13,Action Comedy -Diary of a Mad Black Woman,2005,116,5.5,3.9,837,PG-13,Comedy Drama -Fair Game,1995,91,50,3.9,2579,R,Action Comedy -Half Past Dead,2002,98,30,3.9,2099,PG-13,Action -Honey,2003,94,17,3.9,3067,PG-13,Romance Drama -Juwanna Mann,2002,91,15.6,3.9,885,PG-13,Comedy -Kangaroo Jack,2003,89,60,3.9,3661,PG,Comedy -My Life's in Turnaround,1993,84,0.022,3.9,196,R,Comedy -Sweepers,1999,93,12.5,3.9,276,R,Action -xXx: State of the Union,2005,101,87,3.9,1584,PG-13,Action -Agent Cody Banks 2: Destination London,2004,100,26,3.8,919,PG,Action Comedy -Claudine's Return,1998,91,2,3.8,80,R,Romance Drama -"Crow: City of Angels, The",1996,84,13,3.8,3656,R,Action -Evil Alien Conquerors,2002,89,0.5,3.8,111,PG-13,Comedy -"Fantasma dell'opera, Il",1998,106,10,3.8,910,R,Romance Drama -Gone Fishin',1997,94,53,3.8,1884,PG,Comedy -Knock Off,1998,91,35,3.8,1947,R,Action -Man-Thing,2005,96,30,3.8,163,R,Action -"Pest, The",1997,84,17,3.8,1405,PG-13,Comedy -Skin Deep,2003,89,0.4,3.8,31,R,Action Comedy -Striptease,1996,117,50,3.8,7998,R,Comedy Drama -Swept Away,2002,89,10,3.8,2113,R,RomCom -"Untold, The",2002,92,3,3.8,400,R,Action -"Wild Ride, The",1960,88,0.03,3.8,56,PG-13,Drama -Beowulf,1999,99,20,3.7,2058,R,Action -Bridge of Dragons,1999,95,4,3.7,373,R,Action -"Flintstones in Viva Rock Vegas, The",2000,90,58,3.7,1712,PG,Comedy -Highlander III: The Sorcerer,1994,102,26,3.7,3388,PG-13,Action -McHale's Navy,1997,108,42,3.7,1758,PG,Comedy -Out of Reach,2004,88,20,3.7,399,R,Action Drama -Wing Commander,1999,96,30,3.7,4854,PG-13,Action -Batman & Robin,1997,125,110,3.6,28457,PG-13,Action -Dudley Do-Right,1999,77,22,3.6,1790,PG,Comedy -Johnson Family Vacation,2004,97,12,3.6,955,PG-13,Comedy -Tarzan and the Lost City,1998,83,20,3.6,510,PG,Action -Warriors of Virtue,1997,101,35,3.6,389,PG,Action -Are We There Yet?,2005,95,32,3.5,1043,PG,Comedy -Diplomatic Siege,1999,96,45,3.5,340,R,Action -Down Time,2001,90,0.02,3.5,55,R,Drama -Dusting Cliff 7,1996,95,1.3,3.5,80,R,Action Drama -Freddy Got Fingered,2001,87,15,3.5,9115,R,Comedy -Rancid Aluminium,2000,88,12,3.5,352,R,Drama -Woo,1998,84,13,3.5,407,R,RomCom -"Avengers, The",1998,89,60,3.4,11499,PG-13,Action -Ballistic: Ecks vs. Sever,2002,91,70,3.4,4556,R,Action -Catwoman,2004,104,85,3.4,8815,PG-13,Action -Derailed,2002,89,18,3.4,1075,R,Action -Digimon: The Movie,2000,82,5,3.4,455,PG,Animated -Highlander II: The Quickening,1991,92,30,3.4,9264,R,Action -Legion of the Dead,2001,92,2.7,3.4,374,R,Comedy -Meet the Deedles,1998,93,24,3.4,443,PG,Comedy -Dumb and Dumberer: When Harry Met Lloyd,2003,85,19,3.3,4689,PG-13,Comedy -Fascination,2004,95,5,3.3,124,R,Romance Drama -Speed 2: Cruise Control,1997,121,110,3.3,13268,PG-13,Action -"Alan Smithee Film: Burn Hollywood Burn, An",1997,86,10,3.2,1262,R,Comedy -"Cat in the Hat, The",2003,82,109,3.2,4997,PG,Comedy -I Got the Hook Up,1998,93,3.5,3.2,412,R,Comedy -"Minion, The",1998,95,12,3.2,338,R,Action -Soul Plane,2004,92,16,3.2,2361,R,Comedy -Torque,2004,81,40,3.2,4050,PG-13,Action -Crossroads,2002,93,12,3.1,8546,PG-13,RomCom -"Foreigner, The",2003,96,20,3.1,904,R,Action -"Hillz, The",2004,91,0.1,3.1,80,R,Comedy Drama -Air Marshal,2003,90,0.5,3,81,R,Action -Day of Defense,2003,102,0.5,3,8,PG,Drama -Mortal Kombat: Annihilation,1997,91,30,3,5799,PG-13,Action -Out for a Kill,2003,88,20,3,818,R,Action -Spice World,1997,93,25,3,7710,PG,Comedy -Bug Buster,1998,93,8.5,2.9,268,PG-13,Action Comedy -"Last Patrol, The",2000,95,8.2,2.9,236,PG-13,Action Drama -"Master of Disguise, The",2002,80,16,2.9,3903,PG,Comedy -Frostbite,2005,83,2.4,2.8,201,R,Comedy -Killers,1997,86,0.1,2.8,127,R,Action -Marci X,2003,80,20,2.8,741,R,Comedy -November,2004,73,0.3,2.8,164,R,Drama -Rollerball,2002,97,70,2.8,5328,R,Action -Luminarias,2000,100,1,2.7,381,R,RomCom -One Hell of a Christmas,2002,94,0.4,2.7,70,R,Comedy -"Room, The",2003,99,6,2.7,81,R,RomCom -Chairman of the Board,1998,95,10,2.6,666,PG-13,Comedy -Steel,1997,97,16,2.6,1607,PG-13,Action -2001: A Space Travesty,2000,99,26,2.5,2023,R,Comedy -Baby Geniuses,1999,97,13,2.4,3142,PG,Comedy -Battlefield Earth: A Saga of the Year 3000,2000,119,73,2.4,14970,PG-13,Action -Rachel's Attic,2002,112,0.083,2.4,58,R,Action Drama -"Vault, The",2005,87,0.1,2.4,64,PG-13,Action -Gigli,2003,121,54,2.3,11285,R,RomCom -"Helix... Loaded, The",2005,97,1,2.3,33,R,Action Comedy -House of the Dead,2003,90,7,2.3,3921,R,Action -Theodore Rex,1995,92,33,2.2,567,PG,Comedy -Alone in the Dark,2005,96,20,2.1,2880,R,Action -Glitter,2001,104,22,2.1,5209,PG-13,Romance Drama -Son of the Mask,2005,94,74,1.9,1785,PG,Action Comedy -You Got Served,2004,95,8,1.9,6041,PG-13,Drama -From Justin to Kelly,2003,90,12,1.7,6517,PG,RomCom diff --git a/data-raw/movies_wide.csv b/data-raw/movies_wide.csv deleted file mode 100644 index e44a881..0000000 --- a/data-raw/movies_wide.csv +++ /dev/null @@ -1,1580 +0,0 @@ -title,year,length,budget,rating,votes,mpaa,Action,Animation,Comedy,Drama,Romance,NumGenre -'Til There Was You,1997,113,23,4.8,799,PG-13,0,0,1,0,1,2 -10 Things I Hate About You,1999,97,16,6.7,19095,PG-13,0,0,1,0,1,2 -100 Mile Rule,2002,98,1.1,5.6,181,R,0,0,1,0,0,1 -13 Going On 30,2004,98,37,6.4,7859,PG-13,0,0,1,1,1,3 -"13th Warrior, The",1999,102,85,6.1,14344,R,1,0,0,0,0,1 -15 Minutes,2001,120,42,6.1,10866,R,0,0,0,1,0,1 -1776,1972,180,4,7.3,1754,PG,0,0,0,1,0,1 -2 Fast 2 Furious,2003,107,76,5.1,9556,PG-13,1,0,0,0,0,1 -200 Cigarettes,1999,101,6,5.4,4514,R,0,0,1,1,0,2 -2001: A Space Travesty,2000,99,26,2.5,2023,R,0,0,1,0,0,1 -2046,2004,129,12,7.6,2663,R,0,0,0,1,1,2 -21 Grams,2003,124,20,8,21857,R,0,0,0,1,0,1 -"24 Hour Woman, The",1999,93,2.5,5.6,149,R,0,0,1,0,0,1 -25th Hour,2002,135,15,7.8,15788,R,0,0,0,1,0,1 -28 Days,2000,103,43,6,7465,PG-13,0,0,0,1,0,1 -3000 Miles to Graceland,2001,125,62,5.4,7298,R,1,0,1,0,0,2 -40 Days and 40 Nights,2002,96,17,5.4,8609,R,0,0,1,1,1,3 -50 First Dates,2004,99,75,6.8,13497,PG-13,0,0,1,0,1,2 -"51st State, The",2001,92,28,6.1,6752,R,1,0,1,0,0,2 -54,1998,100,13,5.4,6905,R,0,0,0,1,0,1 -"6th Day, The",2000,123,82,5.9,12064,PG-13,1,0,0,0,0,1 -8 Mile,2002,110,41,6.8,17900,R,0,0,0,1,0,1 -AVP: Alien Vs. Predator,2004,102,45,5.4,14651,PG-13,1,0,0,0,0,1 -Abandon,2002,99,25,4.7,2364,PG-13,0,0,0,1,0,1 -About Schmidt,2002,125,30,7.3,23279,R,0,0,1,1,0,2 -About a Boy,2002,101,27,7.5,18318,PG-13,0,0,1,1,0,2 -Absolon,2003,96,8,4.1,548,R,1,0,0,0,0,1 -Absolute Power,1997,121,50,6.4,7995,R,0,0,0,1,0,1 -"Abyss, The",1989,171,69.5,7.4,21987,PG-13,1,0,0,1,0,2 -Ace Ventura: Pet Detective,1994,86,12,6.2,20705,PG-13,0,0,1,0,0,1 -Ace Ventura: When Nature Calls,1995,90,30,4.9,15161,PG-13,0,0,1,0,0,1 -Adaptation.,2002,114,19,7.9,25140,R,0,0,1,1,0,2 -"Adventures of Pluto Nash, The",2002,95,100,3.9,2543,PG-13,1,0,1,0,0,2 -"Adventures of Robin Hood, The",1938,102,1.9,8.2,7359,PG,1,0,0,0,1,2 -"Adventures of Rocky & Bullwinkle, The",2000,88,76,4.3,4815,PG,0,1,1,0,0,2 -Affliction,1997,114,6,6.9,3679,R,0,0,0,1,0,1 -After the Sunset,2004,97,58,6,3431,PG-13,1,0,1,0,0,2 -Agent Cody Banks,2003,102,26,5.5,2655,PG,1,0,1,0,0,2 -Agent Cody Banks 2: Destination London,2004,100,26,3.8,919,PG,1,0,1,0,0,2 -Air Bud,1997,98,3,4.7,1276,PG,0,0,1,1,0,2 -Air Force One,1997,124,85,6.3,26156,R,1,0,0,1,0,2 -Air Marshal,2003,90,0.5,3,81,R,1,0,0,0,0,1 -"Alamo, The",2004,137,95,5.9,3060,PG-13,1,0,0,1,0,2 -"Alan Smithee Film: Burn Hollywood Burn, An",1997,86,10,3.2,1262,R,0,0,1,0,0,1 -Albino Alligator,1996,97,5,6,2077,R,0,0,0,1,0,1 -Alexander,2004,175,150,5.5,11254,R,0,0,0,1,0,1 -Alferd Packer: The Musical,1996,97,0.125,7,2298,R,0,0,1,0,1,2 -Alfie,2004,103,60,6,3492,R,0,0,1,1,0,2 -Ali,2001,165,107,6.4,9294,R,0,0,0,1,0,1 -Alien: Resurrection,1997,116,70,6,24358,R,1,0,0,0,0,1 -Aliens,1986,154,18.5,8.3,63961,R,1,0,0,0,0,1 -All About the Benjamins,2002,95,14,5.4,1250,R,1,0,1,0,0,2 -All the Pretty Horses,2000,116,45,5.6,3133,PG-13,0,0,0,1,0,1 -All the Queen's Men,2001,105,25,5,353,PG-13,1,0,1,1,0,3 -All the Real Girls,2003,108,1,6.8,1745,R,0,0,0,1,1,2 -Almost Famous,2000,162,60,8,38648,R,0,0,1,1,0,2 -Alone in the Dark,2005,96,20,2.1,2880,R,1,0,0,0,0,1 -Along Came Polly,2004,90,42,5.8,9785,PG-13,0,0,1,0,1,2 -Along Came a Spider,2001,104,28,6.1,9456,R,0,0,0,1,0,1 -Amadeus,1984,180,18,8.3,36955,R,0,0,0,1,0,1 -America's Sweethearts,2001,102,48,5.8,11849,PG-13,0,0,1,0,1,2 -American Beauty,1999,121,15,8.5,109991,R,0,0,0,1,0,1 -American History X,1998,119,10,8.4,59677,R,0,0,0,1,0,1 -American Outlaws,2001,94,35,5.5,2878,PG-13,1,0,1,0,0,2 -American Pie,1999,95,11,6.8,41126,R,0,0,1,0,0,1 -American Pie 2,2001,105,30,6.3,22752,R,0,0,1,0,0,1 -"American President, The",1995,114,62,6.9,11834,PG-13,0,0,1,1,1,3 -American Psycho,2000,102,8,6.8,21639,R,0,0,0,1,0,1 -American Wedding,2003,103,55,6.3,13590,R,0,0,1,0,0,1 -"American Werewolf in Paris, An",1997,105,22,5,4302,R,0,0,1,0,1,2 -Amistad,1997,152,40,7,10543,R,0,0,0,1,0,1 -Amores perros,2000,153,2,8.2,15079,R,0,0,0,1,0,1 -Analyze This,1999,109,30,6.6,24521,R,0,0,1,0,0,1 -Anchorman: The Legend of Ron Burgundy,2004,104,26,6.5,11553,PG-13,0,0,1,0,0,1 -Angel Eyes,2001,102,38,5.6,4829,R,0,0,0,1,1,2 -Anger Management,2003,106,75,6,14280,PG-13,0,0,1,0,0,1 -"Animal, The",2001,84,22,4.8,5605,R,0,0,1,0,0,1 -Anna and the King,1999,148,75,6.6,6739,PG-13,0,0,0,1,1,2 -Antitrust,2001,108,30,6,7326,PG-13,0,0,0,1,0,1 -Antwone Fisher,2002,117,12.5,7.4,4472,PG-13,0,0,0,1,0,1 -Antz,1998,83,60,7,16312,PG,0,1,1,0,0,2 -Any Given Sunday,1999,156,62,6.4,19531,R,0,0,0,1,0,1 -Anything Else,2003,108,18,6.5,3678,R,0,0,1,0,1,2 -Anywhere But Here,1999,114,23,5.9,4007,PG-13,0,0,0,1,0,1 -Apocalypse Now,1979,202,31.5,8.5,64785,R,1,0,0,1,0,2 -Apollo 13,1995,140,62,7.5,41098,PG,0,0,0,1,0,1 -"Apostle, The",1997,134,5,7.2,4231,PG-13,0,0,0,1,0,1 -Apt Pupil,1998,112,14,6.4,6728,R,0,0,0,1,0,1 -Are We There Yet?,2005,95,32,3.5,1043,PG,0,0,1,0,0,1 -Arlington Road,1999,117,21.5,7.1,17189,R,0,0,0,1,0,1 -Armageddon,1998,153,140,5.7,45330,PG-13,1,0,0,0,0,1 -Army of Darkness,1993,96,11,7.4,22118,R,1,0,1,0,0,2 -Around the World in 80 Days,2004,120,110,5.7,3887,PG,1,0,1,0,1,3 -Artificial Intelligence: AI,2001,146,90,6.8,36623,PG-13,0,0,0,1,0,1 -As Good as It Gets,1997,139,50,7.7,47441,PG-13,0,0,1,1,1,3 -Assassins,1995,132,50,5.7,7354,R,1,0,0,0,0,1 -Assault on Precinct 13,2005,109,20,6.3,2960,R,1,0,0,1,0,2 -At First Sight,1999,128,40,5.7,3441,PG-13,0,0,0,1,0,1 -Atlantis: The Lost Empire,2001,95,90,6.4,6323,PG,1,1,0,0,0,2 -Austin Powers in Goldmember,2002,94,63,6.2,22870,PG-13,1,0,1,0,0,2 -Austin Powers: International Man of Mystery,1997,94,17,7,33755,PG-13,1,0,1,0,0,2 -Austin Powers: The Spy Who Shagged Me,1999,95,33,6.5,37019,PG-13,1,0,1,0,0,2 -Auto Focus,2002,105,7,6.7,3276,R,0,0,0,1,0,1 -Autumn in New York,2000,103,40,4.7,3731,PG-13,0,0,0,1,1,2 -Avalon,2001,106,8,6.8,2723,R,0,1,0,1,0,2 -"Avengers, The",1998,89,60,3.4,11499,PG-13,1,0,0,0,0,1 -"Aviator, The",2004,170,116,7.5,16217,PG-13,0,0,0,1,0,1 -"Awfully Big Adventure, An",1995,112,4,5.8,608,R,0,0,0,1,0,1 -Baby Boy,2001,130,16,6.2,1476,R,0,0,0,1,1,2 -Baby Geniuses,1999,97,13,2.4,3142,PG,0,0,1,0,0,1 -"Bachelor, The",1999,101,21,5,4183,PG-13,0,0,1,0,1,2 -Bad Boys,1995,118,23,6.4,15326,R,1,0,1,0,0,2 -Bad Boys II,2003,145,130,6.1,13087,R,1,0,1,0,0,2 -Bad Company,2002,116,70,5.4,6175,PG-13,1,0,1,0,0,2 -Bad Moon,1996,80,7,4.4,519,R,1,0,0,0,0,1 -Bad Santa,2003,98,18,7.2,11189,R,0,0,1,0,0,1 -"Badge, The",2002,103,6,6.3,740,R,1,0,0,1,0,2 -Bait,2000,119,35,5.6,1884,R,1,0,1,0,0,2 -"Ballad of Jack and Rose, The",2005,112,1.5,6.2,269,R,0,0,0,1,0,1 -Ballistic: Ecks vs. Sever,2002,91,70,3.4,4556,R,1,0,0,0,0,1 -Bamboozled,2000,135,10,6.3,2356,R,0,0,1,1,0,2 -Bananas,1971,82,2,7.1,4252,PG-13,0,0,1,0,0,1 -Bandits,2001,123,80,6.7,12382,PG-13,0,0,1,1,1,3 -"Banger Sisters, The",2002,98,10,5.6,3189,R,0,0,1,1,0,2 -Baptists at Our Barbecue,2004,92,0.5,5.9,62,PG,0,0,1,0,1,2 -Barbershop,2002,102,12,6.6,4943,PG-13,0,0,1,1,0,2 -Barbershop 2: Back in Business,2004,106,18,5.7,1580,PG-13,0,0,1,0,0,1 -Basic,2003,98,50,6.2,8370,R,0,0,0,1,0,1 -Basil,1998,113,10,6.1,367,R,0,0,0,1,1,2 -"Basket, The",1999,105,3,6.3,200,PG,0,0,0,1,0,1 -Batman & Robin,1997,125,110,3.6,28457,PG-13,1,0,0,0,0,1 -Batman Forever,1995,122,100,5.4,24025,PG-13,1,0,0,0,1,2 -"Battle of Shaker Heights, The",2003,90,1,6,854,PG-13,0,0,1,1,1,3 -Battlefield Earth: A Saga of the Year 3000,2000,119,73,2.4,14970,PG-13,1,0,0,0,0,1 -Be Cool,2005,118,53,5.5,4560,PG-13,0,0,1,0,0,1 -"Beach, The",2000,119,50,5.8,15020,R,0,0,0,1,0,1 -Bean,1997,90,22,5.4,9018,PG-13,0,0,1,0,0,1 -Beautiful,2000,112,9,5.3,991,PG-13,0,0,1,1,0,2 -"Beautiful Country, The",2004,137,6,6.9,115,R,0,0,0,1,0,1 -"Beautiful Mind, A",2001,135,60,7.8,43291,PG-13,0,0,0,1,0,1 -Beavis and Butt-Head Do America,1996,81,12,6.2,9491,PG-13,0,1,1,0,0,2 -Because of Winn-Dixie,2005,106,14,5.9,483,PG,0,0,1,1,0,2 -Bedazzled,2000,93,48,5.9,11439,PG-13,0,0,1,0,0,1 -Before Sunset,2004,80,10,8.3,8789,R,0,0,0,1,1,2 -Behind Enemy Lines,2001,106,40,6.1,10856,PG-13,1,0,0,1,0,2 -Being Julia,2004,104,18,7.2,1671,R,0,0,1,1,0,2 -Belly,1998,96,10,4.5,1034,R,0,0,0,1,0,1 -Belly of the Beast,2003,91,18,4.2,638,R,1,0,0,0,0,1 -Beloved,1998,172,53,5.6,1934,R,0,0,0,1,0,1 -Beowulf,1999,99,20,3.7,2058,R,1,0,0,0,0,1 -Best Laid Plans,1999,92,7,6.3,1795,R,0,0,0,1,0,1 -Best in Show,2000,90,6,7.5,11790,PG-13,0,0,1,0,0,1 -Better Luck Tomorrow,2002,98,0.25,7.3,2697,R,0,0,0,1,0,1 -Beyond Borders,2003,127,35,5.4,1905,R,0,0,0,1,1,2 -Beyond Rangoon,1995,100,23,6.4,1285,R,0,0,0,1,0,1 -Beyond Re-Animator,2003,96,3,6.1,908,R,0,0,1,0,0,1 -Beyond the Sea,2004,118,24,6.7,1051,PG-13,0,0,0,1,0,1 -Bicentennial Man,1999,132,100,6.2,8925,PG,0,0,0,1,1,2 -"Big Bounce, The",2004,88,50,4.7,2505,PG-13,0,0,1,0,0,1 -"Big Brass Ring, The",1999,104,7,5.4,271,R,0,0,0,1,0,1 -Big Bully,1996,90,15,4.2,781,PG,0,0,1,1,0,2 -Big Daddy,1999,93,34.2,5.9,18258,PG-13,0,0,1,0,0,1 -Big Fat Liar,2002,88,15,5.5,2453,PG,0,0,1,0,0,1 -Big Fish,2003,125,70,8.1,31525,PG-13,0,0,1,1,0,2 -"Big Hit, The",1998,91,13,5.7,6206,R,1,0,1,0,0,2 -"Big Lebowski, The",1998,117,15,8,50179,R,0,0,1,0,0,1 -Big Momma's House,2000,98,30,4.7,7509,PG-13,0,0,1,0,0,1 -"Big Tease, The",1999,86,4,6.1,670,R,0,0,1,0,0,1 -Big Trouble,2002,85,40,6.4,4088,PG-13,0,0,1,0,0,1 -Bigger Than the Sky,2005,106,0.75,7.3,32,PG-13,0,0,1,1,1,3 -Billy Elliot,2000,110,5,7.7,16725,R,0,0,0,1,0,1 -Birth,2004,100,20,6,2600,R,0,0,0,1,1,2 -Birthday Girl,2001,93,13,6.1,5340,R,0,0,1,1,1,3 -Black Hawk Down,2001,142,90,7.6,32530,R,1,0,0,1,0,2 -Black Knight,2001,95,50,4.1,3822,PG-13,0,0,1,0,0,1 -Black and White,1999,98,10,5.2,1699,R,0,0,0,1,0,1 -Blade,1998,110,45,6.8,24372,R,1,0,0,0,0,1 -Blade II,2002,108,55,6.6,17139,R,1,0,0,0,0,1 -Blade: Trinity,2004,124,65,5.7,7439,R,1,0,0,0,0,1 -Blast from the Past,1999,112,35,6.4,9483,PG-13,0,0,1,1,1,3 -Blind Horizon,2003,99,5.1,5.5,801,R,0,0,0,1,0,1 -Blood Work,2002,110,50,6.3,5965,R,0,0,0,1,0,1 -Blood and Wine,1996,101,26,6,2134,R,0,0,0,1,0,1 -"Blood, Guts, Bullets and Octane",1998,87,0.0073,5.3,285,R,1,0,1,0,0,2 -Bloody Sunday,2002,107,5,7.6,2388,R,0,0,0,1,0,1 -Blow,2001,124,30,7.1,18670,R,0,0,0,1,0,1 -Blue Crush,2002,104,30,5.7,4791,PG-13,0,0,0,1,1,2 -Blue Hill Avenue,2001,120,1.2,6.6,85,R,0,0,0,1,0,1 -Blues Brothers 2000,1998,123,28,4.5,5267,PG-13,0,0,1,0,0,1 -Boat Trip,2002,97,20,4.5,2991,R,0,0,1,0,0,1 -Bogus,1996,110,32,5,1007,PG,0,0,1,1,0,2 -Boiler Room,2000,118,9,6.8,8586,R,0,0,0,1,0,1 -Bon voyage,2003,115,20,7.2,1061,PG-13,0,0,1,1,0,2 -"Bone Collector, The",1999,118,48,6.2,17766,R,0,0,0,1,0,1 -Boogeyman,2005,89,20,4.1,2055,PG-13,0,0,0,1,0,1 -Boogie Nights,1997,156,15,7.6,27380,R,0,0,0,1,0,1 -"Boot, Das",1981,216,14,8.5,28920,R,0,0,0,1,0,1 -"Borrowers, The",1997,89,29,5.6,1457,PG,0,0,1,0,0,1 -Bounce,2000,106,35,5.8,5390,PG-13,0,0,0,1,1,2 -Bound,1996,109,4.5,7.5,11911,R,0,0,0,0,1,1 -"Bourne Identity, The",2002,119,75,7.3,29871,PG-13,1,0,0,1,0,2 -"Bourne Supremacy, The",2004,108,75,7.3,19878,PG-13,1,0,0,1,0,2 -Bowfinger,1999,97,55,6.4,15000,PG-13,0,0,1,0,0,1 -Boys Don't Cry,1999,118,2,7.6,14456,R,0,0,0,1,0,1 -Boys and Girls,2000,94,16,4.9,3483,PG-13,0,0,1,1,1,3 -"Brady Bunch Movie, The",1995,90,12,5.6,4636,PG-13,0,0,1,0,0,1 -Braveheart,1995,177,53,8.3,92437,R,1,0,0,1,0,2 -"Bread, My Sweet, The",2001,105,0.6,6.8,257,PG-13,0,0,0,1,1,2 -Break Up,1998,100,9,5.1,393,R,0,0,0,1,0,1 -Breakdown,1997,95,36,6.7,7099,R,1,0,0,0,0,1 -Breakfast of Champions,1999,110,12,4.2,2250,R,0,0,1,0,0,1 -Breathing Room,1996,90,0.5,4,39,R,0,0,1,0,1,2 -"Breed, The",2001,91,4,4.7,582,R,1,0,0,0,0,1 -Bride & Prejudice,2004,122,7,6.3,1503,PG-13,0,0,1,0,1,2 -Bride of Chucky,1998,89,25,5.2,4449,R,0,0,1,0,0,1 -Bride of the Wind,2001,99,12,5.2,201,R,0,0,0,1,0,1 -Bridge of Dragons,1999,95,4,3.7,373,R,1,0,0,0,1,2 -"Bridges of Madison County, The",1995,135,22,6.9,7633,PG-13,0,0,0,1,1,2 -Bridget Jones's Diary,2001,97,26,7,24791,R,0,0,1,0,1,2 -Bridget Jones: The Edge of Reason,2004,108,70,5.7,6636,R,0,0,1,1,1,3 -Brigham City,2001,119,1,7.1,405,PG-13,0,0,0,1,0,1 -Bring It On,2000,98,10,6.1,11784,PG-13,0,0,1,0,0,1 -Bringing Down the House,2003,105,35,5.6,6501,PG-13,0,0,1,0,0,1 -Bringing Out the Dead,1999,121,32,6.7,13989,R,0,0,0,1,0,1 -Broken Arrow,1996,108,65,5.7,14415,R,1,0,0,0,0,1 -Broken Vessels,1998,90,0.6,6.1,223,R,0,0,0,1,0,1 -Brooklyn Bound,2004,90,0.07,4.2,30,R,0,0,0,1,0,1 -"Brother from Another Planet, The",1984,106,0.3,6.7,1133,R,0,0,1,1,0,2 -"Brothers McMullen, The",1995,98,0.0238,6.4,2325,R,0,0,1,1,0,2 -Brown Sugar,2002,109,8,5.9,941,PG-13,0,0,1,1,1,3 -Bruce Almighty,2003,101,81,6.4,23905,PG-13,0,0,1,0,1,2 -Bruno,2000,108,10,6,295,PG-13,0,0,1,1,0,2 -"Brylcreem Boys, The",1998,106,6,6,199,PG-13,0,0,0,1,1,2 -Bubba Ho-tep,2002,92,1,7.5,7142,R,0,0,1,0,0,1 -Bubble Boy,2001,84,13,5.1,2904,PG-13,0,0,1,1,1,3 -Buffalo '66,1998,110,1.5,7.2,6652,R,0,0,1,1,0,2 -Buffalo Soldiers,2001,98,15,7,3753,R,0,0,1,1,0,2 -Bug Buster,1998,93,8.5,2.9,268,PG-13,1,0,1,0,0,2 -Bulletproof Monk,2003,104,52,5.2,5405,PG-13,1,0,1,0,0,2 -But I'm a Cheerleader,1999,85,1.2,6.2,3897,R,0,0,1,1,1,3 -"Butterfly Effect, The",2004,120,13,7.6,22975,R,0,0,0,1,0,1 -C'era una volta il West,1968,158,5,8.7,17241,PG-13,0,0,0,1,0,1 -CQ,2001,91,7,6.4,1315,R,0,0,1,1,0,2 -"Cable Guy, The",1996,96,47,5.5,16266,PG-13,0,0,1,1,0,2 -Cafe Society,1995,104,3.5,5.7,137,R,0,0,0,1,0,1 -Can't Be Heaven,2000,94,2,5.7,104,PG,0,0,1,1,1,3 -Can't Hardly Wait,1998,101,10,6.2,8191,PG-13,0,0,1,0,1,2 -Cape Fear,1991,128,35,7.1,15585,R,0,0,0,1,0,1 -Captain Corelli's Mandolin,2001,131,57,5.9,5281,R,0,0,0,1,1,2 -Carandiru,2003,147,6,7.7,1608,R,0,0,0,1,0,1 -Carpool,1996,89,17,4.5,829,PG,0,0,1,0,0,1 -Casino,1995,176,52,7.8,27234,R,0,0,0,1,0,1 -Casper,1995,100,55,5.6,8798,PG,0,0,1,0,0,1 -Cast Away,2000,143,90,7.3,34580,PG-13,0,0,0,1,0,1 -"Cat in the Hat, The",2003,82,109,3.2,4997,PG,0,0,1,0,0,1 -Catch Me If You Can,2002,141,52,7.6,39915,PG-13,0,0,0,1,0,1 -Catch That Kid,2004,91,18,4.5,598,PG,1,0,1,0,0,2 -Cats & Dogs,2001,87,60,5.4,6487,PG,0,0,1,0,0,1 -Catwoman,2004,104,85,3.4,8815,PG-13,1,0,0,0,0,1 -Cecil B. DeMented,2000,87,10,6,3464,R,0,0,1,0,0,1 -Celebrity,1998,113,12,6.1,4820,R,0,0,1,0,0,1 -Cellular,2004,94,25,6.4,6182,PG-13,1,0,0,0,0,1 -Chain Reaction,1996,106,55,5.1,5936,PG-13,1,0,0,1,0,2 -Chain of Fools,2000,96,20,6.1,845,R,0,0,1,0,0,1 -Chairman of the Board,1998,95,10,2.6,666,PG-13,0,0,1,0,0,1 -"Chamber, The",1996,113,50,5.7,2540,R,0,0,0,1,0,1 -Changing Habits,1997,95,1.2,5.5,134,R,0,0,1,1,0,2 -Changing Lanes,2002,99,45,6.6,12779,R,0,0,0,1,0,1 -Charlie,2004,94,5,5,141,R,0,0,0,1,0,1 -Charlie's Angels,2000,94,92,5.8,25705,PG-13,1,0,1,0,0,2 -Charlie's Angels: Full Throttle,2003,107,120,5,13990,PG-13,1,0,1,0,0,2 -Charlotte Sometimes,2002,85,0.08,4.6,555,R,0,0,0,1,0,1 -Charly,2002,103,0.95,5.5,149,PG,0,0,1,1,1,3 -Chasing Amy,1997,111,0.25,7.6,32141,R,0,0,1,1,1,3 -Chasing Liberty,2004,111,23,5.7,1911,PG-13,0,0,1,0,1,2 -Cheaper by the Dozen,2003,98,40,5.8,5977,PG,0,0,1,1,0,2 -Cherish,2002,99,1.5,6.5,743,R,0,0,1,1,0,2 -Cherry Falls,2000,92,14,4.9,2165,R,0,0,1,0,0,1 -Chicago,2002,113,45,7.5,34933,PG-13,0,0,1,1,0,2 -Children On Their Birthdays,2002,102,10,6,163,PG,0,0,0,1,0,1 -Chill Factor,1999,101,34,5,2542,R,1,0,1,0,0,2 -Chopin. Pragnienie milosci,2002,134,3.5,4,55,R,0,0,0,1,1,2 -Christmas with the Kranks,2004,98,60,4.5,1520,PG,0,0,1,0,0,1 -"Chronicles of Riddick, The",2004,135,110,6.2,11438,PG-13,1,0,0,0,0,1 -Chuck&Buck,2000,96,0.25,6.6,1919,R,0,0,1,1,0,2 -Ciao America,2002,100,5,4.8,27,R,0,0,1,1,1,3 -Cidade de Deus,2002,135,3.3,8.7,25964,R,0,0,0,1,0,1 -"Cider House Rules, The",1999,126,24,7.5,18950,PG-13,0,0,0,1,1,2 -"Cinderella Story, A",2004,95,20,4.9,2755,PG,0,0,1,0,1,2 -City Hall,1996,111,40,6.1,4381,R,0,0,0,1,0,1 -City by the Sea,2002,108,60,6.3,4886,R,0,0,0,1,0,1 -City of Angels,1998,114,55,6.2,15333,PG-13,0,0,0,1,1,2 -"Civil Action, A",1998,112,60,6.4,6847,PG-13,0,0,0,1,0,1 -Civil Brand,2002,95,0.5,4.1,102,R,0,0,0,1,0,1 -Claudine's Return,1998,91,2,3.8,80,R,0,0,0,1,1,2 -Claustrophobia,2003,79,0.114,4.2,90,R,0,0,1,0,0,1 -Clay Pigeons,1998,104,8,6.4,2658,R,0,0,1,1,0,2 -Clerks.,1994,92,0.23,7.9,39927,R,0,0,1,1,0,2 -"Climb, The",2002,98,2.5,5.2,83,PG,1,0,0,1,0,2 -Clockers,1995,129,25,6.8,3099,R,0,0,0,1,0,1 -Club Dread,2004,119,9,5.2,3432,R,0,0,1,0,0,1 -Clueless,1995,97,20,6.7,16521,PG-13,0,0,1,0,1,2 -Coach Carter,2005,136,30,6.6,1636,PG-13,0,0,0,1,0,1 -Code 46,2003,92,7.5,6.4,2094,R,0,0,0,1,1,2 -Cold Mountain,2003,152,83,7.4,15712,R,0,0,0,1,1,2 -Collateral,2004,120,65,7.7,24499,R,0,0,0,1,0,1 -Collateral Damage,2002,108,85,5.2,8590,R,1,0,0,0,0,1 -Commandments,1997,88,5,5.4,468,R,0,0,1,1,1,3 -Committed,2000,98,3,5.2,739,R,0,0,1,1,0,2 -Company Man,2000,86,16,4.8,492,PG-13,0,0,1,0,0,1 -"Company, The",2003,112,15,6.2,1505,PG-13,0,0,0,1,0,1 -"Comunidad, La",2000,110,2,7.2,1270,R,0,0,1,0,0,1 -"Confession, The",1999,114,4,5.8,519,R,0,0,0,1,0,1 -Confessions of a Dangerous Mind,2002,113,29,7.1,11487,R,0,0,0,1,0,1 -Confessions of a Teenage Drama Queen,2004,89,15,4.4,2205,PG,0,0,1,0,0,1 -Confidence,2003,97,15,6.8,6168,R,0,0,0,1,0,1 -Congo,1995,109,50,4.4,8058,PG-13,1,0,0,0,0,1 -Conspiracy Theory,1997,135,75,6.4,15470,R,0,0,0,1,1,2 -Contact,1997,153,90,7.3,36390,PG,0,0,0,1,0,1 -"Contender, The",2000,126,9,6.9,7023,R,0,0,0,1,0,1 -Cop Land,1997,116,15,6.7,12677,R,0,0,0,1,0,1 -Copycat,1995,123,20,6.5,7804,R,0,0,0,1,0,1 -"Core, The",2003,135,74,5.4,7860,PG-13,1,0,0,1,0,2 -Corky Romano,2001,86,11,4.6,2463,PG-13,0,0,1,0,0,1 -Coronado,2003,88,4.7,4.5,411,PG-13,1,0,1,0,0,2 -Cotton Mary,1999,124,3.5,5.3,164,R,0,0,0,1,0,1 -"Count of Monte Cristo, The",2002,134,35,7.4,13907,PG-13,1,0,0,1,0,2 -Country of My Skull,2004,104,12,5.1,194,R,0,0,0,1,0,1 -Courage Under Fire,1996,117,46,6.7,8884,R,1,0,0,1,0,2 -Coyote Ugly,2000,100,45,5.4,13221,R,0,0,1,1,1,3 -Cradle 2 the Grave,2003,101,25,5.3,4164,R,1,0,0,0,0,1 -Cradle Will Rock,1999,132,32,6.7,3375,R,0,0,0,1,0,1 -"Craft, The",1996,101,15,5.9,9187,R,0,0,1,1,0,2 -Crash,2004,113,6.5,8.3,1660,R,0,0,0,1,0,1 -Crazy in Alabama,1999,111,15,6.1,2086,PG-13,0,0,1,1,0,2 -Crazy/Beautiful,2001,135,14,6.5,4503,PG-13,0,0,0,1,1,2 -"Crew, The",2000,84,23,5.3,1297,PG-13,0,0,1,0,0,1 -Crime Spree,2003,98,10,6.3,953,R,0,0,1,0,0,1 -"Crimen del padre Amaro, El",2002,118,1.8,7,2469,R,0,0,0,1,1,2 -Crimson Tide,1995,116,53,7.1,14033,R,1,0,0,1,0,2 -Critical Care,1997,107,12,5.8,397,R,0,0,1,1,0,2 -Crocodile Dundee in Los Angeles,2001,92,25,4.7,2698,PG,0,0,1,1,0,2 -"Crocodile Hunter: Collision Course, The",2002,90,13,5.3,1648,PG,0,0,1,0,0,1 -Crossroads,2002,93,12,3.1,8546,PG-13,0,0,1,1,1,3 -"Crow: City of Angels, The",1996,84,13,3.8,3656,R,1,0,0,0,0,1 -"Crow: Salvation, The",2000,102,25,4.9,1383,R,1,0,0,1,0,2 -Cruel Intentions,1999,97,11,6.5,25634,R,0,0,0,1,1,2 -Curdled,1996,88,2.309723,5.5,959,R,0,0,1,0,0,1 -"Curse of the Jade Scorpion, The",2001,103,26,6.8,5846,PG-13,0,0,1,1,0,2 -Cutaway,2000,104,9,5.1,390,R,1,0,0,0,0,1 -Cutthroat Island,1995,119,92,5.1,3942,PG-13,1,0,0,0,1,2 -Cypher,2002,95,7.5,7.2,3160,R,1,0,0,0,0,1 -D-Tox,2002,92,55,4.7,2742,R,0,0,0,1,0,1 -D.E.B.S.,2004,91,3.5,6,300,PG-13,1,0,1,0,0,2 -Daddy Day Care,2003,92,60,5.7,3803,PG,0,0,1,0,0,1 -Daddy and Them,2001,101,4,5,364,R,0,0,1,1,0,2 -Dancing in September,2000,102,0.85,6.4,166,R,0,0,0,1,0,1 -"Dangerous Lives of Altar Boys, The",2002,105,12,7.2,3274,R,0,0,0,1,0,1 -Dante's Peak,1997,104,104,5.6,9203,PG-13,1,0,0,1,0,2 -Daredevil,2003,133,75,5.7,20642,R,1,0,0,0,0,1 -Dark Blue,2002,118,15,6.6,3882,R,1,0,0,1,0,2 -Dawn of the Dead,2004,109,28,7.4,16283,R,1,0,0,1,0,2 -"Day After Tomorrow, The",2004,124,125,6.3,23749,PG-13,1,0,0,1,0,2 -"Day Without a Mexican, A",2004,100,1.5,5,561,R,0,0,1,1,0,2 -Day of Defense,2003,102,0.5,3,8,PG,0,0,0,1,0,1 -Daylight,1996,110,80,5.4,6979,PG-13,1,0,0,1,0,2 -Dead Babies,2000,100,1,4.3,172,R,0,0,1,0,0,1 -"Dead Hate the Living!, The",2000,90,0.15,4.3,496,R,0,0,1,0,0,1 -Dead Man Walking,1995,122,11,7.6,16177,R,0,0,0,1,0,1 -Dead Man on Campus,1998,96,14,5.4,2829,R,0,0,1,0,0,1 -Dead Man's Curve,1998,90,1,5.7,1241,R,0,0,1,1,0,2 -Dead Presidents,1995,119,15,6.3,2641,R,1,0,0,1,0,2 -Death to Smoochy,2002,109,55,6.3,8003,R,0,0,1,0,0,1 -Deconstructing Harry,1997,96,20,7.1,7342,R,0,0,1,0,0,1 -Decoys,2004,95,5,4.2,580,R,0,0,1,0,0,1 -Deep Blue Sea,1999,105,78,5.5,17666,R,1,0,0,0,0,1 -"Deep End of the Ocean, The",1999,106,40,5.9,2890,PG-13,0,0,0,1,0,1 -"Deep End, The",2001,101,3,6.8,3524,R,0,0,0,1,0,1 -Deep Impact,1998,120,75,5.9,22684,PG-13,0,0,0,1,0,1 -Deep Rising,1998,97,45,5.4,4626,R,1,0,0,0,0,1 -"Defender, The",2004,90,6,6.3,58,R,1,0,0,0,0,1 -Delivered,1998,93,1,5.1,73,R,0,0,1,1,0,2 -Dellamorte Dellamore,1994,105,4,7.3,2313,R,0,0,1,0,1,2 -"Demolitionist, The",1995,100,1,4.1,238,R,1,0,0,0,0,1 -Derailed,2002,89,18,3.4,1075,R,1,0,0,0,0,1 -Desperado,1995,106,7,6.8,17929,R,1,0,0,0,0,1 -Detention,2003,98,10,4.1,223,R,1,0,0,1,0,2 -Detroit Rock City,1999,95,15,6,4607,R,0,0,1,0,0,1 -Deuce Bigalow: Male Gigolo,1999,88,18,5.6,9897,R,0,0,1,0,0,1 -Deuces Wild,2002,100,10,5.3,1511,R,1,0,0,1,0,2 -"Devil's Advocate, The",1997,144,57,7,26904,R,0,0,0,1,0,1 -"Devil's Own, The",1997,111,80,5.7,8485,R,1,0,0,1,0,2 -Devil's Pond,2003,92,5,5.6,370,R,0,0,0,1,0,1 -Diary of a Mad Black Woman,2005,116,5.5,3.9,837,PG-13,0,0,1,1,0,2 -Dick,1999,94,13,6.3,5004,PG-13,0,0,1,0,0,1 -Dickie Roberts: Former Child Star,2003,98,17,5.5,2076,PG-13,0,0,1,0,0,1 -Die Another Day,2002,133,142,6.4,22136,PG-13,1,0,0,0,0,1 -Die Hard: With a Vengeance,1995,131,90,7,25258,R,1,0,0,0,0,1 -"Different Loyalty, A",2004,96,13,5,135,R,0,0,0,1,1,2 -Digimon: The Movie,2000,82,5,3.4,455,PG,1,1,0,0,0,2 -Dill Scallion,1999,91,0.5,5.1,136,PG-13,0,0,1,0,0,1 -Dinosaur,2000,82,127.5,6.3,5839,PG,0,1,0,0,0,1 -Diplomatic Siege,1999,96,45,3.5,340,R,1,0,0,0,0,1 -Dirty Pretty Things,2002,97,10,7.6,6274,R,0,0,0,1,0,1 -Dirty Work,1998,82,13,5.9,4252,PG-13,0,0,1,0,0,1 -Divine Secrets of the Ya-Ya Sisterhood,2002,116,27,5.5,4288,PG-13,0,0,1,1,0,2 -Doctor Dolittle,1998,85,71.5,5.4,8287,PG-13,0,0,1,0,0,1 -Doctor Zhivago,1965,200,11,7.9,10283,PG-13,0,0,0,1,1,2 -Dodgeball: A True Underdog Story,2004,92,20,6.6,14584,PG-13,0,0,1,0,0,1 -"Dog of Flanders, A",1999,100,7,6,179,PG,0,0,0,1,0,1 -Dogma,1999,130,10,7.3,43391,R,0,0,1,0,0,1 -Dom durakov,2002,104,2.5,6.8,382,R,0,0,0,1,0,1 -Domestic Disturbance,2001,91,53,5.4,4445,PG-13,0,0,0,1,0,1 -Dominion,1995,95,1.3,5,85,R,0,0,0,1,0,1 -Don't Say a Word,2001,113,50,6.2,10098,R,0,0,0,1,0,1 -Donnie Brasco,1997,127,35,7.6,20029,R,0,0,0,1,0,1 -Donnie Darko,2001,133,4.5,8.3,51961,R,0,0,0,1,0,1 -Double Jeopardy,1999,105,40,5.9,13587,R,0,0,0,1,0,1 -Double Take,2001,91,24,4.8,1503,PG-13,1,0,1,0,0,2 -Double Tap,1997,87,8,5.3,184,R,1,0,0,0,0,1 -Double Whammy,2001,100,4,5.6,886,R,0,0,1,1,0,2 -Down Time,2001,90,0.02,3.5,55,R,0,0,0,1,0,1 -Down and Out with the Dolls,2001,88,1.2,6,37,R,0,0,1,0,0,1 -Down to Earth,2001,87,30,5.1,3720,PG-13,0,0,1,0,1,2 -Down to You,2000,91,9,4.7,3232,PG-13,0,0,1,1,1,3 -Dr T and the Women,2000,122,12,4.8,4776,R,0,0,1,1,1,3 -Dr. Dolittle 2,2001,87,72,5.1,4920,PG,0,0,1,0,0,1 -Dr. Jekyll and Ms. Hyde,1995,90,8,4.2,573,PG-13,0,0,1,0,0,1 -Dr. Strangelove or: How I Learned to Stop Worrying and Love the Bomb,1964,93,1.8,8.7,63471,PG,0,0,1,0,0,1 -Dracula,1992,128,40,7.1,19972,R,0,0,0,1,1,2 -Dragonfly,2002,104,60,5.8,5431,PG-13,0,0,0,1,0,1 -Drive,1997,117,3.5,6.4,1086,R,1,0,1,0,0,2 -Drive Me Crazy,1999,91,8,5.1,2934,PG-13,0,0,1,1,1,3 -Driven,2001,116,72,4.4,7129,PG-13,1,0,0,1,0,2 -Drowning Mona,2000,95,16,5.4,3454,PG-13,0,0,1,0,0,1 -Drumline,2002,118,20,5.3,7368,PG-13,0,0,1,1,1,3 -"Dude, Where's My Car?",2000,83,13,4.6,13330,PG-13,0,0,1,0,0,1 -Dudley Do-Right,1999,77,22,3.6,1790,PG,0,0,1,0,0,1 -Duets,2000,112,15,5.8,2414,R,0,0,1,1,0,2 -Dumb & Dumber,1994,101,16,6.6,27713,PG-13,0,0,1,0,0,1 -Dumb and Dumberer: When Harry Met Lloyd,2003,85,19,3.3,4689,PG-13,0,0,1,0,0,1 -Dungeons & Dragons,2000,107,35,4,7435,PG-13,1,0,0,0,0,1 -Duplex,2003,89,40,5.7,4334,PG-13,0,0,1,0,0,1 -Dusting Cliff 7,1996,95,1.3,3.5,80,R,1,0,0,1,0,2 -E.T. the Extra-Terrestrial,1982,120,10.5,7.8,44175,PG,0,0,0,1,0,1 -Ed Wood,1994,127,18,8,22612,R,0,0,1,1,0,2 -Eddie,1996,100,30,4.9,1348,PG-13,0,0,1,0,0,1 -Edges of the Lord,2001,95,7.5,7,639,R,0,0,0,1,0,1 -Edtv,1999,122,60,6.2,10085,PG-13,0,0,1,0,0,1 -Eight Legged Freaks,2002,99,30,5.5,6362,PG-13,1,0,1,0,0,2 -"Eighteenth Angel, The",1998,95,25,4.6,557,R,1,0,0,0,0,1 -Election,1999,103,8.5,7.4,17521,R,0,0,1,0,0,1 -Elektra,2005,96,43,4.9,5120,PG-13,1,0,0,0,0,1 -Elephant,2003,81,3,7.3,9203,R,0,0,0,1,0,1 -Elf,2003,95,33,7,10165,PG,0,0,1,0,0,1 -Elizabeth,1998,124,25,7.6,14733,R,0,0,0,1,0,1 -Ella Enchanted,2004,96,35,6.5,2502,PG,0,0,1,0,1,2 -Elvira's Haunted Hills,2001,90,1.5,5.2,307,PG-13,0,0,1,0,0,1 -Emma,1996,121,6,6.9,6431,PG,0,0,1,0,1,2 -Emmett's Mark,2002,104,4.5,6.2,427,R,0,0,0,1,0,1 -"Emperor's Club, The",2002,109,12.5,6.7,3056,PG-13,0,0,0,1,0,1 -Empire,2002,90,3.5,6,1718,R,1,0,0,1,0,2 -End of Days,1999,121,83,5.3,18237,R,1,0,0,0,0,1 -"End of Violence, The",1997,122,5,5.4,1575,R,0,0,0,1,0,1 -"End of the Affair, The",1999,102,23,7,4808,R,0,0,0,1,1,2 -Enemy at the Gates,2001,131,70,7.3,19169,R,1,0,0,1,1,3 -Enemy of the State,1998,131,90,7.1,23263,R,1,0,0,1,0,2 -"English Patient, The",1996,160,27,7.1,25210,R,0,0,0,1,1,2 -Enough,2002,115,38,4.9,4339,PG-13,0,0,0,1,0,1 -Enter the Dragon,1973,99,0.85,7.4,8078,R,1,0,0,0,0,1 -Entrapment,1999,113,66,6.1,18543,PG-13,0,0,1,0,1,2 -Envy,2004,99,40,4.3,3417,PG-13,0,0,1,0,0,1 -Equilibrium,2002,107,20,7.6,17579,R,1,0,0,0,0,1 -"Era of Vampire, The",2002,90,1,4.2,329,R,1,0,0,0,0,1 -Eraser,1996,115,100,5.8,14641,R,1,0,0,1,0,2 -Erin Brockovich,2000,130,51,7.3,24301,R,0,0,0,1,0,1 -Escanaba in da Moonlight,2001,91,1,5.5,373,PG-13,0,0,1,0,0,1 -Escape from L.A.,1996,101,50,4.8,7955,R,1,0,0,0,0,1 -"Espinazo del diablo, El",2001,108,4.5,7.4,3474,R,0,0,0,1,0,1 -Eternal Sunshine of the Spotless Mind,2004,108,20,8.6,46240,R,0,0,1,1,1,3 -Eulogy,2004,91,10,6.5,773,R,0,0,1,1,0,2 -EuroTrip,2004,90,25,6.1,8390,R,0,0,1,0,0,1 -Eve's Bayou,1997,109,5,7.2,2302,R,0,0,0,1,0,1 -Evelyn,2002,94,10,7.1,1163,PG,0,0,0,1,0,1 -EvenHand,2002,92,0.5,7.3,169,R,0,0,0,1,0,1 -Ever After,1998,121,26,7,10250,PG,0,0,1,1,1,3 -"Everlasting Piece, An",2000,103,14,6.1,475,R,0,0,1,0,0,1 -Everyone Says I Love You,1996,101,20,6.9,7314,R,0,0,1,0,1,2 -Everything Put Together,2000,87,0.5,7.1,151,R,0,0,0,1,0,1 -Evil Alien Conquerors,2002,89,0.5,3.8,111,PG-13,0,0,1,0,0,1 -Evita,1996,134,55,6.2,8371,PG,0,0,0,1,0,1 -Evolution,2001,101,80,5.8,14232,PG-13,0,0,1,0,0,1 -Exit Wounds,2001,101,33,5.3,5370,R,1,0,0,0,0,1 -Exorcist: The Beginning,2004,114,30,5,4130,R,1,0,0,0,0,1 -Extreme Ops,2002,94,40,4,1337,PG-13,1,0,0,0,0,1 -Eye for an Eye,1996,101,20,5.6,1843,R,0,0,0,1,0,1 -Eyes Wide Shut,1999,159,65,7,37868,R,0,0,0,1,0,1 -Facade,2000,93,6,4.8,93,R,1,0,0,0,0,1 -Face/Off,1997,133,80,7.1,37506,R,1,0,0,1,0,2 -Fair Game,1995,91,50,3.9,2579,R,1,0,1,1,0,3 -Faithful,1996,91,13,5.6,414,R,0,0,1,0,0,1 -"Falls, The",2003,85,0.075,5.7,29,R,0,0,0,1,0,1 -"Family Man, The",2000,125,60,6.5,11220,PG-13,0,0,1,1,1,3 -"Fantasma dell'opera, Il",1998,106,10,3.8,910,R,0,0,0,1,1,2 -Far from Heaven,2002,107,13.5,7.7,9167,PG-13,0,0,0,1,1,2 -Fargo,1996,98,7,8.2,65597,R,0,0,0,1,0,1 -Fascination,2004,95,5,3.3,124,R,0,0,0,1,1,2 -"Fast and the Furious, The",2001,106,38,5.7,21428,PG-13,1,0,0,0,0,1 -Father of the Bride Part II,1995,106,30,5.6,4089,PG,0,0,1,0,0,1 -Fathers' Day,1997,98,85,4.7,2714,PG-13,0,0,1,0,0,1 -Feng yun xiong ba tian xia,1998,85,10,6.3,922,PG-13,1,0,0,0,0,1 -Festen,1998,105,1.3,8.2,11983,R,0,0,0,1,0,1 -Fever Pitch,2005,98,39.69,6.6,1712,PG-13,0,0,1,0,1,2 -"Fifth Element, The",1997,126,90,7.1,55398,PG-13,1,0,0,1,0,2 -Fight Club,1999,139,63,8.5,112092,R,0,0,0,1,0,1 -Final,2001,111,0.08,5.2,330,R,0,0,0,1,0,1 -Final Fantasy: The Spirits Within,2001,106,137,6.5,16451,PG-13,1,1,0,0,0,2 -Final Solution,2001,110,1.5,7,32,R,1,0,0,1,0,2 -Finding Forrester,2000,136,43,7.3,13439,PG-13,0,0,0,1,0,1 -Finding Graceland,1998,106,10,6.6,504,PG-13,0,0,0,1,0,1 -Fire Over Afghanistan,2003,92,0.155,4.5,67,R,1,0,0,1,0,2 -Firestorm,1998,89,19,4.4,987,R,1,0,0,0,0,1 -"Firm, The",1993,154,42,6.6,14708,R,0,0,0,1,0,1 -First Knight,1995,134,75,5.6,8708,PG-13,0,0,0,1,1,2 -"First Love, Last Rites",1997,94,0.3,5,147,R,0,0,0,1,1,2 -Flawless,1999,112,27,6.1,3287,R,0,0,1,1,0,2 -Flight of the Phoenix,2004,113,45,6,2732,PG-13,1,0,0,0,0,1 -"Flintstones in Viva Rock Vegas, The",2000,90,58,3.7,1712,PG,0,0,1,0,0,1 -For Love of the Game,1999,137,50,6.1,5782,PG-13,0,0,0,1,1,2 -Foreign Correspondents,1999,102,0.5,7.6,117,PG-13,0,0,0,1,1,2 -"Foreigner, The",2003,96,20,3.1,904,R,1,0,0,0,0,1 -Forever Lulu,2000,99,20,5.5,257,R,0,0,1,0,1,2 -"Forgotten, The",2004,94,42,5.8,8234,PG-13,0,0,0,1,0,1 -Forrest Gump,1994,142,55,8.2,89722,PG-13,0,0,1,1,0,2 -Fortress 2,1999,92,11,4.2,1027,R,1,0,0,0,0,1 -"Four Feathers, The",2002,125,80,6.2,4400,PG-13,0,0,0,1,0,1 -Four Rooms,1995,98,4,6,10675,R,0,0,1,1,0,2 -Four Weddings and a Funeral,1994,117,6,7.2,17820,R,0,0,1,1,1,3 -Frailty,2001,100,11,7.4,10551,R,0,0,0,1,0,1 -Frankenfish,2004,84,3,4.6,309,R,1,0,1,0,0,2 -Frankenstein,1994,123,45,6,6941,R,0,0,0,1,0,1 -Freaky Friday,2003,97,26,6.9,8052,PG,0,0,1,1,0,2 -Freddy Got Fingered,2001,87,15,3.5,9115,R,0,0,1,0,0,1 -Freddy Vs. Jason,2003,97,25,6.1,11109,R,1,0,0,0,0,1 -Freddy's Dead: The Final Nightmare,1991,93,5,4.3,3618,R,0,0,1,0,0,1 -Free Money,1998,91,30,4.7,619,R,0,0,1,0,0,1 -Freeway,1996,102,3,6.5,4961,R,0,0,0,1,0,1 -Freeway II: Confessions of a Trickbaby,1999,90,2,4.6,666,R,0,0,0,1,0,1 -Freeze Frame,2004,99,2,5.8,189,R,0,0,0,1,0,1 -Frequency,2000,118,31,7.4,15317,PG-13,0,0,0,1,0,1 -Frida,2002,123,12,7.5,8614,R,0,0,0,1,0,1 -Friday,1995,91,3.5,6.7,7020,R,0,0,1,1,0,2 -Friday After Next,2002,85,20,4.9,1659,R,0,0,1,0,0,1 -Friday Night Lights,2004,117,30,7,4290,PG-13,0,0,0,1,0,1 -From Dusk Till Dawn,1996,108,20,6.8,28473,R,1,0,1,0,0,2 -From Justin to Kelly,2003,90,12,1.7,6517,PG,0,0,1,0,1,2 -Frostbite,2005,83,2.4,2.8,201,R,0,0,1,0,0,1 -Full Clip,2004,95,0.5,4.1,72,R,1,0,0,0,0,1 -Full Frontal,2002,101,2,5,3056,R,0,0,1,1,1,3 -"Full Monty, The",1997,91,3.5,7.2,22115,R,0,0,1,0,0,1 -Galaxy Quest,1999,102,45,7.2,22341,PG,0,0,1,0,0,1 -"Game of Their Lives, The",2005,101,20,6.4,125,PG,0,0,0,1,0,1 -Gangs of New York,2002,166,97,7.3,34808,R,0,0,0,1,0,1 -Garage Days,2002,106,6,5.6,597,R,0,0,1,1,0,2 -Garden State,2004,109,2.5,8.1,23814,R,0,0,1,1,1,3 -Garfield,2004,80,50,4.8,4775,PG,0,1,1,0,0,2 -Gattaca,1997,101,36,7.6,26071,PG-13,0,0,0,1,0,1 -"General's Daughter, The",1999,116,60,6.1,11128,R,0,0,0,1,0,1 -George of the Jungle,1997,92,55,5.5,6430,PG,0,0,1,0,0,1 -Gerry,2002,105,3.5,6,1944,R,0,0,0,1,0,1 -Get Carter,2000,104,40,4.7,4927,R,1,0,0,1,0,2 -Get Over It,2001,87,10,5.7,3561,PG-13,0,0,1,0,1,2 -Get Shorty,1995,105,30.25,7,14825,R,0,0,1,1,0,2 -Get on the Bus,1996,120,2.4,6.6,1142,R,0,0,0,1,0,1 -Ghost World,2000,111,7,7.8,17976,R,0,0,1,1,0,2 -"Ghost and the Darkness, The",1996,109,55,6.4,8360,R,1,0,0,1,0,2 -Ghosts of Mars,2001,98,28,4.6,6368,R,1,0,0,0,0,1 -"Gift, The",2000,111,10,6.8,12440,R,0,0,0,1,0,1 -Gigli,2003,121,54,2.3,11285,R,0,0,1,0,1,2 -Girl 6,1996,108,12,5,1453,R,0,0,1,1,0,2 -"Girl, Interrupted",1999,127,24,7,16362,R,0,0,0,1,0,1 -Gladiator,2000,155,103,8,92495,R,1,0,0,1,0,2 -Glitter,2001,104,22,2.1,5209,PG-13,0,0,0,1,1,2 -Global Heresy,2002,106,12,5.7,373,R,0,0,0,1,0,1 -Gloria,1999,108,30,4.9,1144,R,0,0,0,1,0,1 -Go,1999,103,6.5,7.4,20663,R,0,0,1,0,0,1 -Go Fish,1994,84,0.015,5.8,621,R,0,0,0,0,1,1 -Goat on Fire and Smiling Fish,1999,90,0.04,6.3,254,R,0,0,1,0,1,2 -God's Army,2000,108,0.3,6.4,354,PG,0,0,0,1,0,1 -Gods and Generals,2003,209,56,5.7,3002,PG-13,1,0,0,1,0,2 -Gods and Monsters,1998,105,3.5,7.6,9020,R,0,0,0,1,0,1 -Going Greek,2001,90,0.198,4.8,261,R,0,0,1,0,0,1 -Gojira ni-sen mireniamu,1999,99,1,5.6,1150,PG,1,0,0,0,0,1 -"Golden Bowl, The",2000,130,15,6,1145,R,0,0,0,1,0,1 -GoldenEye,1995,130,80,6.8,22991,PG-13,1,0,0,0,0,1 -Gone Fishin',1997,94,53,3.8,1884,PG,0,0,1,0,0,1 -Gone in Sixty Seconds,2000,117,90,5.7,25400,PG-13,1,0,0,0,0,1 -Gong fu,2004,99,20,7.9,5299,R,1,0,1,0,0,2 -Good Boy!,2003,88,18,4.7,683,PG,0,0,1,1,0,2 -Good Burger,1997,103,9,4,1714,PG,0,0,1,0,0,1 -"Good Girl, The",2002,93,5,6.9,8254,R,0,0,1,1,0,2 -Good Will Hunting,1997,126,10,7.8,60858,R,0,0,0,1,0,1 -Gosford Park,2001,137,15,7.3,16831,R,0,0,0,1,0,1 -Grace of My Heart,1996,116,5,6.5,982,R,0,0,1,1,0,2 -"Granny, The",1995,85,1,4.2,142,R,0,0,1,0,0,1 -"Grave, The",1996,90,4,5.6,303,R,0,0,1,0,0,1 -Gravesend,1997,85,0.065,5,111,R,0,0,0,1,0,1 -"Great White Hope, The",1970,103,6,6.9,369,PG-13,0,0,0,1,0,1 -"Green Mile, The",1999,188,60,8.1,60142,R,0,0,0,1,0,1 -"Greenskeeper, The",2002,90,0.08,4.7,38,R,0,0,1,0,0,1 -Grey Owl,1999,118,30,5.7,629,PG-13,0,0,0,1,0,1 -"Grey Zone, The",2001,108,5,7.3,1553,R,0,0,0,1,0,1 -Groove,2000,86,0.5,6,1171,R,0,0,0,1,0,1 -Grosse Pointe Blank,1997,107,15,7.4,20400,R,0,0,1,0,1,2 -Grumpier Old Men,1995,101,25,6.2,3711,PG-13,0,0,1,0,1,2 -Guinevere,1999,104,2.6,6.3,804,R,0,0,0,1,1,2 -Gun Shy,2000,101,10,5.4,1701,R,0,0,1,0,1,2 -"Guru, The",2002,94,11,5.9,3505,R,0,0,1,0,1,2 -"Guy Thing, A",2003,101,20,5.3,2885,PG-13,0,0,1,0,1,2 -Hairshirt,1998,89,0.065,4.2,242,R,0,0,1,0,1,2 -Half Past Dead,2002,98,30,3.9,2099,PG-13,1,0,0,0,0,1 -Hanging Up,2000,94,40,4.4,3129,PG-13,0,0,1,1,0,2 -Happy Gilmore,1996,92,10,6.8,17746,PG-13,0,0,1,0,0,1 -"Happy, Texas",1999,98,1.7,6.4,3453,PG-13,0,0,1,0,0,1 -Hard Ball,2001,109,21,6,3083,PG-13,0,0,0,1,0,1 -Hard Rain,1998,97,70,5.5,6161,R,1,0,0,1,0,2 -Hardware,1990,93,1.5,5.2,1323,R,1,0,0,0,0,1 -Harold & Kumar Go to White Castle,2004,90,9,7.1,8376,R,0,0,1,0,0,1 -Harriet the Spy,1996,100,13,5.8,845,PG,0,0,1,1,0,2 -Hart's War,2002,125,70,6.2,6368,R,0,0,0,1,0,1 -Harvard Man,2001,99,5.5,4.9,1157,R,0,0,0,1,1,2 -"Haunted Mansion, The",2003,87,90,5,3341,PG,0,0,1,0,0,1 -Hav Plenty,1997,84,0.65,5.3,256,R,0,0,1,0,0,1 -He Got Game,1998,137,25,6.6,4198,R,0,0,0,1,0,1 -Head Over Heels,2001,86,14,4.9,2632,PG-13,0,0,1,0,1,2 -Heart of America,2003,87,3,6.1,204,R,0,0,0,1,0,1 -"Heart of Me, The",2002,96,7,6.2,336,R,0,0,0,1,1,2 -Heartbreakers,2001,110,40,6.2,8037,PG-13,0,0,1,0,1,2 -Hearts in Atlantis,2001,101,31,6.7,6577,PG-13,0,0,0,1,0,1 -Heat,1995,188,60,7.9,44588,R,1,0,0,1,0,2 -Heaven,2002,96,11,7.3,3857,R,0,0,0,1,0,1 -Heavenly Creatures,1994,108,5,7.7,11453,R,0,0,0,1,1,2 -Heavy Metal 2000,2000,88,15,5.1,1148,R,1,1,0,0,0,2 -Hedwig and the Angry Inch,2001,93,6,7.7,6072,R,0,0,1,1,1,3 -Held Up,1999,89,8,4.6,555,PG-13,0,0,1,0,0,1 -"Helix... Loaded, The",2005,97,1,2.3,33,R,1,0,1,0,0,2 -Hellboy,2004,132,66,6.7,15565,PG-13,1,0,0,0,0,1 -Henry V,1989,137,9,7.9,8241,PG-13,1,0,0,1,0,2 -Here on Earth,2000,93,15,4.8,2187,PG-13,0,0,0,1,1,2 -Hey Arnold! The Movie,2002,76,10,4.8,425,PG,0,1,1,0,0,2 -Hidalgo,2004,136,78,6.6,7328,PG-13,1,0,0,1,0,2 -Hidden Agenda,2001,98,5,4.2,266,R,1,0,0,0,0,1 -Hidden Assassin,1995,89,11,4.4,245,R,1,0,0,1,0,2 -Hide and Seek,2005,101,30,5.2,3784,R,0,0,0,1,0,1 -Hideous Kinky,1998,98,12,6.1,1615,R,0,0,0,1,0,1 -High Crimes,2002,115,42,6.1,6043,PG-13,0,0,0,1,0,1 -High Fidelity,2000,113,20,7.6,29704,R,0,0,1,1,1,3 -High Strung,1991,93,0.3,6.2,391,PG,0,0,1,0,0,1 -Highlander,1986,116,16,7.1,18146,R,1,0,0,0,0,1 -Highlander II: The Quickening,1991,92,30,3.4,9264,R,1,0,0,0,0,1 -Highlander III: The Sorcerer,1994,102,26,3.7,3388,PG-13,1,0,0,0,0,1 -Highlander: Endgame,2000,101,15,4.4,3773,R,1,0,0,0,0,1 -"Hillz, The",2004,91,0.1,3.1,80,R,0,0,1,1,0,2 -HipHopBattle.com: Hip Hop 4 Life,2001,98,0.012,5.7,15,PG-13,0,0,1,1,1,3 -Hit and Runway,1999,108,1.2,6.7,189,R,0,0,1,0,0,1 -"Hitchhiker's Guide to the Galaxy, The",2005,110,50,6.9,7644,PG,0,0,1,0,0,1 -Holes,2003,117,30,7.2,5235,PG,0,0,1,1,0,2 -Hollywood Ending,2002,112,16,6.3,3673,PG-13,0,0,1,1,0,2 -Hollywood Homicide,2003,116,75,5.2,5312,PG-13,1,0,1,0,0,2 -Hollywood North,2003,89,7,5.7,114,R,0,0,1,0,0,1 -"Hollywood Sign, The",2001,90,12,5.3,196,R,0,0,1,0,0,1 -Holy Man,1998,114,60,4.9,3497,PG,0,0,1,1,0,2 -Home Fries,1998,91,15,4.9,2374,PG-13,0,0,1,1,1,3 -"Home at the End of the World, A",2004,96,6.5,6.5,1693,R,0,0,0,1,1,2 -Home on the Range,2004,76,110,5.4,1510,PG,0,1,1,0,0,2 -Hometown Legend,2002,108,2,4.6,186,PG,0,0,0,1,0,1 -Honey,2003,94,17,3.9,3067,PG-13,0,0,0,1,1,2 -Hong faan kui,1996,91,7.5,6.5,4644,R,1,0,1,0,0,2 -Hope Floats,1998,114,30,5.3,4382,PG-13,0,0,1,1,1,3 -"Horse Whisperer, The",1998,170,60,6.4,6744,PG-13,0,0,0,1,1,2 -"Hours, The",2002,114,25,7.6,16692,PG-13,0,0,0,1,0,1 -"House of Mirth, The",2000,140,10,6.9,2167,PG,0,0,0,1,1,2 -House of Sand and Fog,2003,126,16,7.8,8164,R,0,0,0,1,0,1 -"House of Yes, The",1997,85,1.5,6.5,2345,R,0,0,1,1,0,2 -House of the Dead,2003,90,7,2.3,3921,R,1,0,0,0,0,1 -"House on Turk Street, The",2002,103,12,5.5,1048,R,0,0,0,1,0,1 -How Harry Became a Tree,2001,99,6,6.7,115,R,0,0,0,1,0,1 -How High,2001,95,12,4.9,2916,R,0,0,1,0,0,1 -How Stella Got Her Groove Back,1998,124,20,5,1475,R,0,0,0,1,1,2 -How the Grinch Stole Christmas,2000,104,123,5.7,12680,PG,0,0,1,1,0,2 -How to Deal,2003,102,16,5.5,1537,PG-13,0,0,1,1,1,3 -How to Kill Your Neighbor's Dog,2000,107,7.3,7,907,R,0,0,1,1,0,2 -How to Lose a Guy in 10 Days,2003,116,50,6.1,9257,PG-13,0,0,1,0,1,2 -Hulk,2003,138,120,6.1,20710,PG-13,1,0,0,1,0,2 -Hurricane,1997,91,0.5,6.6,424,R,0,0,0,1,0,1 -"Hurricane, The",1999,145,38,7.3,12445,R,0,0,0,1,0,1 -Husbands,1970,131,1,7,373,PG-13,0,0,0,1,0,1 -I Am Sam,2001,132,22,7.2,9945,PG-13,0,0,0,1,0,1 -I Capture the Castle,2003,111,8,7,947,R,0,0,0,1,1,2 -I Dreamed of Africa,2000,114,34,5.2,1113,PG-13,0,0,0,1,0,1 -I Got the Hook Up,1998,93,3.5,3.2,412,R,0,0,1,0,0,1 -I Heart Huckabees,2004,106,22,7,7262,R,0,0,1,0,0,1 -I Married a Strange Person!,1997,74,0.25,6.2,391,R,0,1,1,1,0,3 -I Spy,2002,97,70,5.3,5521,PG-13,1,0,1,0,0,2 -I'm with Lucy,2002,90,15,6.2,646,R,0,0,1,0,1,2 -"I, Robot",2004,115,105,7,22330,PG-13,1,0,0,0,0,1 -Ice Age,2002,81,60,7.3,22302,PG,0,1,1,0,0,2 -Ice Cream Man,1995,84,2,4.2,349,R,0,0,1,0,0,1 -"Ice Storm, The",1997,112,18,7.5,13115,R,0,0,0,1,0,1 -"Ideal Husband, An",1999,97,14,7,4584,PG-13,0,0,1,0,1,2 -Identity,2003,90,30,7.3,18747,R,0,0,0,1,0,1 -Idle Hands,1999,92,20,5.4,5892,R,0,0,1,0,0,1 -Igby Goes Down,2002,99,9,7.1,7958,R,0,0,1,1,0,2 -Imaginary Heroes,2004,112,10,7,411,R,0,0,1,1,0,2 -"Importance of Being Earnest, The",2002,97,15,6.8,3598,PG,0,0,1,1,1,3 -Impostor,2002,102,40,5.8,3292,R,1,0,0,1,0,2 -In & Out,1997,92,35,6.2,10352,PG-13,0,0,1,0,0,1 -"In Crowd, The",2000,104,15,4,1342,PG-13,0,0,0,1,0,1 -In This World,2002,88,1.9,7.8,815,R,0,0,0,1,0,1 -In the Bedroom,2001,130,1.7,7.4,10177,R,0,0,0,1,0,1 -In the Company of Men,1997,97,0.025,7.3,3618,R,0,0,1,0,0,1 -In the Shadows,2001,105,10,4.8,268,R,0,0,0,1,0,1 -Incident at Loch Ness,2004,94,1.4,6.4,251,PG-13,0,0,1,0,0,1 -"Incredibles, The",2004,121,92,8.3,30749,PG,1,1,1,0,0,3 -"Incredibly True Adventure of Two Girls in Love, The",1995,94,0.25,6.5,795,R,0,0,1,1,1,3 -Independence Day,1996,153,75,6.1,61831,PG-13,1,0,0,0,0,1 -"Insider, The",1999,157,68,8,28780,R,0,0,0,1,0,1 -Insomnia,2002,118,46,7.3,22235,R,0,0,0,1,0,1 -Inspector Gadget,1999,78,75,4,5288,PG,1,0,1,0,0,2 -Instinct,1999,126,55,6.1,6298,R,0,0,0,1,0,1 -"Intended, The",2002,110,3.8,6.8,40,R,0,0,0,1,0,1 -Intermission,2003,102,5,6.4,1971,R,0,0,1,1,0,2 -"Interpreter, The",2005,128,80,6.6,4678,PG-13,0,0,0,1,0,1 -Interstate 60,2002,116,7,7.7,2495,R,0,0,1,1,0,2 -Interview with the Assassin,2002,88,0.75,6.7,409,R,0,0,0,1,0,1 -Into the Sun,2005,97,16,4,481,R,1,0,0,0,0,1 -Intolerable Cruelty,2003,100,60,6.6,11967,PG-13,0,0,1,0,1,2 -"Intruder, The",1962,84,0.08,8,163,PG-13,0,0,0,1,0,1 -"Invasions barbares, Les",2003,112,5,7.9,4900,R,0,0,1,1,0,2 -"Iron Giant, The",1999,86,48,7.9,15151,PG,0,1,0,0,0,1 -Isn't She Great,2000,95,36,4.8,688,R,0,0,1,1,1,3 -"Italian Job, The",2003,111,60,6.9,18496,PG-13,1,0,0,0,0,1 -JFK,1991,206,40,7.8,26456,R,0,0,0,1,0,1 -Jack,1996,113,45,5.2,5256,PG-13,0,0,1,1,0,2 -Jack Frost,1998,101,50,4.5,2130,PG,0,0,1,1,0,2 -Jackie Brown,1997,154,12,7.5,28891,R,0,0,0,1,0,1 -Jackpot,2001,97,0.4,5.2,213,R,0,0,1,1,0,2 -Jade,1995,107,50,4.8,2380,R,1,0,0,1,0,2 -Jake's Booty Call,2003,77,0.05,7,10,R,0,0,1,0,0,1 -Jakob the Liar,1999,120,15,5.9,2544,PG-13,0,0,1,1,0,2 -James and the Giant Peach,1996,79,38,6.6,3144,PG,0,1,0,0,0,1 -Japanese Story,2003,105,5.74,7,1330,R,0,0,0,1,0,1 -Jay and Silent Bob Strike Back,2001,104,22,6.9,24211,R,0,0,1,0,0,1 -Jeepers Creepers,2001,90,10,5.4,10973,R,0,0,0,1,0,1 -Jefferson in Paris,1995,139,14,5.6,665,PG-13,0,0,0,1,0,1 -Jerry Maguire,1996,139,50,7.3,34623,R,0,0,1,1,1,3 -Jerry and Tom,1998,106,5,6.7,447,R,0,0,1,1,0,2 -Jersey Girl,2004,102,35,6.4,6853,PG-13,0,0,1,1,0,2 -Jesus' Son,1999,107,2.5,6.9,2291,R,0,0,0,1,0,1 -"Jimmy Show, The",2001,99,1,4.6,145,R,0,0,1,1,0,2 -Jing cha gu shi III: Chao ji jing cha,1992,95,0.9,6.7,2024,R,1,0,1,0,0,2 -Jingle All the Way,1996,88,60,4.7,6246,PG,1,0,1,0,0,2 -Joe Dirt,2001,91,16,5.1,5514,PG-13,0,0,1,0,1,2 -Joe Somebody,2001,98,38,5.5,1937,PG,0,0,1,1,1,3 -Joe's Apartment,1996,80,13,5,2169,PG-13,0,0,1,0,0,1 -John Q,2002,116,36,6.4,8952,PG-13,0,0,0,1,0,1 -Johnny English,2003,87,35,5.6,8125,PG,1,0,1,0,0,2 -Johnson Family Vacation,2004,97,12,3.6,955,PG-13,0,0,1,0,0,1 -Josie and the Pussycats,2001,98,22,5.2,4508,PG-13,0,0,1,0,0,1 -Judge Dredd,1995,96,90,4.6,9979,R,1,0,0,0,0,1 -Judgment,2001,105,11,4.6,106,PG-13,0,0,0,1,0,1 -Jui kuen II,1994,99,2,7.5,4628,R,1,0,1,0,0,2 -Julie Walking Home,2002,118,5,7.3,190,R,0,0,0,1,1,2 -Jumanji,1995,104,65,6,14874,PG,1,0,1,0,0,2 -Jurassic Park III,2001,92,93,5.6,20690,PG-13,1,0,0,0,0,1 -"Juror, The",1996,118,44,5.3,2920,R,0,0,0,1,0,1 -Just Looking,1999,97,3,6.2,436,R,0,0,1,0,0,1 -Just the Ticket,1999,115,12,5.5,610,R,0,0,1,0,1,2 -Juwanna Mann,2002,91,15.6,3.9,885,PG-13,0,0,1,0,0,1 -K-19: The Widowmaker,2002,140,100,6.6,8292,PG-13,0,0,0,1,0,1 -K-PAX,2001,120,48,7.2,17235,PG-13,0,0,0,1,0,1 -Kama Sutra: A Tale of Love,1996,114,3,5.5,1491,R,0,0,0,1,1,2 -Kangaroo Jack,2003,89,60,3.9,3661,PG,0,0,1,0,0,1 -Kansas City,1996,116,19,5.8,1077,R,0,0,0,1,0,1 -Karakter,1997,122,4.5,7.7,2687,R,0,0,0,1,0,1 -Kate & Leopold,2001,123,48,6.3,8060,PG-13,0,0,1,0,1,2 -Keane,2004,100,0.85,6.3,34,R,0,0,0,1,0,1 -Keeping the Faith,2000,128,30,6.8,11351,PG-13,0,0,1,1,1,3 -Kicked in the Head,1997,87,4,4.2,271,R,0,0,1,1,0,2 -"Kid, The",2000,104,65,6.1,5418,PG,0,0,1,1,0,2 -Kill Bill: Vol. 1,2003,111,55,8.3,65026,R,1,0,0,1,0,2 -Kill Bill: Vol. 2,2004,136,30,8.3,44189,R,1,0,0,1,0,2 -Killers,1997,86,0.1,2.8,127,R,1,0,0,0,0,1 -Killing Me Softly,2002,104,25,5.4,1771,R,0,0,0,1,0,1 -Kimberly,1999,106,2,5.3,231,R,0,0,1,0,1,2 -King Arthur,2004,140,90,6,14272,R,1,0,0,1,0,2 -Kingdom of Heaven,2005,145,130,7,6498,R,1,0,0,1,0,2 -Kingpin,1996,117,25,6.6,10643,PG-13,0,0,1,0,0,1 -Kinsey,2004,118,11,7.6,3225,R,0,0,0,1,0,1 -Kiss of the Dragon,2001,98,25,6.2,7887,R,1,0,0,1,0,2 -Kiss the Girls,1997,111,27,6.4,9041,R,0,0,0,1,0,1 -Kiss the Sky,1999,107,6,5.6,263,R,0,0,0,0,1,1 -Kissing Jessica Stein,2001,97,1,7,4236,R,0,0,1,0,1,2 -"Knight's Tale, A",2001,132,41,6.5,15006,PG-13,1,0,1,0,0,2 -Knock Off,1998,91,35,3.8,1947,R,1,0,0,0,0,1 -Kundun,1997,128,28,7.1,4306,PG-13,0,0,0,1,0,1 -Kung Pow: Enter the Fist,2002,82,10,5.1,5871,PG-13,1,0,1,0,0,2 -"Ladykillers, The",2004,104,35,6.4,10580,R,0,0,1,0,0,1 -Lake Placid,1999,82,27,5.2,7836,R,1,0,1,0,0,2 -Lana's Rain,2002,107,0.215,7.1,56,R,0,0,0,1,0,1 -Lara Croft Tomb Raider: The Cradle of Life,2003,117,90,5.2,9103,PG-13,1,0,0,0,0,1 -Lara Croft: Tomb Raider,2001,100,80,5.2,21861,PG-13,1,0,0,0,0,1 -Lashou shentan,1992,131,4.5,7.9,6568,R,1,0,0,1,0,2 -"Last Castle, The",2001,131,60,6.4,7233,R,1,0,0,1,0,2 -Last Man Standing,1996,101,67,5.7,6751,R,1,0,0,1,0,2 -Last Orders,2001,109,12,7.1,1583,R,0,0,0,1,0,1 -"Last Patrol, The",2000,95,8.2,2.9,236,PG-13,1,0,0,1,0,2 -"Last Picture Show, The",1971,118,1.3,8,5340,R,0,0,0,1,0,1 -"Last Resort, The",1997,86,5,5,62,PG-13,1,0,0,0,0,1 -"Last Samurai, The",2003,154,100,7.9,31668,R,1,0,0,1,0,2 -"Last Time I Committed Suicide, The",1997,92,4,5.3,530,R,0,0,0,1,0,1 -Latter Days,2003,107,0.85,7.3,1396,R,0,0,1,1,1,3 -Lawn Dogs,1997,101,8,7.5,1856,R,0,0,0,1,0,1 -Laws of Attraction,2004,90,28,5.7,2349,PG-13,0,0,1,0,1,2 -"League of Extraordinary Gentlemen, The",2003,110,78,5.4,15647,PG-13,1,0,0,0,0,1 -"Learning Curve, The",2001,113,1,5.2,177,R,0,0,0,1,0,1 -Leaving Las Vegas,1995,111,4,7.5,18027,R,0,0,0,1,1,2 -Legally Blonde,2001,96,18,6.4,17572,PG-13,0,0,1,0,0,1 -"Legally Blonde 2: Red, White & Blonde",2003,95,45,4.4,6293,PG-13,0,0,1,0,0,1 -"Legend of Bagger Vance, The",2000,126,60,6.4,7123,PG-13,0,0,1,1,1,3 -"Leggenda del pianista sull'oceano, La",1998,120,9,7.6,3599,R,0,0,0,1,0,1 -Legion of the Dead,2001,92,2.7,3.4,374,R,0,0,1,0,0,1 -Legionnaire,1998,98,35,4.5,1773,R,1,0,0,0,0,1 -Lemony Snicket's A Series of Unfortunate Events,2004,108,125,6.7,8402,PG,0,0,1,0,0,1 -"Lengua asesina, La",1996,98,4,4,244,R,0,0,1,0,0,1 -Lethal Weapon 4,1998,127,140,6.3,17758,R,1,0,1,0,0,2 -Levity,2003,100,7.5,6.4,1459,R,0,0,0,1,0,1 -Liar Liar,1997,86,45,6.5,22969,PG-13,0,0,1,0,0,1 -Liberty Stands Still,2002,92,11,5.6,1560,R,0,0,0,1,0,1 -Life,1999,108,75,5.8,4857,R,0,0,1,1,0,2 -"Life Aquatic with Steve Zissou, The",2004,118,25,7.3,9170,R,0,0,1,1,0,2 -"Life Less Ordinary, A",1997,103,12,6.4,8209,R,0,0,1,1,1,3 -Life as a House,2001,127,18,7.5,7696,R,0,0,1,1,0,2 -"Life of David Gale, The",2003,130,50,7.1,10580,R,0,0,0,1,0,1 -Light It Up,1999,99,13,5.7,856,R,0,0,0,1,0,1 -Like Mike,2002,99,30,4.9,1484,PG,0,0,1,0,0,1 -Lilo & Stitch,2002,86,80,7.3,10944,PG,0,1,1,1,0,3 -Limbo,1999,126,8.3,7.1,2063,R,0,0,0,1,0,1 -"Limey, The",1999,89,9,7.2,7732,R,0,0,0,1,0,1 -Little Black Book,2004,111,35,4.7,1894,PG-13,0,0,1,1,1,3 -Little Nicky,2000,90,80,4.9,9485,PG-13,0,0,1,0,1,2 -Little Secrets,2001,97,2.5,6.9,457,PG,0,0,0,1,0,1 -"Little Vampire, The",2000,91,22,5.6,601,PG,0,0,1,0,0,1 -Living Out Loud,1998,103,12,6.5,1774,R,0,0,1,1,1,3 -"Lizzie McGuire Movie, The",2003,94,17,5,2541,PG,0,0,1,0,0,1 -Lolita,1997,137,58,6.8,5757,R,0,0,0,1,1,2 -Lone Star,1996,135,5,7.7,8518,R,0,0,0,1,0,1 -"Long Kiss Goodnight, The",1996,120,65,6.5,12516,R,1,0,0,1,0,2 -Looney Tunes: Back in Action,2003,91,80,6.1,2559,PG,1,1,1,0,0,3 -"Lord of the Rings: The Fellowship of the Ring, The",2001,208,93,8.8,157608,PG-13,1,0,0,0,0,1 -"Lord of the Rings: The Return of the King, The",2003,251,94,9,103631,PG-13,1,0,0,0,0,1 -"Lord of the Rings: The Two Towers, The",2002,223,94,8.8,114797,PG-13,1,0,0,0,0,1 -Loser,2000,92,20,5.1,5152,PG-13,0,0,1,0,1,2 -Losing Isaiah,1995,111,17,6.1,794,R,0,0,0,1,0,1 -"Loss of Sexual Innocence, The",1999,106,4,5.3,977,R,0,0,0,1,0,1 -Lost Highway,1997,135,15,7.3,15936,R,0,0,0,1,0,1 -"Lost World: Jurassic Park, The",1997,129,73,5.5,28055,PG-13,1,0,0,0,0,1 -Lost in Space,1998,130,80,4.7,15209,PG-13,1,0,0,0,0,1 -Lost in Translation,2003,102,4,8,42450,R,0,0,1,1,0,2 -"Lot Like Love, A",2005,107,30,4.6,786,PG-13,0,0,1,1,1,3 -Love & Basketball,2000,124,15,6.7,2093,PG-13,0,0,0,1,1,2 -"Love Letter, The",1999,88,15,5.2,1258,PG-13,0,0,1,1,0,2 -Love Liza,2002,90,1,6.6,1588,R,0,0,0,1,0,1 -Love Object,2003,88,1,6.3,427,R,0,0,1,0,0,1 -Love Stinks,1999,94,4,5.3,1311,R,0,0,1,0,0,1 -Love Story,1970,99,2.2,6.2,2844,PG,0,0,0,1,1,2 -Love and Other Catastrophes,1996,78,0.25,6.5,783,R,0,0,1,0,1,2 -Love's Labour's Lost,2000,93,13,5.9,1254,PG,0,0,1,0,1,2 -Lovely & Amazing,2001,91,0.25,6.9,1813,R,0,0,1,1,0,2 -Lover Girl,1997,87,1,5.3,102,R,0,0,1,1,0,2 -Lucky 13,2004,95,1.2,5.7,151,R,0,0,1,0,1,2 -Lucky Break,2001,108,6,6.3,707,PG-13,0,0,1,0,0,1 -Lucky Numbers,2000,105,65,5,2396,R,0,0,1,0,0,1 -Luminarias,2000,100,1,2.7,381,R,0,0,1,0,1,2 -"Lunes al sol, Los",2002,113,4,7.8,1466,R,0,0,0,1,0,1 -MASH,1970,112,3.5,7.8,14829,R,0,0,1,1,0,2 -Mad City,1997,115,50,6,3965,PG-13,0,0,0,1,0,1 -Made,2001,94,5,6.5,4487,R,0,0,1,1,0,2 -Magnolia,1999,188,37,8,45992,R,0,0,0,1,0,1 -Maid in Manhattan,2002,105,55,4.6,12237,PG-13,0,0,1,0,1,2 -"Majestic, The",2001,156,72,6.7,8649,PG,0,0,0,1,1,2 -Malibu's Most Wanted,2003,86,16,4.9,2099,PG-13,0,0,1,0,0,1 -Mallrats,1995,94,6.1,7.1,22837,R,0,0,1,1,0,2 -"Man Apart, A",2003,110,36,5.4,4231,R,1,0,0,1,0,2 -"Man Who Wasn't There, The",2001,118,20,7.7,17028,R,0,0,1,1,0,2 -"Man from Elysian Fields, The",2001,106,6.5,6.8,1198,R,0,0,0,1,0,1 -"Man in the Iron Mask, The",1998,132,35,6,11127,PG-13,1,0,0,1,0,2 -Man of the House,2005,97,40,5.2,511,PG-13,1,0,1,0,0,2 -Man on Fire,2004,146,70,7.4,14358,R,1,0,0,1,0,2 -Man on the Moon,1999,118,52,7.3,19826,R,0,0,1,1,0,2 -Man-Thing,2005,96,30,3.8,163,R,1,0,0,0,0,1 -Manny & Lo,1996,88,0.5,6.9,395,R,0,0,0,1,0,1 -"Maquinista, El",2004,102,5,7.7,4322,R,0,0,0,1,0,1 -Marci X,2003,80,20,2.8,741,R,0,0,1,0,0,1 -Mars Attacks!,1996,106,70,6.1,27363,PG-13,1,0,1,0,0,2 -Marvin's Room,1996,98,23,6.5,4005,PG-13,0,0,1,1,0,2 -Mary Reilly,1996,108,47,5.5,2806,R,0,0,0,1,0,1 -"Mask of Zorro, The",1998,136,65,6.8,18220,PG-13,1,0,1,0,1,3 -Master and Commander: The Far Side of the World,2003,138,150,7.5,21328,PG-13,1,0,0,1,0,2 -"Master of Disguise, The",2002,80,16,2.9,3903,PG,0,0,1,0,0,1 -Matilda,1996,102,36,6.5,4351,PG,0,0,1,1,0,2 -"Matrix Reloaded, The",2003,138,127,7.1,57225,R,1,0,0,0,0,1 -"Matrix Revolutions, The",2003,125,110,6.3,40058,R,1,0,0,0,0,1 -"Matrix, The",1999,136,63,8.5,143853,R,1,0,0,0,0,1 -Max Keeble's Big Move,2001,86,12,5.3,587,PG,0,0,1,0,0,1 -May,2002,93,1.7,6.8,3324,R,0,0,0,1,0,1 -Mayerling,1968,140,5,5.6,154,PG-13,0,0,0,1,1,2 -McHale's Navy,1997,108,42,3.7,1758,PG,0,0,1,0,0,1 -"Me, Myself & Irene",2000,116,51,6,21305,R,0,0,1,0,0,1 -Mean Creek,2004,89,0.5,7.3,2094,R,0,0,0,1,0,1 -Mean Girls,2004,97,17,7,11591,PG-13,0,0,1,1,0,2 -"Medallion, The",2003,88,41,4.5,2765,PG-13,1,0,1,0,0,2 -Meet Joe Black,1998,178,90,6.6,16796,PG-13,0,0,0,1,1,2 -Meet the Deedles,1998,93,24,3.4,443,PG,0,0,1,0,0,1 -Meet the Fockers,2004,115,80,6.5,11950,PG-13,0,0,1,0,0,1 -Meet the Parents,2000,108,55,7,30804,PG-13,0,0,1,0,0,1 -Memento,2000,113,5,8.7,90317,R,0,0,0,1,0,1 -Men in Black,1997,98,90,6.8,53231,PG-13,1,0,1,0,0,2 -Men in Black II,2002,88,140,5.6,21580,PG-13,1,0,1,0,0,2 -Men of Honor,2000,129,32,6.6,9684,R,0,0,0,1,0,1 -Men of War,1994,99,12,4.6,397,R,1,0,0,1,0,2 -Men with Brooms,2002,102,7.5,5.9,1096,R,0,0,1,1,1,3 -Menace II Society,1993,97,3.5,7.3,4704,R,1,0,0,1,0,2 -"Merchant of Venice, The",2004,138,30,7.3,1400,R,0,0,1,1,0,2 -Mercury Rising,1998,108,60,5.6,8202,R,1,0,0,1,0,2 -Mercy Streets,2000,106,0.6,4.6,149,PG-13,1,0,0,1,0,2 -Message in a Bottle,1999,126,30,5.4,5582,PG-13,0,0,0,1,1,2 -Metoroporisu,2001,107,14.5,7.3,3380,PG-13,1,1,0,1,1,4 -Metro,1997,117,55,5.2,3560,R,1,0,1,1,0,3 -"Mexican, The",2001,123,38,6,13935,R,0,0,1,0,1,2 -Mickey,2004,90,6,5.4,52,PG,0,0,0,1,0,1 -Mickey Blue Eyes,1999,102,40,5.8,7247,PG-13,0,0,1,0,1,2 -Midnight in the Garden of Good and Evil,1997,155,30,6.4,8517,R,0,0,0,1,0,1 -Mighty Aphrodite,1995,95,15,7,7083,R,0,0,1,0,0,1 -Million Dollar Baby,2004,132,30,8.3,20195,PG-13,0,0,0,1,0,1 -"Million Dollar Hotel, The",2000,122,8,5.5,4746,R,0,0,0,1,0,1 -Mindhunters,2004,102,27,6.3,3925,R,1,0,0,0,0,1 -"Minion, The",1998,95,12,3.2,338,R,1,0,0,0,0,1 -Minority Report,2002,145,102,7.8,51199,PG-13,1,0,0,1,0,2 -"Mirror Has Two Faces, The",1996,122,42,5.7,2775,PG-13,0,0,1,1,1,3 -Miss Congeniality,2000,109,45,6.2,16235,PG-13,0,0,1,0,0,1 -Mission: Impossible,1996,110,75,6.6,33496,PG-13,1,0,0,0,0,1 -Mission: Impossible II,2000,123,125,5.7,35958,PG-13,1,0,0,0,0,1 -Modigliani,2004,128,12,7,155,R,0,0,0,1,0,1 -Molly,1999,102,21,5.5,610,PG-13,0,0,1,1,1,3 -"Molly Maguires, The",1970,124,11,6.6,455,PG,0,0,0,1,0,1 -Mona Lisa Smile,2003,117,65,6.1,6838,PG-13,0,0,1,1,1,3 -Money Talks,1997,97,25,5.5,2720,R,1,0,1,0,0,2 -Money Train,1995,103,68,5.1,5081,R,1,0,1,1,0,3 -Monkeybone,2001,92,75,4.7,3112,PG-13,0,1,1,0,0,2 -Monsoon Wife,2004,92,1,4.7,15,R,0,0,0,1,0,1 -Monster,2003,109,8,7.4,12306,R,0,0,0,1,0,1 -Monster's Ball,2001,112,4,7.3,15037,R,0,0,0,1,1,2 -Monster-in-Law,2005,102,60,5.6,147,PG-13,0,0,1,0,1,2 -Montana,1998,92,4,6.1,417,R,1,0,0,1,0,2 -Moonlight Mile,2002,117,20,6.9,3479,PG-13,0,0,0,1,1,2 -Mortal Kombat,1995,101,20,5,8779,PG-13,1,0,0,0,0,1 -Mortal Kombat: Annihilation,1997,91,30,3,5799,PG-13,1,0,0,0,0,1 -Mother Night,1996,114,5.5,7.1,1232,R,0,0,0,1,1,2 -Moulin Rouge!,2001,127,52.5,7.7,47689,PG-13,0,0,0,1,1,2 -Mousehunt,1997,99,38,5.8,4637,PG,1,0,1,0,0,2 -Mr 3000,2004,104,30,5.7,1459,PG-13,0,0,1,1,0,2 -Mr. Deeds,2002,96,50,5.5,11729,PG-13,0,0,1,0,1,2 -Mrs. Winterbourne,1996,105,25,5.8,1310,PG-13,0,0,1,0,1,2 -"Mudge Boy, The",2003,94,0.8,6.8,204,R,0,0,0,1,0,1 -Muertos de risa,1999,111,3.5,6.3,334,R,0,0,1,0,0,1 -Mulholland Dr.,2001,147,15,7.9,35504,R,0,0,0,1,0,1 -Multiplicity,1996,117,45,5.7,5241,PG-13,0,0,1,0,0,1 -Mumford,1999,112,28,6.9,3384,R,0,0,1,1,0,2 -"Mummy Returns, The",2001,130,98,6.1,23551,PG-13,1,0,0,0,0,1 -"Mummy, The",1999,124,76,6.5,36216,PG-13,1,0,1,0,0,2 -Muriel's Wedding,1994,106,3,7.1,6685,R,0,0,1,0,1,2 -"Muse, The",1999,97,15,5.6,3513,PG-13,0,0,1,0,0,1 -Music of the Heart,1999,124,27,6.6,2348,PG,0,0,0,1,0,1 -"Musketeer, The",2001,104,40,4.4,3966,PG-13,1,0,0,1,1,3 -Mutant Aliens,2001,81,0.2,6.4,223,R,0,1,1,0,0,2 -Mute Witness,1994,95,2,6.8,1202,R,0,0,1,0,0,1 -My Best Friend's Wedding,1997,105,46,6.4,16648,PG-13,0,0,1,0,1,2 -My Big Fat Greek Wedding,2002,95,5,6.9,21675,PG,0,0,1,0,1,2 -My Boss's Daughter,2003,90,14,4.1,2765,R,0,0,1,0,1,2 -My Cousin Vinny,1992,120,11,7.2,10877,R,0,0,1,0,0,1 -My Dog Skip,2000,95,7,7.1,3109,PG,0,0,0,1,0,1 -My Family,1995,128,5.5,7,859,R,0,0,0,1,0,1 -My Favorite Martian,1999,93,60,4.5,1942,PG,0,0,1,0,0,1 -My Fellow Americans,1996,101,21.5,6.3,2752,PG-13,0,0,1,0,0,1 -My Life's in Turnaround,1993,84,0.022,3.9,196,R,0,0,1,0,0,1 -Mystery Men,1999,121,68,5.8,13331,PG-13,1,0,1,0,0,2 -"Mystery, Alaska",1999,119,28,6.4,5440,R,0,0,1,1,0,2 -"Mystic Masseur, The",2001,117,2.5,5.2,157,PG,0,0,0,1,0,1 -Mystic River,2003,137,30,8,28969,R,0,0,0,1,0,1 -Nadja,1994,93,1,5.7,781,R,0,0,0,1,0,1 -Napoleon Dynamite,2004,86,0.4,7.2,17524,PG,0,0,1,0,0,1 -Narc,2002,105,7.5,7.3,7185,R,0,0,0,1,0,1 -National Treasure,2004,131,100,6.6,12361,PG,1,0,0,0,0,1 -"Negotiator, The",1998,139,50,7.2,19100,R,1,0,0,1,0,2 -"Net, The",1995,114,22,5.6,12201,PG-13,1,0,0,1,0,2 -Never Again,2001,98,0.5,5.7,309,R,0,0,1,0,1,2 -"New Guy, The",2002,89,13,5.2,4266,PG-13,0,0,1,0,0,1 -New Jersey Drive,1995,98,5,5.4,348,R,0,0,0,1,0,1 -"Newton Boys, The",1998,113,27,5.7,2003,PG-13,1,0,0,1,0,2 -"Next Best Thing, The",2000,108,25,4.7,3131,PG-13,0,0,1,1,0,2 -Next Friday,2000,98,9.5,5.2,3457,R,0,0,1,0,0,1 -Next Stop Wonderland,1998,104,1,6.7,1467,R,0,0,1,1,1,3 -Nicholas Nickleby,2002,132,10,7.4,1651,PG,0,0,0,1,0,1 -Nil by Mouth,1997,128,9,6.9,1159,R,0,0,0,1,0,1 -Nixon,1995,212,50,6.8,5837,R,0,0,0,1,0,1 -No Code of Conduct,1998,95,12,4.4,314,R,1,0,0,1,0,2 -No Looking Back,1998,96,5,5.6,622,R,0,0,1,1,1,3 -No Way Home,1996,99,4,6.6,328,R,0,0,0,1,0,1 -Nochnoy dozor,2004,115,4.2,6.3,1020,R,1,0,0,0,0,1 -Northfork,2003,103,1.9,6.2,1521,PG-13,0,0,0,1,0,1 -Not Another Teen Movie,2001,89,16,5.2,10295,R,0,0,1,0,0,1 -"Notebook, The",2004,123,30,7.8,8830,PG-13,0,0,0,1,1,2 -Notting Hill,1999,124,42,7,27285,PG-13,0,0,1,1,1,3 -November,2004,73,0.3,2.8,164,R,0,0,0,1,0,1 -Novocaine,2001,95,6,5.9,2829,R,0,0,1,1,0,2 -Nueve reinas,2000,114,1.5,7.6,3721,R,0,0,0,1,0,1 -Nurse Betty,2000,110,24,6.6,10441,R,0,0,1,1,1,3 -Nutty Professor II: The Klumps,2000,109,84,4.5,5825,PG-13,0,0,1,0,0,1 -"Nutty Professor, The",1996,95,54,5.8,12273,PG-13,0,0,1,0,1,2 -O,2001,95,5,6.3,4555,R,0,0,0,1,1,2 -"O Brother, Where Art Thou?",2000,106,26,7.8,37961,PG-13,0,0,1,0,0,1 -"Object of My Affection, The",1998,111,15,6,4027,R,0,0,1,1,1,3 -Ocean's Eleven,2001,116,85,7.5,44662,PG-13,0,0,1,0,0,1 -Ocean's Twelve,2004,125,110,6,14797,PG-13,0,0,1,0,0,1 -Office Space,1999,89,10,7.7,26134,R,0,0,1,0,0,1 -Old School,2003,92,24,6.7,14283,R,0,0,1,0,0,1 -On the Border,1998,103,3,4.8,165,R,0,0,0,1,0,1 -On the Line,2001,85,10,4.1,1013,PG,0,0,1,0,1,2 -Once Upon a Time in America,1984,227,30,8.2,19292,R,0,0,0,1,0,1 -Once Upon a Time in Mexico,2003,102,29,6,14732,R,1,0,0,0,0,1 -One Eight Seven,1997,119,23,6.3,2958,R,0,0,0,1,0,1 -One Eyed King,2001,105,6.5,5.1,81,R,0,0,0,1,0,1 -One Hell of a Christmas,2002,94,0.4,2.7,70,R,0,0,1,0,0,1 -One Hour Photo,2002,96,12,7.1,17130,R,0,0,0,1,0,1 -One Night Stand,1997,102,24,5.7,1709,R,0,0,0,1,0,1 -One True Thing,1998,127,30,7,2534,R,0,0,0,1,0,1 -Onegin,1999,106,14,6.3,1327,R,0,0,0,1,1,2 -Open Range,2003,139,26,7.5,8799,R,0,0,0,1,0,1 -Open Water,2003,79,0.13,6.1,7204,R,0,0,0,1,0,1 -Orange County,2002,82,18,6.1,8526,PG-13,0,0,1,1,0,2 -Original Gangstas,1996,99,4.8,5.3,216,R,0,0,0,1,0,1 -Original Sin,2001,116,26,5.5,4592,R,0,0,0,1,1,2 -Osama,2003,83,0.046,7.5,1546,PG-13,0,0,0,1,0,1 -Osmosis Jones,2001,95,75,6.2,3410,PG,0,1,1,0,0,2 -Othello,1995,123,11,6.8,1852,R,0,0,0,1,0,1 -"Other Side of Heaven, The",2001,113,7,6.5,683,PG,0,0,0,1,0,1 -"Others, The",2001,104,17,7.8,36914,PG-13,0,0,0,1,0,1 -"Otra conquista, La",1998,106,3.5,6.7,140,R,0,0,0,1,0,1 -Out Cold,2001,92,11,5.2,1990,PG-13,0,0,1,0,0,1 -Out for a Kill,2003,88,20,3,818,R,1,0,0,0,0,1 -Out of Reach,2004,88,20,3.7,399,R,1,0,0,1,1,3 -Out-of-Sync,1995,105,1.5,4.7,37,R,0,0,0,1,0,1 -"Out-of-Towners, The",1999,90,40,5,2919,PG-13,0,0,1,0,0,1 -Outbreak,1995,127,50,6.4,13796,R,0,0,0,1,0,1 -Outside Providence,1999,96,7,6.1,2735,R,0,0,1,1,1,3 -"Outsiders, The",1983,91,10,6.8,7125,PG-13,0,0,0,1,0,1 -Overnight Delivery,1998,87,12,5.9,1229,PG-13,0,0,1,0,1,2 -Owning Mahowny,2003,104,10,7,1999,R,0,0,0,1,0,1 -P.S. Your Cat Is Dead,2002,88,2,4.7,185,R,0,0,1,0,0,1 -"Pacifier, The",2005,95,56,4.9,2179,PG,1,0,1,0,0,2 -"Packing Suburbia, A",1999,90,0.04,4.5,38,R,0,0,0,1,0,1 -Paint Your Wagon,1969,158,20,6.5,2011,PG-13,0,0,1,0,0,1 -Pandaemonium,2000,124,15,6.2,244,PG-13,0,0,0,1,0,1 -Panic,2000,88,1,6.9,2524,R,0,0,1,1,0,2 -Panic Room,2002,113,48,7,24302,R,0,0,0,1,0,1 -Paparazzi,2004,84,20,5.6,2028,PG-13,0,0,0,1,0,1 -Party Monster,2003,98,5,5.8,1976,R,0,0,0,1,0,1 -"Passion of the Christ, The",2004,127,30,7.4,34046,R,0,0,0,1,0,1 -Patch Adams,1998,115,50,6.1,12110,PG-13,0,0,1,1,0,2 -"Patriot, The",2000,164,110,6.8,29665,R,1,0,0,1,0,2 -Pavilion of Women,2001,111,5,5.3,209,R,0,0,0,1,0,1 -Pay It Forward,2000,123,40,6.7,13531,PG-13,0,0,0,1,1,2 -Paycheck,2003,119,60,6.1,10383,PG-13,1,0,0,0,0,1 -"Peacekeeper, The",1997,98,10,4.6,505,R,1,0,0,0,0,1 -"Peacemaker, The",1997,124,50,5.9,8994,R,1,0,0,0,0,1 -Pearl Harbor,2001,184,135.25,5.4,33409,R,1,0,0,1,1,3 -Pecker,1998,87,6,6.4,4013,R,0,0,1,0,0,1 -Pep Squad,1998,94,0.5,4.4,120,R,0,0,1,0,0,1 -"Perez Family, The",1995,113,11,6,517,R,0,0,1,1,1,3 -"Perfect Storm, The",2000,130,120,6.2,24946,PG-13,1,0,0,1,0,2 -Perfect Target,1997,89,3.5,4.2,55,R,1,0,0,0,0,1 -"Pest, The",1997,84,17,3.8,1405,PG-13,0,0,1,0,0,1 -Peter Pan,2003,113,100,7.2,5596,PG,1,0,0,0,0,1 -"Phantom of the Opera, The",2004,143,60,7.2,11283,PG-13,0,0,0,1,1,2 -"Phantom, The",1996,100,45,5,3329,PG,1,0,0,0,0,1 -Phenomenon,1996,123,32,6.3,12075,PG,0,0,0,1,1,2 -"Pianist, The",2002,150,35,8.5,30467,R,0,0,0,1,0,1 -Picture Perfect,1997,105,19,5.6,3019,PG-13,0,0,1,0,1,2 -Pieces of April,2003,80,0.3,7.3,4604,PG-13,0,0,1,1,0,2 -Pirates of the Caribbean: The Curse of the Black Pearl,2003,143,125,8,60812,PG-13,1,0,1,0,0,2 -Planet of the Apes,2001,119,100,5.6,28601,PG-13,1,0,0,0,0,1 -Play It to the Bone,1999,124,24,5.1,2645,R,0,0,1,1,0,2 -Playing by Heart,1998,121,14,7.1,4958,R,0,0,0,1,1,2 -Pleasantville,1998,124,40,7.5,22561,PG-13,0,0,1,1,0,2 -"Pledge, The",2001,123,45,6.9,9852,R,0,0,0,1,0,1 -"Point Men, The",2001,88,6.1,4.6,266,R,1,0,0,0,0,1 -Pollock,2000,132,6,7.1,4013,R,0,0,0,1,0,1 -Poolhall Junkies,2002,94,4,6.6,1411,R,0,0,0,1,0,1 -Pootie Tang,2001,70,3,4.1,1921,PG-13,1,0,1,0,0,2 -Possums,1998,97,1.4,5.3,66,PG,0,0,1,1,0,2 -"Postino, Il",1994,108,3,7.6,8342,PG,0,0,1,1,1,3 -"Powerpuff Girls, The",2002,73,10,6.2,1334,PG,1,1,1,0,0,3 -Practical Magic,1998,103,60,5.4,7786,PG-13,0,0,0,1,1,2 -Price of Glory,2000,118,10,6.2,265,PG-13,0,0,0,1,0,1 -Primal Fear,1996,129,30,7.5,12467,R,0,0,0,1,0,1 -Primary Colors,1998,143,65,6.8,7756,R,0,0,1,1,0,2 -Primer,2004,77,0.007,6.4,1466,PG-13,0,0,0,1,0,1 -"Prince of Egypt, The",1998,99,60,6.9,9212,PG,0,1,0,1,0,2 -Private Parts,1997,109,20,6.6,9289,R,0,0,1,1,0,2 -Proof of Life,2000,135,65,6.3,9592,R,1,0,0,1,0,2 -Prozac Nation,2001,99,9,6.2,940,R,0,0,0,1,0,1 -Pulp Fiction,1994,168,8,8.8,132745,R,0,0,0,1,0,1 -Punch-Drunk Love,2002,95,25,7.5,18169,R,0,0,1,1,1,3 -"Punisher, The",2004,124,33,6.2,9989,R,1,0,0,0,0,1 -Pushing Tin,1999,119,33,5.9,7528,R,0,0,1,1,0,2 -Queen's Messenger II,2001,90,4,6,27,R,1,0,0,0,0,1 -"Quiet American, The",2002,101,30,7.4,5957,R,0,0,0,1,1,2 -"R.M., The",2003,101,0.5,5.3,213,PG,0,0,1,0,0,1 -Rabbit-Proof Fence,2002,94,6,7.7,5079,PG,0,0,0,1,0,1 -Rachel's Attic,2002,112,0.083,2.4,58,R,1,0,0,1,0,2 -Radio,2003,109,35,6.9,3594,PG,0,0,0,1,0,1 -"Rainbow Thief, The",1990,87,10,6,49,R,0,0,0,1,0,1 -"Rainmaker, The",1997,135,40,6.8,8620,PG-13,0,0,0,1,0,1 -Raise Your Voice,2004,103,15,4.3,1626,PG,0,0,0,1,1,2 -Raising Victor Vargas,2002,88,0.8,6.7,1785,R,0,0,1,1,1,3 -Raising the Stakes,1999,88,0.1,4.7,24,R,0,0,0,1,1,2 -Rancid Aluminium,2000,88,12,3.5,352,R,0,0,0,1,0,1 -Random Hearts,1999,133,64,4.8,5919,R,0,0,0,1,1,2 -Ransom,1996,139,80,6.6,17678,R,1,0,0,1,0,2 -Rare Birds,2001,99,5,6.4,471,R,0,0,1,1,0,2 -Rat Race,2001,112,48,6.5,13913,PG-13,0,0,1,0,0,1 -Ravenous,1999,108,12,6.7,5915,R,0,0,1,1,0,2 -Real Women Have Curves,2002,87,3,7,1944,PG-13,0,0,1,1,0,2 -Rebel Without a Cause,1955,111,1.5,7.8,11055,PG-13,0,0,0,1,0,1 -"Red Baron, The",1971,97,0.9,4.9,120,PG-13,1,0,0,1,0,2 -Red Planet,2000,106,75,5.3,8623,PG-13,1,0,0,0,0,1 -Reign of Fire,2002,101,95,5.8,11452,PG-13,1,0,0,0,0,1 -Reindeer Games,2000,124,36,5.5,7120,R,1,0,0,1,0,2 -Remember the Titans,2000,113,30,7.4,14195,PG,0,0,0,1,0,1 -"Replacement Killers, The",1998,87,30,5.8,6825,R,1,0,0,0,0,1 -"Replacements, The",2000,114,50,6.2,7617,PG-13,0,0,1,0,0,1 -Repli-Kate,2002,121,4,5.6,791,R,0,0,1,0,0,1 -Requiem for a Dream,2000,102,4.5,8.4,47845,R,0,0,0,1,0,1 -Resident Evil,2002,100,35,6.2,18978,R,1,0,0,0,0,1 -Resident Evil: Apocalypse,2004,94,50,5.6,10486,R,1,0,0,0,0,1 -Restoration,1995,117,18,6.6,1874,R,0,0,0,1,0,1 -Resurrection Man,1998,102,4,4.6,214,R,0,0,0,1,0,1 -Return to Me,2000,115,24,6.9,5057,PG,0,0,1,1,1,3 -Revelation,1999,98,5,4.5,203,PG-13,1,0,0,1,0,2 -Riders,2002,83,15,5.1,922,R,1,0,0,0,0,1 -Riding in Cars with Boys,2001,132,48,6.2,4627,PG-13,0,0,1,1,0,2 -"Ring, The",2002,115,45,7.4,30687,PG-13,0,0,0,1,0,1 -Ripley's Game,2002,112,30,6.6,2680,R,0,0,0,1,0,1 -Road Trip,2000,94,15.6,6.3,15981,R,0,0,1,0,0,1 -"Road to El Dorado, The",2000,89,95,6.3,2838,PG,1,1,1,0,0,3 -Road to Perdition,2002,117,80,7.7,30526,R,0,0,0,1,0,1 -Rob Roy,1995,133,28,6.8,6652,R,1,0,0,1,1,3 -Robots,2005,91,75,6.4,4089,PG,0,1,1,0,0,2 -Rock 'n' Roll Frankenstein,1999,88,0.25,4.3,66,R,0,0,1,0,0,1 -Rock Star,2001,105,38,5.8,5100,R,0,0,1,1,0,2 -"Rock, The",1996,136,75,7,46184,R,1,0,0,1,0,2 -Rollerball,2002,97,70,2.8,5328,R,1,0,0,0,0,1 -Romeo + Juliet,1996,120,14.5,6.7,22306,PG-13,1,0,0,1,1,3 -Romeo Must Die,2000,115,25,5.8,10229,R,1,0,0,1,0,2 -Ronin,1998,121,55,7,21982,R,1,0,0,0,0,1 -"Room, The",2003,99,6,2.7,81,R,0,0,1,1,1,3 -Rosewood,1997,140,31,6.8,1840,R,1,0,0,1,0,2 -Rounders,1998,121,12,7.2,13621,R,0,0,0,1,0,1 -Route 666,2001,86,2.3,4,487,R,1,0,0,0,0,1 -"Royal Tenenbaums, The",2001,111,21,7.6,31227,R,0,0,1,1,0,2 -Rugrats Go Wild!,2003,81,25,4.8,423,PG,0,1,1,0,0,2 -"Rules of Attraction, The",2002,110,4,6.7,8552,R,0,0,1,1,1,3 -Rules of Engagement,2000,128,60,6.3,7903,R,0,0,0,1,0,1 -Runaway Bride,1999,116,70,5.4,12624,PG,0,0,1,0,1,2 -Runaway Jury,2003,127,60,7.1,10761,PG-13,0,0,0,1,0,1 -"Rundown, The",2003,104,85,6.5,8067,PG-13,1,0,1,0,0,2 -Rush Hour,1998,93,35,6.7,18336,PG-13,1,0,1,0,0,2 -Rush Hour 2,2001,86,90,6.5,16581,PG-13,1,0,1,0,0,2 -Rushmore,1998,93,10,7.7,22209,R,0,0,1,1,1,3 -Ryan's Daughter,1970,202,15,7.4,965,R,0,0,0,1,1,2 -S.W.A.T.,2003,117,80,5.9,12732,PG-13,1,0,0,0,0,1 -Sabrina,1995,127,58,6.1,7547,PG,0,0,1,1,1,3 -Safe Men,1998,88,1,6.1,590,R,0,0,1,0,0,1 -Sahara,2005,124,130,5.8,3004,PG-13,1,0,1,0,0,2 -"Saint, The",1997,116,70,5.7,12591,PG-13,1,0,0,0,1,2 -Saints and Soldiers,2003,90,0.78,6.9,689,PG-13,1,0,0,1,0,2 -"Salton Sea, The",2002,107,18,7.2,5070,R,0,0,0,1,0,1 -Samsara,2001,138,3,7.6,636,R,1,0,0,1,1,3 -"Sand Pebbles, The",1966,193,12,7.6,1773,PG-13,0,0,0,1,1,2 -Santa sangre,1989,123,0.787,7.2,1165,R,0,0,0,1,0,1 -Saturn,1999,94,0.35,5.5,43,R,0,0,0,1,0,1 -Savage,1995,99,5,4.1,93,R,1,0,0,0,0,1 -Save the Last Dance,2001,112,13,6.1,7613,PG-13,0,0,0,1,1,2 -Saved!,2004,92,5,7.1,6504,PG-13,0,0,1,1,0,2 -Saving Private Ryan,1998,170,70,8.3,100267,R,1,0,0,1,0,2 -Saving Silverman,2001,96,22,5.4,6684,R,0,0,1,0,1,2 -Savior,1998,104,10,7.2,1775,R,0,0,0,1,0,1 -Say It Isn't So,2001,93,25,4.6,3144,R,0,0,1,0,1,2 -"Scarlet Letter, The",1995,135,50,4.4,2426,R,0,0,0,1,1,2 -Scary Movie,2000,88,19,5.5,23293,R,0,0,1,0,0,1 -Scary Movie 2,2001,83,45,4.2,12035,R,0,0,1,0,0,1 -Scary Movie 3,2003,84,45,5.3,9225,PG-13,0,0,1,0,0,1 -Schindler's List,1993,195,25,8.8,97667,R,0,0,0,1,0,1 -"School of Rock, The",2003,108,20,7.4,16452,PG-13,0,0,1,0,0,1 -Scooby-Doo,2002,86,84,4.8,9618,PG,0,0,1,0,0,1 -"Score, The",2001,124,68,6.8,16106,R,0,0,0,1,0,1 -"Scorpion King, The",2002,92,60,5.3,10111,PG-13,1,0,0,0,0,1 -Screwed,2000,78,10,4.8,1592,PG-13,0,0,1,0,0,1 -Se7en,1995,127,30,8.4,88371,R,0,0,0,1,0,1 -Seabiscuit,2003,141,86,7.5,11552,PG-13,0,0,0,1,0,1 -Search and Destroy,1995,90,4,5,402,R,0,0,1,1,0,2 -Secondhand Lions,2003,120,30,7.4,5543,PG,0,0,1,1,0,2 -Secret Window,2004,96,40,6.3,13260,PG-13,0,0,0,1,0,1 -Secrets & Lies,1996,136,4.5,7.9,7747,R,0,0,1,1,0,2 -See Spot Run,2001,94,16,5,1193,PG,0,0,1,0,0,1 -Seed of Chucky,2004,87,12,5.1,1342,R,0,0,1,0,0,1 -Selena,1997,127,20,6.1,2870,PG,0,0,0,1,0,1 -Sense and Sensibility,1995,136,16.5,7.7,13904,PG,0,0,1,1,1,3 -Serendipity,2001,90,28,6.6,10795,PG-13,0,0,1,0,1,2 -Serial Mom,1994,95,13,6.3,4750,R,0,0,1,0,0,1 -"Serpent's Kiss, The",1997,104,13,5.3,368,R,0,0,0,1,0,1 -Serving Sara,2002,99,29,4.6,2990,PG-13,0,0,1,0,1,2 -Session 9,2001,97,1.5,6.6,3718,R,0,0,0,1,0,1 -Set It Off,1996,123,9,6.1,1619,R,1,0,0,1,0,2 -Seven Years in Tibet,1997,139,70,6.6,9426,PG-13,0,0,0,1,0,1 -Sgt. Bilko,1996,93,39,5.1,3712,PG,0,0,1,0,0,1 -Shade,2003,101,6.8,6.5,1616,R,0,0,0,1,0,1 -Shadow Conspiracy,1997,103,45,4.5,1078,R,1,0,0,0,0,1 -Shaft,2000,99,46,6,13742,R,1,0,0,0,0,1 -Shakes the Clown,1992,87,1.4,5.5,838,R,0,0,1,0,0,1 -Shakespeare in Love,1998,122,25,7.5,41999,R,0,0,1,1,1,3 -Shall We Dance,2004,106,40,6,3479,PG-13,0,0,1,1,1,3 -Shallow Grave,1994,93,2.5,7.4,9401,R,0,0,0,1,0,1 -Shallow Hal,2001,113,40,6.1,13217,PG-13,0,0,1,1,1,3 -Shanghai Knights,2003,114,50,6.3,7279,PG-13,1,0,1,0,0,2 -Shanghai Noon,2000,110,55,6.7,12258,PG-13,1,0,1,0,0,2 -"Shape of Things, The",2003,96,4,6.9,1816,R,0,0,0,1,0,1 -Shark Tale,2004,90,75,5.9,7819,PG,1,1,1,0,0,3 -Shattered Glass,2003,95,6,7.5,4108,PG-13,0,0,0,1,0,1 -Shaun of the Dead,2004,99,4,7.9,18685,R,0,0,1,0,0,1 -"Shawshank Redemption, The",1994,142,25,9.1,149494,R,0,0,0,1,0,1 -She's All That,1999,95,10,5.5,13070,PG-13,0,0,1,0,1,2 -She's So Lovely,1997,100,18,5.7,2280,R,0,0,1,1,1,3 -She's the One,1996,96,3.5,6,3779,R,0,0,1,0,1,2 -Shine,1996,105,5.5,7.6,12425,PG-13,0,0,0,1,1,2 -"Shipping News, The",2001,111,35,6.9,7695,R,0,0,0,1,1,2 -Shooting Fish,1997,103,3,6.6,2701,PG,0,0,1,0,1,2 -"Shot at Glory, A",2000,114,9,6.3,286,R,0,0,0,1,0,1 -Showtime,2002,96,85,5.5,7689,PG-13,1,0,1,0,0,2 -Shrek,2001,90,60,8,65146,PG,0,1,1,0,1,3 -Shrek 2,2004,92,75,7.8,27236,PG,0,1,1,0,0,2 -"Shrink Is In, The",2001,87,6,4.9,319,R,0,0,1,0,1,2 -Sidewalks of New York,2001,108,1,6.5,1998,R,0,0,1,0,1,2 -Sideways,2004,123,16,8,17051,R,0,0,1,1,0,2 -"Siege, The",1998,116,70,5.9,9725,R,1,0,0,1,0,2 -Signs,2002,108,72,7.1,40285,PG-13,0,0,0,1,0,1 -Silent Trigger,1996,90,15,4.7,432,R,1,0,0,1,0,2 -Simon Birch,1998,113,20,6.8,4612,PG,0,0,1,1,0,2 -"Simple Plan, A",1998,121,17,7.6,15398,R,0,0,0,1,0,1 -"Simple Wish, A",1997,89,28,5,423,PG,0,0,1,0,0,1 -Simply Irresistible,1999,94,6,4.7,3083,PG-13,0,0,1,0,1,2 -Sin City,2005,124,45.5,8.3,23473,R,1,0,0,0,0,1 -Sinbad: Legend of the Seven Seas,2003,86,60,6.5,2340,PG,0,1,0,0,0,1 -"Singing Detective, The",2003,109,10,5.3,1184,R,0,0,1,1,0,2 -"Singles Ward, The",2002,102,0.5,5.7,291,PG,0,0,1,1,1,3 -Siunin Wong Fei-hung tsi titmalau,1993,90,2,7.4,3173,PG-13,1,0,1,0,0,2 -Six-String Samurai,1998,91,2,6.2,1163,PG-13,1,0,0,0,0,1 -"Sixth Sense, The",1999,107,55,8.2,96987,PG-13,0,0,0,1,0,1 -Skeletons in the Closet,2000,86,1.5,5.4,239,R,0,0,0,1,0,1 -Skin Deep,2003,89,0.4,3.8,31,R,1,0,1,1,0,3 -"Skulls, The",2000,106,15,5.3,6530,PG-13,0,0,0,1,0,1 -Sky Captain and the World of Tomorrow,2004,106,40,6.5,12579,PG,1,0,0,0,0,1 -Slackers,2002,86,11,4.7,2755,R,0,0,1,0,0,1 -Slam,1998,100,1,7.1,569,R,0,0,0,1,0,1 -Slap Her... She's French,2002,92,10,4.7,811,PG-13,0,0,1,0,0,1 -"Slaughter Rule, The",2002,112,0.5,6,356,R,0,0,0,1,0,1 -Sleepers,1996,147,44,7,17896,R,0,0,0,1,0,1 -"Sleeping Dictionary, The",2003,109,12,6.1,696,R,0,0,0,1,1,2 -Sleepover,2004,89,10,4.1,733,PG,0,0,1,0,0,1 -Slums of Beverly Hills,1998,92,5,6.4,2914,R,0,0,1,1,0,2 -Small Soldiers,1998,110,40,5.8,6938,PG-13,1,0,1,0,0,2 -Small Time Crooks,2000,94,18,6.5,6218,PG,0,0,1,0,1,2 -"Smile Like Yours, A",1997,98,18,4.5,348,R,0,0,1,0,1,2 -Smilla's Sense of Snow,1997,120,35,6.3,3722,R,1,0,0,1,0,2 -Smoke,1995,112,7,7.4,8111,R,0,0,1,1,0,2 -Smoke Signals,1998,88,2,7.2,2665,PG-13,0,0,1,1,0,2 -Snatch.,2000,102,10,7.9,44785,R,0,0,1,0,0,1 -Snitch,1998,90,11,6.2,412,R,1,0,0,1,0,2 -Snow Day,2000,89,13,4.6,1645,PG,0,0,1,0,1,2 -Snow Dogs,2002,99,35,5.1,2379,PG,0,0,1,0,0,1 -Snow Falling on Cedars,1999,127,36,6.7,4536,PG-13,0,0,0,1,0,1 -Soho Square,2000,79,0.007,4.9,45,R,0,0,0,1,0,1 -Sol Goode,2001,99,3,5.4,291,R,0,0,1,0,0,1 -Solaris,2002,99,47,6.3,11808,PG-13,0,0,0,1,1,2 -Soldier,1998,98,75,5.2,5590,R,1,0,0,0,0,1 -Solitaire for 2,1995,106,1.5,4.8,122,R,0,0,1,0,1,2 -Someone Like You...,2001,97,23,5.7,4249,PG-13,0,0,1,0,1,2 -Son of the Mask,2005,94,74,1.9,1785,PG,1,0,1,0,0,2 -Songcatcher,2000,109,1.8,7.2,927,PG-13,0,0,0,1,0,1 -Sons of Provo,2004,93,0.2,4.3,35,PG,0,0,1,0,0,1 -Sorority Boys,2002,93,12,5.1,2398,R,0,0,1,0,0,1 -Soul Assassin,2001,96,7,4,376,R,1,0,0,0,0,1 -Soul Food,1997,114,7.5,6.5,1166,R,0,0,1,1,0,2 -Soul Plane,2004,92,16,3.2,2361,R,0,0,1,0,0,1 -South Park: Bigger Longer & Uncut,1999,81,21,7.6,33188,R,0,1,1,0,0,2 -Space Jam,1996,87,80,5.2,7995,PG,0,1,1,0,0,2 -Space Truckers,1996,95,25,4.5,1460,PG-13,0,0,1,0,0,1 -Spanglish,2004,130,80,6.7,4698,PG-13,0,0,1,1,1,3 -Spanish Judges,1999,98,3.5,4.8,178,R,0,0,0,1,0,1 -Spawn,1997,98,40,4.6,7523,PG-13,1,0,0,0,0,1 -Species,1995,108,35,5.4,8963,R,1,0,0,1,0,2 -Speed,1994,116,28,7.1,32979,R,1,0,0,0,0,1 -Speed 2: Cruise Control,1997,121,110,3.3,13268,PG-13,1,0,0,0,1,2 -Speedway Junky,1999,105,1,5.3,469,R,0,0,0,1,0,1 -Spice World,1997,93,25,3,7710,PG,0,0,1,0,0,1 -Spider,2002,94,8,6.8,5193,R,0,0,0,1,0,1 -Spider-Man,2002,121,139,7.4,63228,PG-13,1,0,0,0,0,1 -Spider-Man 2,2004,127,200,7.9,40256,PG-13,1,0,0,0,0,1 -"SpongeBob SquarePants Movie, The",2004,90,30,6.5,2672,PG,0,1,1,0,0,2 -Spring Forward,1999,110,2,7.1,307,R,0,0,0,1,0,1 -Spun,2002,106,2.8,6.2,3924,R,0,0,1,1,0,2 -Spy Game,2001,126,92,7,16736,R,1,0,0,1,0,2 -Spy Hard,1996,81,18,4.5,4686,PG-13,1,0,1,0,0,2 -Spy Kids 2: Island of Lost Dreams,2002,99,39,5.8,3175,PG,1,0,1,0,0,2 -Spy Kids 3-D: Game Over,2003,84,39,4.7,2597,PG,1,0,1,0,0,2 -"Stand-In, The",1999,100,0.4,5.6,42,PG,0,0,0,1,0,1 -Star Trek: First Contact,1996,106,45,7.3,25046,PG-13,1,0,0,0,0,1 -Star Trek: Insurrection,1998,103,58,6.3,13395,PG,1,0,0,1,1,3 -Star Trek: Nemesis,2002,116,70,6.5,11785,PG-13,1,0,0,1,0,2 -Star Trek: The Wrath of Khan,1982,116,11,7.6,16333,PG,1,0,0,0,0,1 -Star Wars,1977,125,11,8.8,134640,PG,1,0,0,0,0,1 -Star Wars: Episode I - The Phantom Menace,1999,133,115,6.4,84488,PG,1,0,0,0,0,1 -Star Wars: Episode II - Attack of the Clones,2002,120,120,7,63889,PG,1,0,0,0,0,1 -Star Wars: Episode V - The Empire Strikes Back,1980,129,18,8.8,103706,PG,1,0,0,0,0,1 -Star Wars: Episode VI - Return of the Jedi,1983,135,32.5,8.1,82471,PG,1,0,0,0,0,1 -Stark Raving Mad,2002,102,5,6.2,601,R,0,0,1,0,0,1 -Starkweather,2004,92,1,4.6,89,R,0,0,0,1,0,1 -Starship Troopers,1997,129,95,6.7,32618,R,1,0,0,0,0,1 -Starsky & Hutch,2004,101,60,6.3,13529,PG-13,1,0,1,0,0,2 -"Statement, The",2003,120,23,6.1,710,R,0,0,0,1,0,1 -Stateside,2004,97,16,5.4,247,R,0,0,0,1,0,1 -"Station Agent, The",2003,88,0.5,8.1,7112,R,0,0,0,1,0,1 -Steal Big Steal Little,1995,135,35,4.6,263,PG-13,0,0,1,0,0,1 -Stealing Harvard,2002,82,25,4.7,2547,PG-13,0,0,1,1,0,2 -Steamboy,2004,126,20,6.6,529,PG-13,1,1,0,1,0,3 -Steel,1997,97,16,2.6,1607,PG-13,1,0,0,0,0,1 -"Stepford Wives, The",2004,93,90,5.3,7773,PG-13,0,0,1,1,0,2 -Stepmom,1998,124,50,6.1,7470,PG-13,0,0,1,1,0,2 -Stigmata,1999,103,32,6,14062,R,0,0,0,1,0,1 -Stolen Summer,2002,91,1.5,6.2,801,PG,0,0,0,1,0,1 -"Story of Us, The",1999,95,50,5.6,4953,R,0,0,1,1,1,3 -Strange Days,1995,145,42,6.9,11869,R,1,0,0,1,0,2 -Strangers on a Train,1951,103,1.2,8.3,10624,PG,0,0,0,1,0,1 -Stripes,1981,106,10,6.8,7406,R,0,0,1,0,0,1 -Striptease,1996,117,50,3.8,7998,R,0,0,1,1,0,2 -Stuart Little,1999,81,103,6,8009,PG,0,0,1,0,0,1 -Stuart Little 2,2002,82,120,5.9,2324,PG,0,0,1,0,0,1 -Sugar & Spice,2001,84,11,5.3,2901,PG-13,0,0,1,0,0,1 -Sugar Town,1999,92,0.25,5.8,307,R,0,0,1,0,0,1 -Suicide Kings,1997,106,5,7,6117,R,0,0,1,1,0,2 -"Sum of All Fears, The",2002,123,68,6.6,15835,PG-13,1,0,0,1,0,2 -Summer Catch,2001,105,17,4.5,2581,PG-13,0,0,1,0,1,2 -Summer of Sam,1999,142,22,6.5,8151,R,0,0,0,1,1,2 -Sunshine State,2002,141,5.6,7,1481,PG-13,0,0,0,1,0,1 -Super Troopers,2001,100,3,6.3,7728,R,0,0,1,0,0,1 -Superman,1978,151,55,7.1,17327,PG,1,0,0,0,0,1 -Superstar,1999,81,14,4.5,2880,PG-13,0,0,1,0,0,1 -Surviving Picasso,1996,125,16,6.1,1139,R,0,0,0,1,1,2 -Suspect Zero,2004,99,27,5.7,1310,R,0,0,0,1,0,1 -Sweepers,1999,93,12.5,3.9,276,R,1,0,0,0,0,1 -Sweet Home Alabama,2002,108,38,5.8,9943,PG-13,0,0,1,1,1,3 -Sweet November,2001,115,40,5.5,5458,PG-13,0,0,1,1,1,3 -"Sweetest Thing, The",2002,90,43,4.7,8284,R,0,0,1,0,1,2 -Swept Away,2002,89,10,3.8,2113,R,0,0,1,0,1,2 -Swimfan,2002,85,8.5,4.5,3863,PG-13,0,0,0,1,0,1 -Swimming with Sharks,1994,101,0.7,7.1,4837,R,0,0,1,1,0,2 -Swingers,1996,96,0.2,7.6,15827,R,0,0,1,1,0,2 -Swiri,1999,125,5,6.6,1704,R,1,0,0,0,1,2 -Switchback,1997,118,38,6.1,2195,R,1,0,0,0,0,1 -Swordfish,2001,99,80,6.2,20455,R,1,0,0,0,0,1 -THX 1138,1971,88,0.777,6.5,4274,R,0,0,0,1,0,1 -Tadpole,2002,78,0.15,6.3,1769,PG-13,0,0,1,1,1,3 -Taegukgi hwinalrimyeo,2004,140,12.8,8.5,1792,R,1,0,0,1,0,2 -"Tailor of Panama, The",2001,109,18,6.1,5997,R,0,0,1,1,0,2 -"Talented Mr. Ripley, The",1999,139,40,7,25974,R,0,0,0,1,0,1 -Tales from the Hood,1995,98,6,5.1,548,R,1,0,0,0,0,1 -Tank Girl,1995,104,25,4.6,4400,R,1,0,1,0,0,2 -Tart,2001,94,3.3,4.6,714,R,0,0,0,1,0,1 -Tarzan and the Lost City,1998,83,20,3.6,510,PG,1,0,0,0,0,1 -"Taxman, The",1999,104,1,5.7,169,R,1,0,1,0,0,2 -Tea with Mussolini,1999,117,12,6.7,2711,PG,0,0,1,1,0,2 -Teacher's Pet,2004,74,10,5.6,218,PG,0,1,1,0,0,2 -Teaching Mrs. Tingle,1999,96,13,5,5244,PG-13,0,0,1,0,0,1 -Team America: World Police,2004,98,30,7.3,13104,R,1,0,1,0,0,2 -Tears of the Sun,2003,121,70,6.2,8690,R,1,0,0,1,0,2 -Ted Bundy,2002,99,1.2,5.2,852,R,0,0,0,1,0,1 -"Terminal, The",2004,128,60,7.1,15809,PG-13,0,0,1,1,1,3 -Terminator 2: Judgment Day,1991,154,100,8.2,77614,R,1,0,0,1,0,2 -Terminator 3: Rise of the Machines,2003,109,175,6.9,32111,R,1,0,0,0,0,1 -Terror Tract,2000,96,11,5.6,281,R,0,0,1,0,0,1 -"Texas Chainsaw Massacre, The",2003,98,9.2,5.9,9587,R,1,0,0,0,0,1 -Texas Rangers,2001,86,38,5.1,945,PG-13,0,0,0,1,0,1 -Theodore Rex,1995,92,33,2.2,567,PG,0,0,1,0,0,1 -There Goes My Baby,1994,110,10.5,6.1,253,R,0,0,1,1,0,2 -There's Something About Mary,1998,134,23,7.2,46343,R,0,0,1,0,1,2 -"Thin Line Between Love and Hate, A",1996,108,8,4.4,458,R,0,0,1,0,1,2 -"Thin Red Line, The",1998,170,52,7.2,25637,R,1,0,0,1,0,2 -Things to Do in Denver When You're Dead,1995,115,8,6.6,5703,R,0,0,0,1,1,2 -Thir13en Ghosts,2001,87,20,5.1,8292,R,0,0,1,0,0,1 -Thirteen,2003,100,1.5,7.1,8652,R,0,0,0,1,0,1 -Thirteen Conversations About One Thing,2001,104,3,7.2,2883,R,0,0,0,1,0,1 -Thirteen Days,2000,145,80,7.4,10926,PG-13,0,0,0,1,0,1 -"Thomas Crown Affair, The",1999,113,48,6.7,17220,R,0,0,1,0,1,2 -Three Kings,1999,114,48,7.3,31503,R,1,0,1,1,0,3 -Three to Tango,1999,98,20,6,5719,PG-13,0,0,1,0,1,2 -Thunderbirds,2004,95,57,4.4,1419,PG,1,0,1,0,0,2 -Time Changer,2002,95,0.825,4.5,304,PG,0,0,0,1,0,1 -"Time Machine, The",2002,96,80,5.5,12424,PG-13,1,0,0,0,0,1 -"Time to Kill, A",1996,149,40,6.9,15577,R,0,0,0,1,0,1 -Timecode,2000,97,4,6.2,2320,R,0,0,1,1,0,2 -Tin Cup,1996,135,45,6.2,7521,R,0,0,1,1,1,3 -Titan A.E.,2000,94,75,6.4,9373,PG,1,1,0,0,0,2 -Titanic,1997,194,200,6.9,90195,PG-13,0,0,0,1,1,2 -Tomcats,2001,95,11,4.7,3717,R,0,0,1,0,0,1 -Tomorrow Never Dies,1997,119,110,6.4,19397,PG-13,1,0,0,0,0,1 -Torque,2004,81,40,3.2,4050,PG-13,1,0,0,0,0,1 -"Touch, The",2002,103,20,4.5,417,PG-13,1,0,0,0,1,2 -Town & Country,2001,104,90,4.5,1434,R,0,0,1,0,0,1 -Traffic,2000,147,48,7.8,41268,R,0,0,0,1,0,1 -Training Day,2001,120,45,7.3,22776,R,0,0,0,1,0,1 -Trainspotting,1996,94,3.5,8,51887,R,0,0,0,1,0,1 -Treasure Planet,2002,95,140,6.6,3724,PG,0,1,0,1,0,2 -Trees Lounge,1996,95,1.3,7.1,3155,R,0,0,1,1,0,2 -"Trigger Effect, The",1996,94,8,5.4,1591,R,1,0,0,1,0,2 -Triggermen,2002,96,12,5.8,317,R,0,0,1,0,0,1 -"Triplettes de Belleville, Les",2003,78,8,7.7,6618,PG-13,0,1,1,0,0,2 -"Triumph of Love, The",2001,112,5,5.7,423,PG-13,0,0,1,0,1,2 -Trois 3: The Escort,2004,95,1,4.8,38,R,0,0,0,1,0,1 -Tromeo and Juliet,1996,108,0.35,5.8,1030,R,0,0,1,1,0,2 -Troy,2004,162,185,7.1,33979,R,1,0,0,1,1,3 -"Truman Show, The",1998,103,60,7.7,62434,PG,0,0,1,1,0,2 -Tuck Everlasting,2002,96,15,6.5,2055,PG,0,0,0,1,1,2 -Tumbleweeds,1999,102,0.312,6.9,1146,PG-13,0,0,1,1,0,2 -"Tuxedo, The",2002,98,60,5.1,6070,PG-13,1,0,1,0,0,2 -Twelve Monkeys,1995,129,29,7.9,62301,R,0,0,0,1,0,1 -Twin Falls Idaho,1999,111,0.5,7.1,1547,R,0,0,0,1,0,1 -Twin Peaks: Fire Walk with Me,1992,135,10,6.5,6927,R,0,0,0,1,0,1 -Twist,2003,97,0.35,6,197,R,0,0,0,1,0,1 -Twister,1996,113,92,5.9,28315,PG-13,1,0,0,1,0,2 -Two Can Play That Game,2001,93,6,5.8,843,R,0,0,1,0,1,2 -Two Weeks Notice,2002,101,60,5.8,15010,PG-13,0,0,1,0,1,2 -U Turn,1997,125,19,6.5,10306,R,0,0,0,1,0,1 -U-571,2000,116,62,6.5,15792,PG-13,1,0,0,1,0,2 -U.S. Marshals,1998,131,60,6.1,10315,PG-13,1,0,0,1,0,2 -Unbreakable,2000,106,75,7.1,35842,PG-13,0,0,0,1,0,1 -Under Siege 2: Dark Territory,1995,99,60,4.9,5551,R,1,0,0,1,0,2 -Under Suspicion,2000,111,25,6.4,3718,R,0,0,0,1,0,1 -Under the Tuscan Sun,2003,113,18,6.7,4183,PG-13,0,0,1,1,1,3 -Undercover Brother,2002,85,25,6,5138,PG-13,1,0,1,0,0,2 -Undisputed,2002,96,20,5.6,1769,R,1,0,0,1,0,2 -Unfaithful,2002,125,50,6.6,8713,R,0,0,0,1,0,1 -Unstoppable,2004,96,15,4.8,579,R,1,0,1,1,0,3 -"Untold, The",2002,92,3,3.8,400,R,1,0,0,0,0,1 -Up Close & Personal,1996,124,60,5.7,3201,PG-13,0,0,0,1,1,2 -"Upside of Anger, The",2005,118,13.2,7.2,1160,R,0,0,1,1,1,3 -Urban Ghost Story,1998,82,0.3,5.3,167,R,0,0,0,1,0,1 -Urbania,2000,106,0.225,6.9,1089,R,0,0,0,1,0,1 -Utomlyonnye solntsem,1994,132,2.8,7.6,2173,R,0,0,0,1,0,1 -Vampire in Brooklyn,1995,100,14,4.4,2716,R,0,0,1,0,1,2 -Vampires,1998,106,20,5.6,7908,R,1,0,0,0,0,1 -Van Helsing,2004,132,160,5.4,19787,PG-13,1,0,0,0,0,1 -Van Wilder,2002,94,6,5.8,7799,R,0,0,1,0,0,1 -Vanilla Sky,2001,136,68,6.9,31250,R,0,0,0,1,1,2 -Vanity Fair,2004,141,23,6.1,2151,PG-13,0,0,0,1,1,2 -Varsity Blues,1999,100,16,6,7974,R,0,0,0,1,0,1 -Vatel,2000,125,36,6.4,1322,PG-13,0,0,0,1,1,2 -"Vault, The",2005,87,0.1,2.4,64,PG-13,1,0,0,0,0,1 -"Velocity of Gary, The",1998,100,4,4.7,570,R,0,0,1,0,1,2 -Veronica Guerin,2003,92,17,6.8,2688,R,0,0,0,1,0,1 -Vertical Limit,2000,124,75,5.6,10273,PG-13,1,0,0,0,0,1 -Very Bad Things,1998,100,10,5.8,10001,R,0,0,1,0,0,1 -"Very Brady Sequel, A",1996,90,15,5.3,2183,PG-13,0,0,1,0,0,1 -"Village, The",2004,108,60,6.6,25729,PG-13,0,0,0,1,0,1 -"Violon rouge, Le",1998,140,10,7.8,6995,R,0,0,0,1,1,2 -"Virgin Suicides, The",1999,90,6,7.2,17524,R,0,0,0,1,0,1 -Virtuosity,1995,106,30,5.3,4183,R,1,0,0,0,0,1 -Volcano,1997,104,90,5.2,8627,PG-13,1,0,0,1,0,2 -Vor,1997,110,2,7.2,841,R,0,0,0,1,0,1 -Wag the Dog,1997,97,15,7,16434,R,0,0,1,0,0,1 -Waiting for Guffman,1996,84,4,7.6,7337,R,0,0,1,0,0,1 -Waiting to Exhale,1995,127,15,5.1,1611,R,0,0,1,1,0,2 -Waking Ned,1998,92,3,7.3,7232,PG,0,0,1,0,0,1 -"Walk in the Clouds, A",1995,102,20,6.2,4085,PG-13,0,0,0,1,1,2 -"Walk on the Moon, A",1999,105,14,6.6,1815,R,0,0,0,1,1,2 -"Walk to Remember, A",2002,101,11,6.8,7124,PG,0,0,0,1,1,2 -Walking Across Egypt,1999,100,4.5,6.9,247,PG-13,0,0,0,1,0,1 -Walking Tall,2004,87,56,5.9,4839,PG-13,1,0,0,1,0,2 -Walking and Talking,1996,86,1,6.6,888,R,0,0,1,1,1,3 -War and Peace,1956,208,6,6.6,795,PG,0,0,0,1,1,2 -Warriors of Virtue,1997,101,35,3.6,389,PG,1,0,0,0,0,1 -"Waterboy, The",1998,90,23,5.5,15539,PG-13,0,0,1,0,0,1 -Waterworld,1995,176,175,5.4,19325,PG-13,1,0,0,1,0,2 -We Don't Live Here Anymore,2004,101,3,6.1,1387,R,0,0,0,1,0,1 -We Were Soldiers,2002,143,75,7.1,14939,R,1,0,0,1,0,2 -"Wedding Date, The",2005,90,15,5,953,PG-13,0,0,1,0,1,2 -"Wedding Party, The",1969,92,0.043,5.2,94,R,0,0,1,0,0,1 -"Wedding Planner, The",2001,103,35,4.9,7393,PG-13,0,0,1,0,1,2 -Welcome to Collinwood,2002,86,12,6.1,2831,R,0,0,1,0,0,1 -Welcome to Mooseport,2004,117,26,5.3,2356,PG-13,0,0,1,0,0,1 -Welcome to Sarajevo,1997,103,9,6.8,1465,R,0,0,0,1,0,1 -Welcome to the Dollhouse,1995,88,0.8,7.4,5851,R,0,0,1,1,0,2 -What Dreams May Come,1998,113,85,6.3,11706,PG-13,0,0,0,1,1,2 -What Lies Beneath,2000,130,90,6.6,20584,PG-13,0,0,0,1,0,1 -What Planet Are You From?,2000,104,50,5.6,2574,R,0,0,1,0,0,1 -What Women Want,2000,127,65,6.4,20138,PG-13,0,0,1,0,1,2 -What a Girl Wants,2003,105,20,5.7,3533,PG,0,0,1,1,1,3 -What's the Worst That Could Happen?,2001,97,45,5,2531,PG-13,0,0,1,0,0,1 -Whatever It Takes,2000,94,15,5.2,1771,PG-13,0,0,1,1,1,3 -When Zachary Beaver Came to Town,2003,85,3,7.9,35,PG,0,0,0,1,0,1 -Where the Heart Is,2000,120,15,6.4,5042,PG-13,0,0,1,1,1,3 -Where the Money Is,2000,89,18,6.2,1461,PG-13,0,0,1,1,0,2 -Where's Marlowe?,1998,97,3.5,6.2,188,R,0,0,1,0,0,1 -While You Were Sleeping,1995,103,17,6.5,13035,PG,0,0,1,0,1,2 -Whipped,2000,82,3,4.4,1562,R,0,0,1,0,1,2 -White Oleander,2002,109,16,6.9,4545,PG-13,0,0,0,1,0,1 -White Squall,1996,129,38,6.4,3445,PG-13,0,0,0,1,0,1 -"Whole Ten Yards, The",2004,98,40,4.8,4133,PG-13,0,0,1,0,0,1 -"Whole Wide World, The",1996,111,1.3,7.4,956,PG,0,0,0,1,0,1 -Wicked Spring,2002,102,0.5,5.6,158,PG-13,0,0,0,1,0,1 -Wicker Park,2004,114,30,6.4,3143,PG-13,0,0,0,1,1,2 -Wide Awake,1998,88,7,6,655,PG,0,0,1,1,0,2 -"Wild Angels, The",1966,93,0.36,4.7,212,R,1,0,0,1,0,2 -"Wild Ride, The",1960,88,0.03,3.8,56,PG-13,0,0,0,1,0,1 -"Wild Thornberrys Movie, The",2002,85,35,4.7,4008,PG,0,1,1,0,0,2 -Wild Wild West,1999,107,170,4,19078,PG-13,1,0,1,0,0,2 -Wild in the Streets,1968,94,1,5.9,329,R,0,0,0,1,0,1 -Wilde,1997,118,10,6.9,2545,R,0,0,0,1,0,1 -Willard,2003,100,22,6.2,2913,PG-13,0,0,1,1,0,2 -Wimbledon,2004,98,31,6.3,4297,PG-13,0,0,1,1,1,3 -Win a Date with Tad Hamilton!,2004,95,24,5.8,2933,PG-13,0,0,1,0,1,2 -Wind River,1998,97,5.5,5.4,97,PG-13,0,0,0,1,0,1 -Windtalkers,2002,153,115,5.9,9081,R,1,0,0,1,0,2 -Wing Commander,1999,96,30,3.7,4854,PG-13,1,0,0,0,0,1 -Wisegirls,2002,96,11,5.7,792,R,0,0,0,1,0,1 -Without Limits,1998,117,25,6.8,1249,PG-13,0,0,0,1,0,1 -Without a Paddle,2004,95,19,5.4,3605,PG-13,0,0,1,0,0,1 -Wo hu cang long,2000,120,15,8.2,52198,PG-13,1,0,0,0,1,2 -Woman on Top,2000,92,8,5.3,2094,R,0,0,1,0,1,2 -Wonder Boys,2000,111,35,7.6,15668,R,0,0,1,1,0,2 -Woo,1998,84,13,3.5,407,R,0,0,1,0,1,2 -"Wood, The",1999,102,6,6.2,1170,R,0,0,1,1,1,3 -"Work and the Glory, The",2004,118,7.5,6.3,180,PG,0,0,0,1,1,2 -"World Is Not Enough, The",1999,128,135,6.3,24205,PG-13,1,0,0,0,0,1 -World Traveler,2001,103,2,5.4,350,R,0,0,0,1,0,1 -"X Files, The",1998,121,66,6.7,18314,PG-13,1,0,0,0,0,1 -X-Men,2000,104,75,7.3,45332,PG-13,1,0,0,0,0,1 -X2,2003,133,110,7.9,38191,PG-13,1,0,0,0,0,1 -"Yards, The",2000,115,20,6.3,3386,R,0,0,0,1,0,1 -Ying xiong,2002,93,30,8.1,24128,PG-13,1,0,0,1,0,2 -Yo puta,2004,76,6,4.3,151,R,0,0,0,1,0,1 -You Can Count on Me,2000,111,1.2,7.8,7630,R,0,0,0,1,0,1 -You Got Served,2004,95,8,1.9,6041,PG-13,0,0,0,1,0,1 -You've Got Mail,1998,119,65,6.2,20053,PG,0,0,1,0,1,2 -Your Friends & Neighbors,1998,100,5,6.4,2659,R,0,0,1,1,0,2 -Zero Effect,1998,116,5,7,4820,R,0,0,1,0,0,1 -Zoolander,2001,89,28,6.1,18277,PG-13,0,0,1,0,0,1 -xXx,2002,132,85,5.5,18514,PG-13,1,0,0,0,0,1 -xXx: State of the Union,2005,101,87,3.9,1584,PG-13,1,0,0,0,0,1 diff --git a/data-raw/movies_wide_long.R b/data-raw/movies_wide_long.R deleted file mode 100644 index d143abf..0000000 --- a/data-raw/movies_wide_long.R +++ /dev/null @@ -1,55 +0,0 @@ -# loading the needed libraries -library(ggplot2movies) -library(dplyr) - -# looking at the table -dplyr::glimpse(x = ggplot2movies::movies) - -# clean data leave it in wide format -movies_wide <- - ggplot2movies::movies %>% # `.` is just a placeholder for the data throughout - dplyr::select(.data = ., c(title:votes, mpaa:Short)) %>% # eliminate the decile columns r1 through r10 - dplyr::filter(.data = ., mpaa != "", mpaa != "NC-17") %>% # removing movies without mpaa ratings & NC-17 - dplyr::filter(.data = ., Short != 1, Documentary != 1) %>% # removing Shorts and Documentaries - dplyr::select(.data = ., -c(Short, Documentary)) %>% # remove the now useless columns - stats::na.omit(.) %>% # removing NAs - dplyr::mutate(.data = ., budget = budget / 1000000) %>% # convert the budget to millions of dollars - dplyr::mutate(.data = ., mpaa = factor(mpaa)) %>% # convert mpaa rating to a factor - dplyr::mutate(.data = ., NumGenre = as.integer(rowSums(select(., Action:Romance)))) %>% # calculate number of genres a film appears in - dplyr::filter(.data = ., NumGenre > 0) # remove films that are not listed in any genre - -# see the selected data (we have data from 1,579 movies) -dplyr::glimpse(x = movies_wide) - -# converting to long format - -movies_long <- - movies_wide %>% - dplyr::mutate( - genre = dplyr::case_when( - Action == 1 & Comedy == 1 & Animation == 0 ~ "Action Comedy", - Action == 1 & Drama == 1 & Animation == 0 ~ "Action Drama", - Comedy == 1 & Romance == 1 & Animation == 0 ~ "RomCom", - Comedy == 1 & Drama == 1 & Animation == 0 ~ "Comedy Drama", - Romance == 1 & Drama == 1 & Animation == 0 ~ "Romance Drama", - Action == 1 & Animation == 0 ~ "Action", - Animation == 1 ~ "Animated", - Comedy == 1 ~ "Comedy", - Drama == 1 ~ "Drama", - Romance == 1 ~ "Romance Drama" # judgment call there are only 3 of them - ) - ) %>% - stats::na.omit(.) %>% - # removing NAs - dplyr::mutate(genre = factor(genre)) %>% - dplyr::select(.data = ., -c(Action:NumGenre)) %>% - dplyr::arrange(.data = ., desc(rating), title, year) - -# see the selected data (we have data from the exact same 1,579 movies) -dplyr::glimpse(x = movies_long) - -# saving the files -readr::write_csv(x = movies_wide, path = "data-raw/movies_wide.csv") -base::save(movies_wide, file = "data/movies_wide.rdata") -readr::write_csv(x = movies_long, path = "data-raw/movies_long.csv") -base::save(movies_long, file = "data/movies_long.rdata") diff --git a/docs/404.html b/docs/404.html index 65412ca..dfa7ceb 100644 --- a/docs/404.html +++ b/docs/404.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -155,7 +155,7 @@

Contents

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/CODE_OF_CONDUCT.html b/docs/CODE_OF_CONDUCT.html index 23bb81a..579b27c 100644 --- a/docs/CODE_OF_CONDUCT.html +++ b/docs/CODE_OF_CONDUCT.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -163,7 +163,7 @@

Contents

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/CONTRIBUTING.html b/docs/CONTRIBUTING.html index 19797e5..6bc125d 100644 --- a/docs/CONTRIBUTING.html +++ b/docs/CONTRIBUTING.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -200,7 +200,7 @@

Contents

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html index 7b30bd0..7461d1f 100644 --- a/docs/LICENSE-text.html +++ b/docs/LICENSE-text.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -157,7 +157,7 @@

Contents

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/LICENSE.html b/docs/LICENSE.html index eb4889f..0abc8c6 100644 --- a/docs/LICENSE.html +++ b/docs/LICENSE.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -377,7 +377,7 @@

Contents

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/SUPPORT.html b/docs/SUPPORT.html index f98a640..71c41ea 100644 --- a/docs/SUPPORT.html +++ b/docs/SUPPORT.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -170,7 +170,7 @@

Contents

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/authors.html b/docs/authors.html index 136ce6c..616178e 100644 --- a/docs/authors.html +++ b/docs/authors.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -170,7 +170,7 @@

Authors

-

Site built with pkgdown 1.5.1.

+

Site built with pkgdown 1.5.1.9000.

diff --git a/docs/index.html b/docs/index.html index 9c96779..4b680db 100644 --- a/docs/index.html +++ b/docs/index.html @@ -47,7 +47,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -115,7 +115,7 @@ CRAN_Release_Badge Travis Build Status Daily downloads badge -GitHub version +GitHub version Website @@ -130,7 +130,7 @@ lifecycle Monthly downloads badge Github Issues -vignettes +vignettes GitHub code size in bytes @@ -143,14 +143,14 @@ Licence Codecov test coverage Covrpage Summary -Last-changedate +Last-changedate GitHub last commit status R build status Gitter chat -Project Status +Project Status contributions welcome @@ -166,24 +166,24 @@

Installation

To get the latest, stable CRAN release:

-
install.packages("pairwiseComparisons")
+
install.packages("pairwiseComparisons")

You can get the development version of the package from GitHub. To see what new changes (and bug fixes) have been made to the package since the last release on CRAN, you can check the detailed log of changes here: https://indrajeetpatil.github.io/pairwiseComparisons/news/index.html

If you are in hurry and want to reduce the time of installation, prefer-

-
# needed package to download from GitHub repo
-install.packages("remotes")
-
-# downloading the package from GitHub
-remotes::install_github(
-  repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub
-  dependencies = FALSE, # assumes you have already installed needed packages
-  quick = TRUE # skips docs, demos, and vignettes
-)
+
# needed package to download from GitHub repo
+install.packages("remotes")
+
+# downloading the package from GitHub
+remotes::install_github(
+  repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub
+  dependencies = FALSE, # assumes you have already installed needed packages
+  quick = TRUE # skips docs, demos, and vignettes
+)

If time is not a constraint-

-
remotes::install_github(
-  repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub
-  dependencies = TRUE, # installs packages which pairwiseComparisons depends on
-  upgrade_dependencies = TRUE # updates any out of date dependencies
-)
+
remotes::install_github(
+  repo = "IndrajeetPatil/pairwiseComparisons", # package path on GitHub
+  dependencies = TRUE, # installs packages which pairwiseComparisons depends on
+  upgrade_dependencies = TRUE # updates any out of date dependencies
+)
@@ -283,278 +283,262 @@

Between-subjects design

-
# for reproducibility
-set.seed(123)
-library(pairwiseComparisons)
-
-# parametric
-# if `var.equal = TRUE`, then Student's *t*-test will be run
-pairwise_comparisons(
-  data = ggplot2::msleep,
-  x = vore,
-  y = brainwt,
-  type = "parametric",
-  var.equal = TRUE,
-  paired = FALSE,
-  p.adjust.method = "bonferroni"
-)
-#> # A tibble: 6 x 8
-#>   group1  group2  mean.difference p.value significance
-#>   <chr>   <chr>             <dbl>   <dbl> <chr>       
-#> 1 carni   herbi            0.542    1     ns          
-#> 2 carni   insecti         -0.0577   1     ns          
-#> 3 carni   omni             0.0665   1     ns          
-#> 4 herbi   insecti         -0.600    1     ns          
-#> 5 herbi   omni            -0.476    0.979 ns          
-#> 6 insecti omni             0.124    1     ns          
-#>   label                                 test.details     p.value.adjustment
-#>   <chr>                                 <chr>            <chr>             
-#> 1 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni        
-#> 2 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni        
-#> 3 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni        
-#> 4 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni        
-#> 5 list(~italic(p)[ adjusted ]== 0.979 ) Student's t-test Bonferroni        
-#> 6 list(~italic(p)[ adjusted ]== 1.000 ) Student's t-test Bonferroni
-
-# if `var.equal = FALSE`, then Games-Howell test will be run
-pairwise_comparisons(
-  data = ggplot2::msleep,
-  x = vore,
-  y = brainwt,
-  type = "parametric",
-  var.equal = FALSE,
-  paired = FALSE,
-  p.adjust.method = "bonferroni"
-)
-#> # A tibble: 6 x 11
-#>   group1 group2  mean.difference    se t.value    df p.value significance
-#>   <chr>  <chr>             <dbl> <dbl>   <dbl> <dbl>   <dbl> <chr>       
-#> 1 carni  insecti          -0.058 0.027   1.53   10.7       1 ns          
-#> 2 herbi  carni            -0.542 0.25    1.54   19.4       1 ns          
-#> 3 herbi  insecti          -0.6   0.249   1.70   19.1       1 ns          
-#> 4 omni   carni            -0.066 0.061   0.774  21.1       1 ns          
-#> 5 omni   herbi             0.476 0.255   1.32   20.9       1 ns          
-#> 6 omni   insecti          -0.124 0.057   1.55   17.2       1 ns          
-#>   label                                 test.details      p.value.adjustment
-#>   <chr>                                 <chr>             <chr>             
-#> 1 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni        
-#> 2 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni        
-#> 3 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni        
-#> 4 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni        
-#> 5 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni        
-#> 6 list(~italic(p)[ adjusted ]== 1.000 ) Games-Howell test Bonferroni
-
-# non-parametric
-pairwise_comparisons(
-  data = ggplot2::msleep,
-  x = vore,
-  y = brainwt,
-  type = "nonparametric",
-  paired = FALSE,
-  p.adjust.method = "none"
-)
-#> # A tibble: 6 x 8
-#>   group1  group2  z.value p.value significance
-#>   <chr>   <chr>     <dbl>   <dbl> <chr>       
-#> 1 carni   herbi     0.582  0.561  ns          
-#> 2 carni   insecti   1.88   0.0595 ns          
-#> 3 carni   omni      1.14   0.254  ns          
-#> 4 herbi   insecti   1.63   0.102  ns          
-#> 5 herbi   omni      0.717  0.474  ns          
-#> 6 insecti omni      1.14   0.254  ns          
-#>   label                                   test.details p.value.adjustment
-#>   <chr>                                   <chr>        <chr>             
-#> 1 list(~italic(p)[ unadjusted ]== 0.561 ) Dunn test    None              
-#> 2 list(~italic(p)[ unadjusted ]== 0.060 ) Dunn test    None              
-#> 3 list(~italic(p)[ unadjusted ]== 0.254 ) Dunn test    None              
-#> 4 list(~italic(p)[ unadjusted ]== 0.102 ) Dunn test    None              
-#> 5 list(~italic(p)[ unadjusted ]== 0.474 ) Dunn test    None              
-#> 6 list(~italic(p)[ unadjusted ]== 0.254 ) Dunn test    None
-
-# robust
-pairwise_comparisons(
-  data = ggplot2::msleep,
-  x = vore,
-  y = brainwt,
-  type = "robust",
-  paired = FALSE,
-  p.adjust.method = "fdr"
-)
-#> # A tibble: 6 x 10
-#>   group1  group2    psihat conf.low conf.high p.value significance
-#>   <chr>   <chr>      <dbl>    <dbl>     <dbl>   <dbl> <chr>       
-#> 1 carni   herbi   -0.0530   -0.274     0.168    0.969 ns          
-#> 2 carni   insecti  0.0577   -0.0609    0.176    0.969 ns          
-#> 3 carni   omni     0.00210  -0.151     0.155    0.969 ns          
-#> 4 herbi   insecti  0.111    -0.0983    0.320    0.969 ns          
-#> 5 herbi   omni     0.0551   -0.173     0.283    0.969 ns          
-#> 6 insecti omni    -0.0556   -0.184     0.0728   0.969 ns          
-#>   label                                 test.details             
-#>   <chr>                                 <chr>                    
-#> 1 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test
-#> 2 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test
-#> 3 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test
-#> 4 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test
-#> 5 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test
-#> 6 list(~italic(p)[ adjusted ]== 0.969 ) Yuen's trimmed means test
-#>   p.value.adjustment  
-#>   <chr>               
-#> 1 Benjamini & Hochberg
-#> 2 Benjamini & Hochberg
-#> 3 Benjamini & Hochberg
-#> 4 Benjamini & Hochberg
-#> 5 Benjamini & Hochberg
-#> 6 Benjamini & Hochberg
-
-# Bayes Factor
-pairwise_comparisons(
-  data = ggplot2::msleep,
-  x = vore,
-  y = brainwt,
-  type = "bayes",
-  paired = FALSE
-)
-#> # A tibble: 6 x 11
-#>   group1 group2   bf10  bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01
-#>   <chr>  <chr>   <dbl> <dbl>      <dbl>      <dbl>       <dbl>       <dbl>
-#> 1 omni   herbi   0.571  1.75     -0.560      0.560      -0.243       0.243
-#> 2 omni   carni   0.427  2.34     -0.851      0.851      -0.369       0.369
-#> 3 omni   insecti 0.545  1.83     -0.606      0.606      -0.263       0.263
-#> 4 herbi  carni   0.540  1.85     -0.617      0.617      -0.268       0.268
-#> 5 herbi  insecti 0.540  1.85     -0.616      0.616      -0.267       0.267
-#> 6 carni  insecti 0.718  1.39     -0.332      0.332      -0.144       0.144
-#>   bf.prior label                        test.details    
-#>      <dbl> <chr>                        <chr>           
-#> 1    0.707 list(~log[e](BF[10])==-0.56) Student's t-test
-#> 2    0.707 list(~log[e](BF[10])==-0.85) Student's t-test
-#> 3    0.707 list(~log[e](BF[10])==-0.61) Student's t-test
-#> 4    0.707 list(~log[e](BF[10])==-0.62) Student's t-test
-#> 5    0.707 list(~log[e](BF[10])==-0.62) Student's t-test
-#> 6    0.707 list(~log[e](BF[10])==-0.33) Student's t-test
+
# for reproducibility
+set.seed(123)
+library(pairwiseComparisons)
+
+# parametric
+# if `var.equal = TRUE`, then Student's *t*-test will be run
+pairwise_comparisons(
+  data = ggplot2::msleep,
+  x = vore,
+  y = brainwt,
+  type = "parametric",
+  var.equal = TRUE,
+  paired = FALSE,
+  p.adjust.method = "bonferroni"
+)
+#> # A tibble: 6 x 8
+#>   group1  group2  mean.difference p.value significance
+#>   <chr>   <chr>             <dbl>   <dbl> <chr>       
+#> 1 carni   herbi            0.542    1     ns          
+#> 2 carni   insecti         -0.0577   1     ns          
+#> 3 carni   omni             0.0665   1     ns          
+#> 4 herbi   insecti         -0.600    1     ns          
+#> 5 herbi   omni            -0.476    0.979 ns          
+#> 6 insecti omni             0.124    1     ns          
+#>   label                             test.details     p.value.adjustment
+#>   <chr>                             <chr>            <chr>             
+#> 1 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni        
+#> 2 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni        
+#> 3 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni        
+#> 4 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni        
+#> 5 list(~italic(p)[adjusted]==0.979) Student's t-test Bonferroni        
+#> 6 list(~italic(p)[adjusted]==1.000) Student's t-test Bonferroni
+
+# if `var.equal = FALSE`, then Games-Howell test will be run
+pairwise_comparisons(
+  data = ggplot2::msleep,
+  x = vore,
+  y = brainwt,
+  type = "parametric",
+  var.equal = FALSE,
+  paired = FALSE,
+  p.adjust.method = "bonferroni"
+)
+#> # A tibble: 6 x 11
+#>   group1  group2  mean.difference    se t.value    df p.value significance
+#>   <chr>   <chr>             <dbl> <dbl>   <dbl> <dbl>   <dbl> <chr>       
+#> 1 carni   herbi             0.542 0.25    1.54   19.4       1 ns          
+#> 2 carni   insecti          -0.058 0.027   1.53   10.7       1 ns          
+#> 3 carni   omni              0.066 0.061   0.774  21.1       1 ns          
+#> 4 herbi   insecti          -0.6   0.249   1.70   19.1       1 ns          
+#> 5 herbi   omni             -0.476 0.255   1.32   20.9       1 ns          
+#> 6 insecti omni              0.124 0.057   1.55   17.2       1 ns          
+#>   label                             test.details      p.value.adjustment
+#>   <chr>                             <chr>             <chr>             
+#> 1 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni        
+#> 2 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni        
+#> 3 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni        
+#> 4 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni        
+#> 5 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni        
+#> 6 list(~italic(p)[adjusted]==1.000) Games-Howell test Bonferroni
+
+# non-parametric
+pairwise_comparisons(
+  data = ggplot2::msleep,
+  x = vore,
+  y = brainwt,
+  type = "nonparametric",
+  paired = FALSE,
+  p.adjust.method = "none"
+)
+#> # A tibble: 6 x 8
+#>   group1  group2  z.value p.value significance
+#>   <chr>   <chr>     <dbl>   <dbl> <chr>       
+#> 1 carni   herbi     0.582  0.561  ns          
+#> 2 carni   insecti   1.88   0.0595 ns          
+#> 3 carni   omni      1.14   0.254  ns          
+#> 4 herbi   insecti   1.63   0.102  ns          
+#> 5 herbi   omni      0.717  0.474  ns          
+#> 6 insecti omni      1.14   0.254  ns          
+#>   label                               test.details p.value.adjustment
+#>   <chr>                               <chr>        <chr>             
+#> 1 list(~italic(p)[unadjusted]==0.561) Dunn test    None              
+#> 2 list(~italic(p)[unadjusted]==0.060) Dunn test    None              
+#> 3 list(~italic(p)[unadjusted]==0.254) Dunn test    None              
+#> 4 list(~italic(p)[unadjusted]==0.102) Dunn test    None              
+#> 5 list(~italic(p)[unadjusted]==0.474) Dunn test    None              
+#> 6 list(~italic(p)[unadjusted]==0.254) Dunn test    None
+
+# robust
+pairwise_comparisons(
+  data = ggplot2::msleep,
+  x = vore,
+  y = brainwt,
+  type = "robust",
+  paired = FALSE,
+  p.adjust.method = "fdr"
+)
+#> # A tibble: 6 x 10
+#>   group1  group2    psihat conf.low conf.high p.value significance
+#>   <chr>   <chr>      <dbl>    <dbl>     <dbl>   <dbl> <chr>       
+#> 1 carni   herbi   -0.0530   -0.274     0.168    0.969 ns          
+#> 2 carni   insecti  0.0577   -0.0609    0.176    0.969 ns          
+#> 3 carni   omni     0.00210  -0.151     0.155    0.969 ns          
+#> 4 herbi   insecti  0.111    -0.0983    0.320    0.969 ns          
+#> 5 herbi   omni     0.0551   -0.173     0.283    0.969 ns          
+#> 6 insecti omni    -0.0556   -0.184     0.0728   0.969 ns          
+#>   label                             test.details             
+#>   <chr>                             <chr>                    
+#> 1 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test
+#> 2 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test
+#> 3 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test
+#> 4 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test
+#> 5 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test
+#> 6 list(~italic(p)[adjusted]==0.969) Yuen's trimmed means test
+#>   p.value.adjustment  
+#>   <chr>               
+#> 1 Benjamini & Hochberg
+#> 2 Benjamini & Hochberg
+#> 3 Benjamini & Hochberg
+#> 4 Benjamini & Hochberg
+#> 5 Benjamini & Hochberg
+#> 6 Benjamini & Hochberg
+
+# Bayes Factor
+pairwise_comparisons(
+  data = ggplot2::msleep,
+  x = vore,
+  y = brainwt,
+  type = "bayes",
+  paired = FALSE
+)
+#> # A tibble: 6 x 11
+#>   group1  group2   bf10  bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01
+#>   <chr>   <chr>   <dbl> <dbl>      <dbl>      <dbl>       <dbl>       <dbl>
+#> 1 carni   herbi   0.540  1.85     -0.617      0.617      -0.268       0.268
+#> 2 carni   insecti 0.718  1.39     -0.332      0.332      -0.144       0.144
+#> 3 carni   omni    0.427  2.34     -0.851      0.851      -0.369       0.369
+#> 4 herbi   insecti 0.540  1.85     -0.616      0.616      -0.267       0.267
+#> 5 herbi   omni    0.571  1.75     -0.560      0.560      -0.243       0.243
+#> 6 insecti omni    0.545  1.83     -0.606      0.606      -0.263       0.263
+#>   bf.prior label                        test.details    
+#>      <dbl> <chr>                        <chr>           
+#> 1    0.707 list(~log[e](BF[10])==-0.62) Student's t-test
+#> 2    0.707 list(~log[e](BF[10])==-0.33) Student's t-test
+#> 3    0.707 list(~log[e](BF[10])==-0.85) Student's t-test
+#> 4    0.707 list(~log[e](BF[10])==-0.62) Student's t-test
+#> 5    0.707 list(~log[e](BF[10])==-0.56) Student's t-test
+#> 6    0.707 list(~log[e](BF[10])==-0.61) Student's t-test

Within-subjects design

-
# for reproducibility
-set.seed(123)
-
-# parametric
-pairwise_comparisons(
-  data = bugs_long,
-  x = condition,
-  y = desire,
-  type = "parametric",
-  paired = TRUE,
-  p.adjust.method = "BH"
-)
-#> # A tibble: 6 x 8
-#>   group1 group2 mean.difference  p.value significance
-#>   <chr>  <chr>            <dbl>    <dbl> <chr>       
-#> 1 HDHF   HDLF            -1.15  1.06e- 3 **          
-#> 2 HDHF   LDHF            -0.472 7.02e- 2 ns          
-#> 3 HDHF   LDLF            -2.16  3.95e-12 ***         
-#> 4 HDLF   LDHF             0.676 6.74e- 2 ns          
-#> 5 HDLF   LDLF            -1.02  1.99e- 3 **          
-#> 6 LDHF   LDLF            -1.69  6.66e- 9 ***         
-#>   label                                 test.details     p.value.adjustment  
-#>   <chr>                                 <chr>            <chr>               
-#> 1 list(~italic(p)[ adjusted ]== 0.001 ) Student's t-test Benjamini & Hochberg
-#> 2 list(~italic(p)[ adjusted ]== 0.070 ) Student's t-test Benjamini & Hochberg
-#> 3 list(~italic(p)[ adjusted ]<= 0.001 ) Student's t-test Benjamini & Hochberg
-#> 4 list(~italic(p)[ adjusted ]== 0.067 ) Student's t-test Benjamini & Hochberg
-#> 5 list(~italic(p)[ adjusted ]== 0.002 ) Student's t-test Benjamini & Hochberg
-#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Student's t-test Benjamini & Hochberg
-
-# non-parametric
-pairwise_comparisons(
-  data = bugs_long,
-  x = condition,
-  y = desire,
-  type = "nonparametric",
-  paired = TRUE,
-  p.adjust.method = "BY"
-)
-#> # A tibble: 6 x 8
-#>   group1 group2     W  p.value significance
-#>   <chr>  <chr>  <dbl>    <dbl> <chr>       
-#> 1 HDHF   HDLF    4.78 1.44e- 5 ***         
-#> 2 HDHF   LDHF    2.44 4.47e- 2 *           
-#> 3 HDHF   LDLF    8.01 5.45e-13 ***         
-#> 4 HDLF   LDHF    2.34 4.96e- 2 *           
-#> 5 HDLF   LDLF    3.23 5.05e- 3 **          
-#> 6 LDHF   LDLF    5.57 4.64e- 7 ***         
-#>   label                                 test.details       
-#>   <chr>                                 <chr>              
-#> 1 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test
-#> 2 list(~italic(p)[ adjusted ]== 0.045 ) Durbin-Conover test
-#> 3 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test
-#> 4 list(~italic(p)[ adjusted ]== 0.050 ) Durbin-Conover test
-#> 5 list(~italic(p)[ adjusted ]== 0.005 ) Durbin-Conover test
-#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test
-#>   p.value.adjustment   
-#>   <chr>                
-#> 1 Benjamini & Yekutieli
-#> 2 Benjamini & Yekutieli
-#> 3 Benjamini & Yekutieli
-#> 4 Benjamini & Yekutieli
-#> 5 Benjamini & Yekutieli
-#> 6 Benjamini & Yekutieli
-
-# robust
-pairwise_comparisons(
-  data = bugs_long,
-  x = condition,
-  y = desire,
-  type = "robust",
-  paired = TRUE,
-  p.adjust.method = "hommel"
-)
-#> # A tibble: 6 x 10
-#>   group1 group2 psihat conf.low conf.high  p.value significance
-#>   <chr>  <chr>   <dbl>    <dbl>     <dbl>    <dbl> <chr>       
-#> 1 HDLF   HDHF   -1.16    -2.00    -0.318  1.49e- 3 **          
-#> 2 LDHF   HDHF   -0.5     -1.19     0.188  6.20e- 2 ns          
-#> 3 LDHF   HDLF    0.701   -0.303    1.71   6.20e- 2 ns          
-#> 4 LDLF   HDHF   -2.10    -2.82    -1.37   1.79e-10 ***         
-#> 5 LDLF   HDLF   -0.938   -1.81    -0.0694 1.36e- 2 *           
-#> 6 LDLF   LDHF   -1.54    -2.27    -0.810  1.16e- 6 ***         
-#>   label                                 test.details             
-#>   <chr>                                 <chr>                    
-#> 1 list(~italic(p)[ adjusted ]== 0.001 ) Yuen's trimmed means test
-#> 2 list(~italic(p)[ adjusted ]== 0.062 ) Yuen's trimmed means test
-#> 3 list(~italic(p)[ adjusted ]== 0.062 ) Yuen's trimmed means test
-#> 4 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test
-#> 5 list(~italic(p)[ adjusted ]== 0.014 ) Yuen's trimmed means test
-#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test
-#>   p.value.adjustment
-#>   <chr>             
-#> 1 Hommel            
-#> 2 Hommel            
-#> 3 Hommel            
-#> 4 Hommel            
-#> 5 Hommel            
-#> 6 Hommel
-
-# Bayes Factor
-pairwise_comparisons(
-  data = WRS2::WineTasting,
-  x = Wine,
-  y = Taste,
-  type = "bayes",
-  paired = TRUE,
-  bf.prior = 0.77
-)
-#> # A tibble: 3 x 11
-#>   group1 group2   bf10   bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01
-#>   <chr>  <chr>   <dbl>  <dbl>      <dbl>      <dbl>       <dbl>       <dbl>
-#> 1 Wine A Wine B  0.219 4.57        -1.52       1.52      -0.660       0.660
-#> 2 Wine A Wine C  3.60  0.277        1.28      -1.28       0.557      -0.557
-#> 3 Wine B Wine C 50.5   0.0198       3.92      -3.92       1.70       -1.70 
-#>   bf.prior label                        test.details    
-#>      <dbl> <chr>                        <chr>           
-#> 1     0.77 list(~log[e](BF[10])==-1.52) Student's t-test
-#> 2     0.77 list(~log[e](BF[10])==1.28)  Student's t-test
-#> 3     0.77 list(~log[e](BF[10])==3.92)  Student's t-test
+
# for reproducibility
+set.seed(123)
+
+# parametric
+pairwise_comparisons(
+  data = bugs_long,
+  x = condition,
+  y = desire,
+  type = "parametric",
+  paired = TRUE,
+  p.adjust.method = "BH"
+)
+#> # A tibble: 6 x 8
+#>   group1 group2 mean.difference  p.value significance
+#>   <chr>  <chr>            <dbl>    <dbl> <chr>       
+#> 1 HDHF   HDLF            -1.15  1.06e- 3 **          
+#> 2 HDHF   LDHF            -0.472 7.02e- 2 ns          
+#> 3 HDHF   LDLF            -2.16  3.95e-12 ***         
+#> 4 HDLF   LDHF             0.676 6.74e- 2 ns          
+#> 5 HDLF   LDLF            -1.02  1.99e- 3 **          
+#> 6 LDHF   LDLF            -1.69  6.66e- 9 ***         
+#>   label                             test.details     p.value.adjustment  
+#>   <chr>                             <chr>            <chr>               
+#> 1 list(~italic(p)[adjusted]==0.001) Student's t-test Benjamini & Hochberg
+#> 2 list(~italic(p)[adjusted]==0.070) Student's t-test Benjamini & Hochberg
+#> 3 list(~italic(p)[adjusted]<=0.001) Student's t-test Benjamini & Hochberg
+#> 4 list(~italic(p)[adjusted]==0.067) Student's t-test Benjamini & Hochberg
+#> 5 list(~italic(p)[adjusted]==0.002) Student's t-test Benjamini & Hochberg
+#> 6 list(~italic(p)[adjusted]<=0.001) Student's t-test Benjamini & Hochberg
+
+# non-parametric
+pairwise_comparisons(
+  data = bugs_long,
+  x = condition,
+  y = desire,
+  type = "nonparametric",
+  paired = TRUE,
+  p.adjust.method = "BY"
+)
+#> # A tibble: 6 x 8
+#>   group1 group2     W  p.value significance label                            
+#>   <chr>  <chr>  <dbl>    <dbl> <chr>        <chr>                            
+#> 1 HDHF   HDLF    4.78 1.44e- 5 ***          list(~italic(p)[adjusted]<=0.001)
+#> 2 HDHF   LDHF    2.44 4.47e- 2 *            list(~italic(p)[adjusted]==0.045)
+#> 3 HDHF   LDLF    8.01 5.45e-13 ***          list(~italic(p)[adjusted]<=0.001)
+#> 4 HDLF   LDHF    2.34 4.96e- 2 *            list(~italic(p)[adjusted]==0.050)
+#> 5 HDLF   LDLF    3.23 5.05e- 3 **           list(~italic(p)[adjusted]==0.005)
+#> 6 LDHF   LDLF    5.57 4.64e- 7 ***          list(~italic(p)[adjusted]<=0.001)
+#>   test.details        p.value.adjustment   
+#>   <chr>               <chr>                
+#> 1 Durbin-Conover test Benjamini & Yekutieli
+#> 2 Durbin-Conover test Benjamini & Yekutieli
+#> 3 Durbin-Conover test Benjamini & Yekutieli
+#> 4 Durbin-Conover test Benjamini & Yekutieli
+#> 5 Durbin-Conover test Benjamini & Yekutieli
+#> 6 Durbin-Conover test Benjamini & Yekutieli
+
+# robust
+pairwise_comparisons(
+  data = bugs_long,
+  x = condition,
+  y = desire,
+  type = "robust",
+  paired = TRUE,
+  p.adjust.method = "hommel"
+)
+#> # A tibble: 6 x 10
+#>   group1 group2 psihat conf.low conf.high  p.value significance
+#>   <chr>  <chr>   <dbl>    <dbl>     <dbl>    <dbl> <chr>       
+#> 1 HDHF   HDLF    1.16    0.318      2.00  1.49e- 3 **          
+#> 2 HDHF   LDHF    0.5    -0.188      1.19  6.20e- 2 ns          
+#> 3 HDHF   LDLF    2.10    1.37       2.82  1.79e-10 ***         
+#> 4 HDLF   LDHF   -0.701  -1.71       0.303 6.20e- 2 ns          
+#> 5 HDLF   LDLF    0.938   0.0694     1.81  1.36e- 2 *           
+#> 6 LDHF   LDLF    1.54    0.810      2.27  1.16e- 6 ***         
+#>   label                             test.details              p.value.adjustment
+#>   <chr>                             <chr>                     <chr>             
+#> 1 list(~italic(p)[adjusted]==0.001) Yuen's trimmed means test Hommel            
+#> 2 list(~italic(p)[adjusted]==0.062) Yuen's trimmed means test Hommel            
+#> 3 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test Hommel            
+#> 4 list(~italic(p)[adjusted]==0.062) Yuen's trimmed means test Hommel            
+#> 5 list(~italic(p)[adjusted]==0.014) Yuen's trimmed means test Hommel            
+#> 6 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test Hommel
+
+# Bayes Factor
+pairwise_comparisons(
+  data = WRS2::WineTasting,
+  x = Wine,
+  y = Taste,
+  type = "bayes",
+  paired = TRUE,
+  bf.prior = 0.77
+)
+#> # A tibble: 3 x 11
+#>   group1 group2   bf10   bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01
+#>   <chr>  <chr>   <dbl>  <dbl>      <dbl>      <dbl>       <dbl>       <dbl>
+#> 1 Wine A Wine B  0.219 4.57        -1.52       1.52      -0.660       0.660
+#> 2 Wine A Wine C  3.60  0.277        1.28      -1.28       0.557      -0.557
+#> 3 Wine B Wine C 50.5   0.0198       3.92      -3.92       1.70       -1.70 
+#>   bf.prior label                        test.details    
+#>      <dbl> <chr>                        <chr>           
+#> 1     0.77 list(~log[e](BF[10])==-1.52) Student's t-test
+#> 2     0.77 list(~log[e](BF[10])==1.28)  Student's t-test
+#> 3     0.77 list(~log[e](BF[10])==3.92)  Student's t-test

@@ -563,93 +547,94 @@

Example-1: between-subjects

-
# needed libraries
-library(ggplot2)
-library(pairwiseComparisons)
-library(ggsignif)
-
-# converting to factor
-mtcars$cyl <- as.factor(mtcars$cyl)
-
-# creating a basic plot
-p <- ggplot(mtcars, aes(cyl, wt)) + geom_boxplot()
-
-# using `pairwiseComparisons` package to create a dataframe with results
-(df <-
-  pairwise_comparisons(mtcars, cyl, wt, messages = FALSE) %>%
-  dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>%
-  dplyr::arrange(.data = ., group1))
-#> # A tibble: 3 x 12
-#>   group1 group2 mean.difference    se t.value    df p.value significance
-#>   <chr>  <chr>            <dbl> <dbl>   <dbl> <dbl>   <dbl> <chr>       
-#> 1 4      8                1.71  0.188    6.44  23.0   0     ***         
-#> 2 6      4               -0.831 0.154    3.81  16.0   0.008 **          
-#> 3 6      8                0.882 0.172    3.62  19.0   0.008 **          
-#>   label                                 test.details      p.value.adjustment
-#>   <chr>                                 <chr>             <chr>             
-#> 1 list(~italic(p)[ adjusted ]<= 0.001 ) Games-Howell test Holm              
-#> 2 list(~italic(p)[ adjusted ]== 0.008 ) Games-Howell test Holm              
-#> 3 list(~italic(p)[ adjusted ]== 0.008 ) Games-Howell test Holm              
-#>   groups   
-#>   <list>   
-#> 1 <chr [2]>
-#> 2 <chr [2]>
-#> 3 <chr [2]>
-
-# using `geom_signif` to display results
-p +
-  ggsignif::geom_signif(
-    comparisons = df$groups,
-    map_signif_level = TRUE,
-    tip_length = 0.01,
-    y_position = c(5.5, 5.75, 6),
-    annotations = df$label,
-    test = NULL,
-    na.rm = TRUE,
-    parse = TRUE
-  )
+
# needed libraries
+library(ggplot2)
+library(pairwiseComparisons)
+library(ggsignif)
+
+# converting to factor
+mtcars$cyl <- as.factor(mtcars$cyl)
+
+# creating a basic plot
+p <- ggplot(mtcars, aes(cyl, wt)) +
+  geom_boxplot()
+
+# using `pairwiseComparisons` package to create a dataframe with results
+(df <-
+  pairwise_comparisons(mtcars, cyl, wt, messages = FALSE) %>%
+  dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>%
+  dplyr::arrange(.data = ., group1))
+#> # A tibble: 3 x 12
+#>   group1 group2 mean.difference    se t.value    df p.value significance
+#>   <chr>  <chr>            <dbl> <dbl>   <dbl> <dbl>   <dbl> <chr>       
+#> 1 4      6                0.831 0.154    3.81  16.0   0.008 **          
+#> 2 4      8                1.71  0.188    6.44  23.0   0     ***         
+#> 3 6      8                0.882 0.172    3.62  19.0   0.008 **          
+#>   label                             test.details      p.value.adjustment
+#>   <chr>                             <chr>             <chr>             
+#> 1 list(~italic(p)[adjusted]==0.008) Games-Howell test Holm              
+#> 2 list(~italic(p)[adjusted]<=0.001) Games-Howell test Holm              
+#> 3 list(~italic(p)[adjusted]==0.008) Games-Howell test Holm              
+#>   groups   
+#>   <list>   
+#> 1 <chr [2]>
+#> 2 <chr [2]>
+#> 3 <chr [2]>
+
+# using `geom_signif` to display results
+p +
+  ggsignif::geom_signif(
+    comparisons = df$groups,
+    map_signif_level = TRUE,
+    tip_length = 0.01,
+    y_position = c(5.5, 5.75, 6),
+    annotations = df$label,
+    test = NULL,
+    na.rm = TRUE,
+    parse = TRUE
+  )

Example-2: within-subjects

-
# needed libraries
-library(ggplot2)
-library(pairwiseComparisons)
-library(ggsignif)
-
-# creating a basic plot
-p <- ggplot(WRS2::WineTasting, aes(Wine, Taste)) + geom_boxplot()
-
-# using `pairwiseComparisons` package to create a dataframe with results
-(df <-
-  pairwise_comparisons(WRS2::WineTasting, Wine, Taste, type = "bayes", paired = TRUE) %>%
-  dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>%
-  dplyr::arrange(.data = ., group1))
-#> # A tibble: 3 x 12
-#>   group1 group2   bf10   bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01
-#>   <chr>  <chr>   <dbl>  <dbl>      <dbl>      <dbl>       <dbl>       <dbl>
-#> 1 Wine A Wine B  0.235 4.25        -1.45       1.45      -0.628       0.628
-#> 2 Wine A Wine C  3.71  0.269        1.31      -1.31       0.570      -0.570
-#> 3 Wine B Wine C 50.5   0.0198       3.92      -3.92       1.70       -1.70 
-#>   bf.prior label                        test.details     groups   
-#>      <dbl> <chr>                        <chr>            <list>   
-#> 1    0.707 list(~log[e](BF[10])==-1.45) Student's t-test <chr [2]>
-#> 2    0.707 list(~log[e](BF[10])==1.31)  Student's t-test <chr [2]>
-#> 3    0.707 list(~log[e](BF[10])==3.92)  Student's t-test <chr [2]>
-
-# using `geom_signif` to display results
-p +
-  ggsignif::geom_signif(
-    comparisons = df$groups,
-    map_signif_level = TRUE,
-    tip_length = 0.01,
-    y_position = c(6.5, 6.65, 6.8),
-    annotations = df$label,
-    test = NULL,
-    na.rm = TRUE,
-    parse = TRUE
-  )
+
# needed libraries
+library(ggplot2)
+library(pairwiseComparisons)
+library(ggsignif)
+
+# creating a basic plot
+p <- ggplot(WRS2::WineTasting, aes(Wine, Taste)) + geom_boxplot()
+
+# using `pairwiseComparisons` package to create a dataframe with results
+(df <-
+  pairwise_comparisons(WRS2::WineTasting, Wine, Taste, type = "bayes", paired = TRUE) %>%
+  dplyr::mutate(.data = ., groups = purrr::pmap(.l = list(group1, group2), .f = c)) %>%
+  dplyr::arrange(.data = ., group1))
+#> # A tibble: 3 x 12
+#>   group1 group2   bf10   bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01
+#>   <chr>  <chr>   <dbl>  <dbl>      <dbl>      <dbl>       <dbl>       <dbl>
+#> 1 Wine A Wine B  0.235 4.25        -1.45       1.45      -0.628       0.628
+#> 2 Wine A Wine C  3.71  0.269        1.31      -1.31       0.570      -0.570
+#> 3 Wine B Wine C 50.5   0.0198       3.92      -3.92       1.70       -1.70 
+#>   bf.prior label                        test.details     groups   
+#>      <dbl> <chr>                        <chr>            <list>   
+#> 1    0.707 list(~log[e](BF[10])==-1.45) Student's t-test <chr [2]>
+#> 2    0.707 list(~log[e](BF[10])==1.31)  Student's t-test <chr [2]>
+#> 3    0.707 list(~log[e](BF[10])==3.92)  Student's t-test <chr [2]>
+
+# using `geom_signif` to display results
+p +
+  ggsignif::geom_signif(
+    comparisons = df$groups,
+    map_signif_level = TRUE,
+    tip_length = 0.01,
+    y_position = c(6.5, 6.65, 6.8),
+    annotations = df$label,
+    test = NULL,
+    na.rm = TRUE,
+    parse = TRUE
+  )

@@ -667,7 +652,7 @@

  • Read and correct any inconsistencies in the documentation

  • Raise issues about bugs or wanted features

  • Review code

  • -
  • Add new functionality (in the form of new plotting functions or helpers for preparing subtitles)

  • +
  • Add new functionality

  • Please note that this project is released with a Contributor Code of Conduct. By participating in this project you agree to abide by its terms.

    @@ -724,7 +709,7 @@

    Developers

    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/news/index.html b/docs/news/index.html index 1167a45..d4fdc7b 100644 --- a/docs/news/index.html +++ b/docs/news/index.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -136,10 +136,14 @@

    Changelog

    Source: NEWS.md -
    -

    -pairwiseComparisons 1.1.2.9000 Unreleased +
    +

    +pairwiseComparisons 2.0.0 Unreleased

    +
      +
    • Fixes a bug which affected results for within-subjects design when the dataframe wasn’t sorted by x (#19).

    • +
    • This fix also now makes the results more consistent, such that irrespective of which type of statistics is chosen the group1 and group2 columns are in identical order.

    • +

    @@ -254,7 +258,7 @@

    Contents

    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/pkgdown.css b/docs/pkgdown.css index c01e592..1273238 100644 --- a/docs/pkgdown.css +++ b/docs/pkgdown.css @@ -244,14 +244,14 @@ nav[data-toggle='toc'] .nav .nav > .active:focus > a { .ref-index th {font-weight: normal;} -.ref-index td {vertical-align: top;} +.ref-index td {vertical-align: top; min-width: 100px} .ref-index .icon {width: 40px;} .ref-index .alias {width: 40%;} .ref-index-icons .alias {width: calc(40% - 40px);} .ref-index .title {width: 60%;} .ref-arguments th {text-align: right; padding-right: 10px;} -.ref-arguments th, .ref-arguments td {vertical-align: top;} +.ref-arguments th, .ref-arguments td {vertical-align: top; min-width: 100px} .ref-arguments .name {width: 20%;} .ref-arguments .desc {width: 80%;} diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml index b3b430b..1e90014 100644 --- a/docs/pkgdown.yml +++ b/docs/pkgdown.yml @@ -1,8 +1,8 @@ -pandoc: '2.10' -pkgdown: 1.5.1 -pkgdown_sha: ~ +pandoc: 2.10.1 +pkgdown: 1.5.1.9000 +pkgdown_sha: c6b35532515a7ae433eff4b547d77eeae4278664 articles: [] -last_built: 2020-07-13T22:02Z +last_built: 2020-09-04T11:36Z urls: reference: https://indrajeetpatil.github.io/pairwiseComparisons//reference article: https://indrajeetpatil.github.io/pairwiseComparisons//articles diff --git a/docs/reference/Rplot001.png b/docs/reference/Rplot001.png new file mode 100644 index 0000000..17a3580 Binary files /dev/null and b/docs/reference/Rplot001.png differ diff --git a/docs/reference/bugs_long.html b/docs/reference/bugs_long.html index 1ef0b81..c235253 100644 --- a/docs/reference/bugs_long.html +++ b/docs/reference/bugs_long.html @@ -88,7 +88,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0

    @@ -142,7 +142,7 @@

    Tidy version of the "Bugs" dataset.

    Tidy version of the "Bugs" dataset.

    -
    bugs_long
    +
    bugs_long

    Format

    @@ -172,22 +172,25 @@

    Details all anthropods. Subset of the data reported by Ryan et al. (2013).

    Examples

    -
    dim(bugs_long)
    #> [1] 372 6
    head(bugs_long)
    #> # A tibble: 6 x 6 -#> subject gender region education condition desire +
    dim(bugs_long) +
    #> [1] 372 6
    head(bugs_long) +
    #> # A tibble: 6 x 6 +#> subject gender region education condition desire #> <int> <fct> <fct> <fct> <chr> <dbl> #> 1 1 Female North America some LDLF 6 #> 2 2 Female North America advance LDLF 10 #> 3 3 Female Europe college LDLF 5 #> 4 4 Female North America college LDLF 6 #> 5 5 Female North America some LDLF 3 -#> 6 6 Female Europe some LDLF 2
    dplyr::glimpse(bugs_long)
    #> Rows: 372 +#> 6 6 Female Europe some LDLF 2
    dplyr::glimpse(bugs_long) +
    #> Rows: 372 #> Columns: 6 -#> $ subject <int> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17... -#> $ gender <fct> Female, Female, Female, Female, Female, Female, Female, F... -#> $ region <fct> North America, North America, Europe, North America, Nort... -#> $ education <fct> some, advance, college, college, some, some, some, high, ... -#> $ condition <chr> "LDLF", "LDLF", "LDLF", "LDLF", "LDLF", "LDLF", "LDLF", "... -#> $ desire <dbl> 6.0, 10.0, 5.0, 6.0, 3.0, 2.0, 10.0, 10.0, 9.5, 8.5, 0.0,...
    +#> $
    subject <int> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17... +#> $ gender <fct> Female, Female, Female, Female, Female, Female, Female, F... +#> $ region <fct> North America, North America, Europe, North America, Nort... +#> $ education <fct> some, advance, college, college, some, some, some, high, ... +#> $ condition <chr> "LDLF", "LDLF", "LDLF", "LDLF", "LDLF", "LDLF", "LDLF", "... +#> $ desire <dbl> 6.0, 10.0, 5.0, 6.0, 3.0, 2.0, 10.0, 10.0, 9.5, 8.5, 0.0,...
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/figures/README-ggsignif-1.png b/docs/reference/figures/README-ggsignif-1.png index 6eaaab1..4399dd6 100644 Binary files a/docs/reference/figures/README-ggsignif-1.png and b/docs/reference/figures/README-ggsignif-1.png differ diff --git a/docs/reference/games_howell.html b/docs/reference/games_howell.html index 3da9782..af13c7f 100644 --- a/docs/reference/games_howell.html +++ b/docs/reference/games_howell.html @@ -89,7 +89,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -144,15 +144,15 @@

    Games-Howell post-hoc test

    for Welch's one-way analysis of variance (ANOVA) (stats::oneway.test()).

    -
    games_howell(data, x, y)
    +
    games_howell(data, x, y)

    Arguments

    - + @@ -186,7 +186,7 @@

    Contents

    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/index.html b/docs/reference/index.html index 1805b60..9138abb 100644 --- a/docs/reference/index.html +++ b/docs/reference/index.html @@ -87,7 +87,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -261,7 +261,7 @@

    Contents

    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/iris_long.html b/docs/reference/iris_long.html index ce66563..b2d285b 100644 --- a/docs/reference/iris_long.html +++ b/docs/reference/iris_long.html @@ -88,7 +88,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -142,7 +142,7 @@

    Edgar Anderson's Iris Data in long format.

    Edgar Anderson's Iris Data in long format.

    -
    iris_long
    +
    iris_long

    Format

    @@ -169,22 +169,25 @@

    Details

    This is a modified dataset from datasets package.

    Examples

    -
    dim(iris_long)
    #> [1] 600 6
    head(iris_long)
    #> # A tibble: 6 x 6 -#> id Species condition attribute measure value +
    dim(iris_long) +
    #> [1] 600 6
    head(iris_long) +
    #> # A tibble: 6 x 6 +#> id Species condition attribute measure value #> <int> <fct> <fct> <fct> <fct> <dbl> #> 1 1 setosa Sepal.Length Sepal Length 5.1 #> 2 2 setosa Sepal.Length Sepal Length 4.9 #> 3 3 setosa Sepal.Length Sepal Length 4.7 #> 4 4 setosa Sepal.Length Sepal Length 4.6 #> 5 5 setosa Sepal.Length Sepal Length 5 -#> 6 6 setosa Sepal.Length Sepal Length 5.4
    dplyr::glimpse(iris_long)
    #> Rows: 600 +#> 6 6 setosa Sepal.Length Sepal Length 5.4
    dplyr::glimpse(iris_long) +
    #> Rows: 600 #> Columns: 6 -#> $ id <int> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17... -#> $ Species <fct> setosa, setosa, setosa, setosa, setosa, setosa, setosa, s... -#> $ condition <fct> Sepal.Length, Sepal.Length, Sepal.Length, Sepal.Length, S... -#> $ attribute <fct> Sepal, Sepal, Sepal, Sepal, Sepal, Sepal, Sepal, Sepal, S... -#> $ measure <fct> Length, Length, Length, Length, Length, Length, Length, L... -#> $ value <dbl> 5.1, 4.9, 4.7, 4.6, 5.0, 5.4, 4.6, 5.0, 4.4, 4.9, 5.4, 4....
    +#> $
    id <int> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17... +#> $ Species <fct> setosa, setosa, setosa, setosa, setosa, setosa, setosa, s... +#> $ condition <fct> Sepal.Length, Sepal.Length, Sepal.Length, Sepal.Length, S... +#> $ attribute <fct> Sepal, Sepal, Sepal, Sepal, Sepal, Sepal, Sepal, Sepal, S... +#> $ measure <fct> Length, Length, Length, Length, Length, Length, Length, L... +#> $ value <dbl> 5.1, 4.9, 4.7, 4.6, 5.0, 5.4, 4.6, 5.0, 4.4, 4.9, 5.4, 4....
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/movies_long.html b/docs/reference/movies_long.html index 638ff92..93ea23e 100644 --- a/docs/reference/movies_long.html +++ b/docs/reference/movies_long.html @@ -88,7 +88,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -142,7 +142,7 @@

    Movie information and user ratings from IMDB.com (long format).

    Movie information and user ratings from IMDB.com (long format).

    -
    movies_long
    +
    movies_long

    Format

    @@ -165,20 +165,18 @@

    SourceDetails

    Modified dataset from ggplot2movies package.

    -

    The internet movie database, http://imdb.com/, is a website devoted +

    The internet movie database, https://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, -http://imdb.com/help/show_leaf?about, including information about -the data collection process, -http://imdb.com/help/show_leaf?infosource.

    +biggest movie database on the web and is run by amazon.

    Movies were are identical to those selected for inclusion in movies_wide but this dataset has been constructed such that every movie appears in one and only one genre category.

    Examples

    -
    dim(movies_long)
    #> [1] 1579 8
    head(movies_long)
    #> # A tibble: 6 x 8 -#> title year length budget rating +
    dim(movies_long) +
    #> [1] 1579 8
    head(movies_long) +
    #> # A tibble: 6 x 8 +#> title year length budget rating #> <chr> <int> <int> <dbl> <dbl> #> 1 Shawshank Redemption, The 1994 142 25 9.1 #> 2 Lord of the Rings: The Return of the King, The 2003 251 94 9 @@ -186,23 +184,24 @@

    Examp #> 4 Lord of the Rings: The Two Towers, The 2002 223 94 8.8 #> 5 Pulp Fiction 1994 168 8 8.8 #> 6 Schindler's List 1993 195 25 8.8 -#> votes mpaa genre +#> votes mpaa genre #> <int> <fct> <fct> #> 1 149494 R Drama #> 2 103631 PG-13 Action #> 3 157608 PG-13 Action #> 4 114797 PG-13 Action #> 5 132745 R Drama -#> 6 97667 R Drama

    dplyr::glimpse(movies_long)
    #> Rows: 1,579 +#> 6 97667 R Drama
    dplyr::glimpse(movies_long) +
    #> Rows: 1,579 #> Columns: 8 -#> $ title <chr> "Shawshank Redemption, The", "Lord of the Rings: The Return ... -#> $ year <int> 1994, 2003, 2001, 2002, 1994, 1993, 1977, 1980, 1968, 2002, ... -#> $ length <int> 142, 251, 208, 223, 168, 195, 125, 129, 158, 135, 93, 113, 1... -#> $ budget <dbl> 25.0, 94.0, 93.0, 94.0, 8.0, 25.0, 11.0, 18.0, 5.0, 3.3, 1.8... -#> $ rating <dbl> 9.1, 9.0, 8.8, 8.8, 8.8, 8.8, 8.8, 8.8, 8.7, 8.7, 8.7, 8.7, ... -#> $ votes <int> 149494, 103631, 157608, 114797, 132745, 97667, 134640, 10370... -#> $ mpaa <fct> R, PG-13, PG-13, PG-13, R, R, PG, PG, PG-13, R, PG, R, R, R,... -#> $ genre <fct> Drama, Action, Action, Action, Drama, Drama, Action, Action,...
    +#> $
    title <chr> "Shawshank Redemption, The", "Lord of the Rings: The Return ... +#> $ year <int> 1994, 2003, 2001, 2002, 1994, 1993, 1977, 1980, 1968, 2002, ... +#> $ length <int> 142, 251, 208, 223, 168, 195, 125, 129, 158, 135, 93, 113, 1... +#> $ budget <dbl> 25.0, 94.0, 93.0, 94.0, 8.0, 25.0, 11.0, 18.0, 5.0, 3.3, 1.8... +#> $ rating <dbl> 9.1, 9.0, 8.8, 8.8, 8.8, 8.8, 8.8, 8.8, 8.7, 8.7, 8.7, 8.7, ... +#> $ votes <int> 149494, 103631, 157608, 114797, 132745, 97667, 134640, 10370... +#> $ mpaa <fct> R, PG-13, PG-13, PG-13, R, R, PG, PG, PG-13, R, PG, R, R, R,... +#> $ genre <fct> Drama, Action, Action, Action, Drama, Drama, Action, Action,...
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/movies_wide.html b/docs/reference/movies_wide.html index 2ab6e44..301e59d 100644 --- a/docs/reference/movies_wide.html +++ b/docs/reference/movies_wide.html @@ -88,7 +88,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -142,7 +142,7 @@

    Movie information and user ratings from IMDB.com (wide format).

    Movie information and user ratings from IMDB.com (wide format).

    -
    movies_wide
    +
    movies_wide

    Format

    @@ -167,20 +167,18 @@

    SourceDetails

    Modified dataset from ggplot2movies package.

    -

    The internet movie database, 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 information -about imdb.com can be found online, -http://imdb.com/help/show_leaf?about, including information about -the data collection process, -http://imdb.com/help/show_leaf?infosource.

    +

    The internet movie database, https://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.

    Movies were selected for inclusion if they had a known length and had been rated by at least one imdb user. Small categories such as documentaries and NC-17 movies were removed.

    Examples

    -
    dim(movies_wide)
    #> [1] 1579 13
    head(movies_wide)
    #> # A tibble: 6 x 13 -#> title year length budget rating votes mpaa Action +
    dim(movies_wide) +
    #> [1] 1579 13
    head(movies_wide) +
    #> # A tibble: 6 x 13 +#> title year length budget rating votes mpaa Action #> <chr> <int> <int> <dbl> <dbl> <int> <fct> <int> #> 1 'Til There Was You 1997 113 23 4.8 799 PG-13 0 #> 2 10 Things I Hate About You 1999 97 16 6.7 19095 PG-13 0 @@ -188,28 +186,29 @@

    Examp #> 4 13 Going On 30 2004 98 37 6.4 7859 PG-13 0 #> 5 13th Warrior, The 1999 102 85 6.1 14344 R 1 #> 6 15 Minutes 2001 120 42 6.1 10866 R 0 -#> Animation Comedy Drama Romance NumGenre +#> Animation Comedy Drama Romance NumGenre #> <int> <int> <int> <int> <int> #> 1 0 1 0 1 2 #> 2 0 1 0 1 2 #> 3 0 1 0 0 1 #> 4 0 1 1 1 3 #> 5 0 0 0 0 1 -#> 6 0 0 1 0 1

    dplyr::glimpse(movies_wide)
    #> Rows: 1,579 +#> 6 0 0 1 0 1
    dplyr::glimpse(movies_wide) +
    #> Rows: 1,579 #> Columns: 13 -#> $ title <chr> "'Til There Was You", "10 Things I Hate About You", "100 ... -#> $ year <int> 1997, 1999, 2002, 2004, 1999, 2001, 1972, 2003, 1999, 200... -#> $ length <int> 113, 97, 98, 98, 102, 120, 180, 107, 101, 99, 129, 124, 9... -#> $ budget <dbl> 23.0, 16.0, 1.1, 37.0, 85.0, 42.0, 4.0, 76.0, 6.0, 26.0, ... -#> $ rating <dbl> 4.8, 6.7, 5.6, 6.4, 6.1, 6.1, 7.3, 5.1, 5.4, 2.5, 7.6, 8.... -#> $ votes <int> 799, 19095, 181, 7859, 14344, 10866, 1754, 9556, 4514, 20... -#> $ mpaa <fct> PG-13, PG-13, R, PG-13, R, R, PG, PG-13, R, R, R, R, R, R... -#> $ Action <int> 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, ... -#> $ Animation <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, ... -#> $ Comedy <int> 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 0, 0, 1, 0, 0, 1, 1, 1, 1, ... -#> $ Drama <int> 0, 0, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 1, 0, 1, 0, 0, ... -#> $ Romance <int> 1, 1, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 1, 0, ... -#> $ NumGenre <int> 2, 2, 1, 3, 1, 1, 1, 1, 2, 1, 2, 1, 1, 1, 1, 2, 3, 2, 2, ...
    +#> $
    title <chr> "'Til There Was You", "10 Things I Hate About You", "100 ... +#> $ year <int> 1997, 1999, 2002, 2004, 1999, 2001, 1972, 2003, 1999, 200... +#> $ length <int> 113, 97, 98, 98, 102, 120, 180, 107, 101, 99, 129, 124, 9... +#> $ budget <dbl> 23.0, 16.0, 1.1, 37.0, 85.0, 42.0, 4.0, 76.0, 6.0, 26.0, ... +#> $ rating <dbl> 4.8, 6.7, 5.6, 6.4, 6.1, 6.1, 7.3, 5.1, 5.4, 2.5, 7.6, 8.... +#> $ votes <int> 799, 19095, 181, 7859, 14344, 10866, 1754, 9556, 4514, 20... +#> $ mpaa <fct> PG-13, PG-13, R, PG-13, R, R, PG, PG-13, R, R, R, R, R, R... +#> $ Action <int> 0, 0, 0, 0, 1, 0, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 0, 0, 1, ... +#> $ Animation <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, ... +#> $ Comedy <int> 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 0, 0, 1, 0, 0, 1, 1, 1, 1, ... +#> $ Drama <int> 0, 0, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 0, 1, 1, 0, 1, 0, 0, ... +#> $ Romance <int> 1, 1, 0, 1, 0, 0, 0, 0, 0, 0, 1, 0, 0, 0, 0, 0, 1, 1, 0, ... +#> $ NumGenre <int> 2, 2, 1, 3, 1, 1, 1, 1, 2, 1, 2, 1, 1, 1, 1, 2, 3, 2, 2, ...
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/p_adjust_text.html b/docs/reference/p_adjust_text.html index 8c841b1..89d30b0 100644 --- a/docs/reference/p_adjust_text.html +++ b/docs/reference/p_adjust_text.html @@ -6,7 +6,7 @@ -Preparing text to describe which <em>p</em>-value adjustment method was used — p_adjust_text • pairwiseComparisons +Preparing text to describe which p-value adjustment method was used — p_adjust_text • pairwiseComparisons @@ -54,7 +54,7 @@ - + @@ -88,7 +88,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -142,7 +142,7 @@

    Preparing text to describe which p-value adjustment method was used

    Preparing text to describe which p-value adjustment method was used

    -
    p_adjust_text(p.adjust.method)
    +
    p_adjust_text(p.adjust.method)

    Arguments

    data

    A dataframe (or a tibble) from which variables specified are to -be taken. A matrix or tables will not be accepted.

    A dataframe from which variables specified are to be taken. A +matrix or tables will not be accepted.

    x
    @@ -160,8 +160,10 @@

    Value

    Standardized text description for what method was used.

    Examples

    -
    library(pairwiseComparisons) -p_adjust_text("none")
    #> [1] "None"
    p_adjust_text("BY")
    #> [1] "Benjamini & Yekutieli"
    +
    library(pairwiseComparisons) +p_adjust_text("none") +
    #> [1] "None"
    p_adjust_text("BY") +
    #> [1] "Benjamini & Yekutieli"
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/pairwise_caption.html b/docs/reference/pairwise_caption.html index 0132fb9..57e9d11 100644 --- a/docs/reference/pairwise_caption.html +++ b/docs/reference/pairwise_caption.html @@ -90,7 +90,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -146,7 +146,7 @@

    Expression containing details about pairwise comparison test

    typically included in ggstatsplot package plots as a caption.

    -
    pairwise_caption(caption, test.description, p.adjust.method)
    +
    pairwise_caption(caption, test.description, p.adjust.method)

    Arguments

    @@ -169,8 +169,9 @@

    Arg

    Examples

    -
    library(pairwiseComparisons) -pairwise_caption("my caption", "Student's t-test", "holm")
    #> atop(displaystyle("my caption"), expr = paste("Pairwise comparisons: ", +
    library(pairwiseComparisons) +pairwise_caption("my caption", "Student's t-test", "holm") +
    #> atop(displaystyle("my caption"), expr = paste("Pairwise comparisons: ", #> bold("Student's t-test"), "; Adjustment (p-value): ", bold("Holm")))
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/pairwise_comparisons.html b/docs/reference/pairwise_comparisons.html index 708ba4d..2ed40dd 100644 --- a/docs/reference/pairwise_comparisons.html +++ b/docs/reference/pairwise_comparisons.html @@ -89,7 +89,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -145,31 +145,31 @@

    Multiple pairwise comparison tests with tidy data

    pairwise_comparisons(
    -  data,
    -  x,
    -  y,
    -  type = "parametric",
    -  paired = FALSE,
    -  var.equal = FALSE,
    -  tr = 0.1,
    -  bf.prior = 0.707,
    -  p.adjust.method = "holm",
    -  k = 2L,
    -  ...
    +  data,
    +  x,
    +  y,
    +  type = "parametric",
    +  paired = FALSE,
    +  var.equal = FALSE,
    +  tr = 0.1,
    +  bf.prior = 0.707,
    +  p.adjust.method = "holm",
    +  k = 2L,
    +  ...
     )
     
     pairwise_p(
    -  data,
    -  x,
    -  y,
    -  type = "parametric",
    -  paired = FALSE,
    -  var.equal = FALSE,
    -  tr = 0.1,
    -  bf.prior = 0.707,
    -  p.adjust.method = "holm",
    -  k = 2L,
    -  ...
    +  data,
    +  x,
    +  y,
    +  type = "parametric",
    +  paired = FALSE,
    +  var.equal = FALSE,
    +  tr = 0.1,
    +  bf.prior = 0.707,
    +  p.adjust.method = "holm",
    +  k = 2L,
    +  ...
     )

    Arguments

    @@ -177,8 +177,8 @@

    Arg

    - + @@ -251,7 +251,7 @@

    Value

    The significance column asterisks indicate significance levels of p-values in the American Psychological Association (APA) mandated format:

    • ns : > 0.05

    • -
    • * : < 0.05

    • +
    • * : < 0.05

    • ** : < 0.01

    • *** : < 0.001

    @@ -262,124 +262,130 @@

    Examp # \donttest{ # for reproducibility set.seed(123) -library(pairwiseComparisons) +library(pairwiseComparisons) #------------------- between-subjects design ---------------------------- # parametric # if `var.equal = TRUE`, then Student's t-test will be run pairwise_comparisons( - data = mtcars, - x = cyl, - y = wt, - type = "parametric", - var.equal = TRUE, - paired = FALSE, - p.adjust.method = "none" -)
    #> # A tibble: 3 x 8 -#> group1 group2 mean.difference p.value significance + data = mtcars, + x = cyl, + y = wt, + type = "parametric", + var.equal = TRUE, + paired = FALSE, + p.adjust.method = "none" +) +
    #> # A tibble: 3 x 8 +#> group1 group2 mean.difference p.value significance #> <chr> <chr> <dbl> <dbl> <chr> #> 1 4 6 0.831 0.0106 * #> 2 4 8 1.71 0.000000207 *** #> 3 6 8 0.882 0.00516 ** -#> label test.details p.value.adjustment -#> <chr> <chr> <chr> -#> 1 list(~italic(p)[ unadjusted ]== 0.011 ) Student's t-test None -#> 2 list(~italic(p)[ unadjusted ]<= 0.001 ) Student's t-test None -#> 3 list(~italic(p)[ unadjusted ]== 0.005 ) Student's t-test None
    +#> label test.details p.value.adjustment +#> <chr> <chr> <chr> +#> 1 list(~italic(p)[unadjusted]==0.011) Student's t-test None +#> 2 list(~italic(p)[unadjusted]<=0.001) Student's t-test None +#> 3 list(~italic(p)[unadjusted]==0.005) Student's t-test None
    # if `var.equal = FALSE`, then Games-Howell test will be run pairwise_comparisons( - data = mtcars, - x = cyl, - y = wt, - type = "parametric", - var.equal = FALSE, - paired = FALSE, - p.adjust.method = "bonferroni" -)
    #> # A tibble: 3 x 11 -#> group1 group2 mean.difference se t.value df p.value significance + data = mtcars, + x = cyl, + y = wt, + type = "parametric", + var.equal = FALSE, + paired = FALSE, + p.adjust.method = "bonferroni" +) +
    #> # A tibble: 3 x 11 +#> group1 group2 mean.difference se t.value df p.value significance #> <chr> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <chr> -#> 1 4 8 1.71 0.188 6.44 23.0 0 *** -#> 2 6 4 -0.831 0.154 3.81 16.0 0.012 * +#> 1 4 6 0.831 0.154 3.81 16.0 0.012 * +#> 2 4 8 1.71 0.188 6.44 23.0 0 *** #> 3 6 8 0.882 0.172 3.62 19.0 0.015 * -#> label test.details p.value.adjustment -#> <chr> <chr> <chr> -#> 1 list(~italic(p)[ adjusted ]<= 0.001 ) Games-Howell test Bonferroni -#> 2 list(~italic(p)[ adjusted ]== 0.012 ) Games-Howell test Bonferroni -#> 3 list(~italic(p)[ adjusted ]== 0.015 ) Games-Howell test Bonferroni
    +#> label test.details p.value.adjustment +#> <chr> <chr> <chr> +#> 1 list(~italic(p)[adjusted]==0.012) Games-Howell test Bonferroni +#> 2 list(~italic(p)[adjusted]<=0.001) Games-Howell test Bonferroni +#> 3 list(~italic(p)[adjusted]==0.015) Games-Howell test Bonferroni
    # non-parametric (Dunn test) pairwise_comparisons( - data = mtcars, - x = cyl, - y = wt, - type = "nonparametric", - paired = FALSE, - p.adjust.method = "none" -)
    #> # A tibble: 3 x 8 -#> group1 group2 z.value p.value significance + data = mtcars, + x = cyl, + y = wt, + type = "nonparametric", + paired = FALSE, + p.adjust.method = "none" +) +
    #> # A tibble: 3 x 8 +#> group1 group2 z.value p.value significance #> <chr> <chr> <dbl> <dbl> <chr> #> 1 4 6 1.84 0.0663 ns #> 2 4 8 4.76 0.00000198 *** #> 3 6 8 2.22 0.0263 * -#> label test.details p.value.adjustment -#> <chr> <chr> <chr> -#> 1 list(~italic(p)[ unadjusted ]== 0.066 ) Dunn test None -#> 2 list(~italic(p)[ unadjusted ]<= 0.001 ) Dunn test None -#> 3 list(~italic(p)[ unadjusted ]== 0.026 ) Dunn test None
    +#> label test.details p.value.adjustment +#> <chr> <chr> <chr> +#> 1 list(~italic(p)[unadjusted]==0.066) Dunn test None +#> 2 list(~italic(p)[unadjusted]<=0.001) Dunn test None +#> 3 list(~italic(p)[unadjusted]==0.026) Dunn test None
    # robust (Yuen's trimmed means t-test) pairwise_comparisons( - data = mtcars, - x = cyl, - y = wt, - type = "robust", - paired = FALSE, - p.adjust.method = "fdr" -)
    #> # A tibble: 3 x 10 -#> group1 group2 psihat conf.low conf.high p.value significance + data = mtcars, + x = cyl, + y = wt, + type = "robust", + paired = FALSE, + p.adjust.method = "fdr" +) +
    #> # A tibble: 3 x 10 +#> group1 group2 psihat conf.low conf.high p.value significance #> <chr> <chr> <dbl> <dbl> <dbl> <dbl> <chr> #> 1 4 6 -0.846 -1.51 -0.180 0.00625 ** #> 2 4 8 -1.68 -2.48 -0.878 0.000258 *** #> 3 6 8 -0.832 -1.53 -0.131 0.00625 ** -#> label test.details -#> <chr> <chr> -#> 1 list(~italic(p)[ adjusted ]== 0.006 ) Yuen's trimmed means test -#> 2 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test -#> 3 list(~italic(p)[ adjusted ]== 0.006 ) Yuen's trimmed means test -#> p.value.adjustment +#> label test.details +#> <chr> <chr> +#> 1 list(~italic(p)[adjusted]==0.006) Yuen's trimmed means test +#> 2 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test +#> 3 list(~italic(p)[adjusted]==0.006) Yuen's trimmed means test +#> p.value.adjustment #> <chr> #> 1 Benjamini & Hochberg #> 2 Benjamini & Hochberg #> 3 Benjamini & Hochberg
    # Bayes Factor (Student's t-test) pairwise_comparisons( - data = mtcars, - x = cyl, - y = wt, - type = "bayes", - paired = FALSE -)
    #> # A tibble: 3 x 11 -#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 + data = mtcars, + x = cyl, + y = wt, + type = "bayes", + paired = FALSE +) +
    #> # A tibble: 3 x 11 +#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 #> <chr> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> -#> 1 6 4 11.4 0.0874 2.44 -2.44 1.06 -1.06 -#> 2 6 8 5.36 0.187 1.68 -1.68 0.729 -0.729 -#> 3 4 8 5222. 0.000192 8.56 -8.56 3.72 -3.72 -#> bf.prior label test.details +#> 1 4 6 11.4 0.0874 2.44 -2.44 1.06 -1.06 +#> 2 4 8 5222. 0.000192 8.56 -8.56 3.72 -3.72 +#> 3 6 8 5.36 0.187 1.68 -1.68 0.729 -0.729 +#> bf.prior label test.details #> <dbl> <chr> <chr> #> 1 0.707 list(~log[e](BF[10])==2.44) Student's t-test -#> 2 0.707 list(~log[e](BF[10])==1.68) Student's t-test -#> 3 0.707 list(~log[e](BF[10])==8.56) Student's t-test
    +#> 2 0.707 list(~log[e](BF[10])==8.56) Student's t-test +#> 3 0.707 list(~log[e](BF[10])==1.68) Student's t-test
    #------------------- within-subjects design ---------------------------- # parametric (Student's t-test) pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "parametric", - paired = TRUE, - p.adjust.method = "BH" -)
    #> # A tibble: 6 x 8 -#> group1 group2 mean.difference p.value significance + data = bugs_long, + x = condition, + y = desire, + type = "parametric", + paired = TRUE, + p.adjust.method = "BH" +) +
    #> # A tibble: 6 x 8 +#> group1 group2 mean.difference p.value significance #> <chr> <chr> <dbl> <dbl> <chr> #> 1 HDHF HDLF -1.15 1.06e- 3 ** #> 2 HDHF LDHF -0.472 7.02e- 2 ns @@ -387,89 +393,76 @@

    Examp #> 4 HDLF LDHF 0.676 6.74e- 2 ns #> 5 HDLF LDLF -1.02 1.99e- 3 ** #> 6 LDHF LDLF -1.69 6.66e- 9 *** -#> label test.details p.value.adjustment -#> <chr> <chr> <chr> -#> 1 list(~italic(p)[ adjusted ]== 0.001 ) Student's t-test Benjamini & Hochberg -#> 2 list(~italic(p)[ adjusted ]== 0.070 ) Student's t-test Benjamini & Hochberg -#> 3 list(~italic(p)[ adjusted ]<= 0.001 ) Student's t-test Benjamini & Hochberg -#> 4 list(~italic(p)[ adjusted ]== 0.067 ) Student's t-test Benjamini & Hochberg -#> 5 list(~italic(p)[ adjusted ]== 0.002 ) Student's t-test Benjamini & Hochberg -#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Student's t-test Benjamini & Hochberg

    +#> label test.details p.value.adjustment +#> <chr> <chr> <chr> +#> 1 list(~italic(p)[adjusted]==0.001) Student's t-test Benjamini & Hochberg +#> 2 list(~italic(p)[adjusted]==0.070) Student's t-test Benjamini & Hochberg +#> 3 list(~italic(p)[adjusted]<=0.001) Student's t-test Benjamini & Hochberg +#> 4 list(~italic(p)[adjusted]==0.067) Student's t-test Benjamini & Hochberg +#> 5 list(~italic(p)[adjusted]==0.002) Student's t-test Benjamini & Hochberg +#> 6 list(~italic(p)[adjusted]<=0.001) Student's t-test Benjamini & Hochberg
    # non-parametric (Durbin-Conover test) pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "nonparametric", - paired = TRUE, - p.adjust.method = "BY" -)
    #> # A tibble: 6 x 8 -#> group1 group2 W p.value significance -#> <chr> <chr> <dbl> <dbl> <chr> -#> 1 HDHF HDLF 4.78 1.44e- 5 *** -#> 2 HDHF LDHF 2.44 4.47e- 2 * -#> 3 HDHF LDLF 8.01 5.45e-13 *** -#> 4 HDLF LDHF 2.34 4.96e- 2 * -#> 5 HDLF LDLF 3.23 5.05e- 3 ** -#> 6 LDHF LDLF 5.57 4.64e- 7 *** -#> label test.details -#> <chr> <chr> -#> 1 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test -#> 2 list(~italic(p)[ adjusted ]== 0.045 ) Durbin-Conover test -#> 3 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test -#> 4 list(~italic(p)[ adjusted ]== 0.050 ) Durbin-Conover test -#> 5 list(~italic(p)[ adjusted ]== 0.005 ) Durbin-Conover test -#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Durbin-Conover test -#> p.value.adjustment -#> <chr> -#> 1 Benjamini & Yekutieli -#> 2 Benjamini & Yekutieli -#> 3 Benjamini & Yekutieli -#> 4 Benjamini & Yekutieli -#> 5 Benjamini & Yekutieli -#> 6 Benjamini & Yekutieli
    + data = bugs_long, + x = condition, + y = desire, + type = "nonparametric", + paired = TRUE, + p.adjust.method = "BY" +) +
    #> # A tibble: 6 x 8 +#> group1 group2 W p.value significance label +#> <chr> <chr> <dbl> <dbl> <chr> <chr> +#> 1 HDHF HDLF 4.78 1.44e- 5 *** list(~italic(p)[adjusted]<=0.001) +#> 2 HDHF LDHF 2.44 4.47e- 2 * list(~italic(p)[adjusted]==0.045) +#> 3 HDHF LDLF 8.01 5.45e-13 *** list(~italic(p)[adjusted]<=0.001) +#> 4 HDLF LDHF 2.34 4.96e- 2 * list(~italic(p)[adjusted]==0.050) +#> 5 HDLF LDLF 3.23 5.05e- 3 ** list(~italic(p)[adjusted]==0.005) +#> 6 LDHF LDLF 5.57 4.64e- 7 *** list(~italic(p)[adjusted]<=0.001) +#> test.details p.value.adjustment +#> <chr> <chr> +#> 1 Durbin-Conover test Benjamini & Yekutieli +#> 2 Durbin-Conover test Benjamini & Yekutieli +#> 3 Durbin-Conover test Benjamini & Yekutieli +#> 4 Durbin-Conover test Benjamini & Yekutieli +#> 5 Durbin-Conover test Benjamini & Yekutieli +#> 6 Durbin-Conover test Benjamini & Yekutieli
    # robust (Yuen's trimmed means t-test) pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "robust", - paired = TRUE, - p.adjust.method = "hommel" -)
    #> # A tibble: 6 x 10 -#> group1 group2 psihat conf.low conf.high p.value significance + data = bugs_long, + x = condition, + y = desire, + type = "robust", + paired = TRUE, + p.adjust.method = "hommel" +) +
    #> # A tibble: 6 x 10 +#> group1 group2 psihat conf.low conf.high p.value significance #> <chr> <chr> <dbl> <dbl> <dbl> <dbl> <chr> -#> 1 HDLF HDHF -1.16 -2.00 -0.318 1.49e- 3 ** -#> 2 LDHF HDHF -0.5 -1.19 0.188 6.20e- 2 ns -#> 3 LDHF HDLF 0.701 -0.303 1.71 6.20e- 2 ns -#> 4 LDLF HDHF -2.10 -2.82 -1.37 1.79e-10 *** -#> 5 LDLF HDLF -0.938 -1.81 -0.0694 1.36e- 2 * -#> 6 LDLF LDHF -1.54 -2.27 -0.810 1.16e- 6 *** -#> label test.details -#> <chr> <chr> -#> 1 list(~italic(p)[ adjusted ]== 0.001 ) Yuen's trimmed means test -#> 2 list(~italic(p)[ adjusted ]== 0.062 ) Yuen's trimmed means test -#> 3 list(~italic(p)[ adjusted ]== 0.062 ) Yuen's trimmed means test -#> 4 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test -#> 5 list(~italic(p)[ adjusted ]== 0.014 ) Yuen's trimmed means test -#> 6 list(~italic(p)[ adjusted ]<= 0.001 ) Yuen's trimmed means test -#> p.value.adjustment -#> <chr> -#> 1 Hommel -#> 2 Hommel -#> 3 Hommel -#> 4 Hommel -#> 5 Hommel -#> 6 Hommel
    +#> 1 HDHF HDLF 1.16 0.318 2.00 1.49e- 3 ** +#> 2 HDHF LDHF 0.5 -0.188 1.19 6.20e- 2 ns +#> 3 HDHF LDLF 2.10 1.37 2.82 1.79e-10 *** +#> 4 HDLF LDHF -0.701 -1.71 0.303 6.20e- 2 ns +#> 5 HDLF LDLF 0.938 0.0694 1.81 1.36e- 2 * +#> 6 LDHF LDLF 1.54 0.810 2.27 1.16e- 6 *** +#> label test.details p.value.adjustment +#> <chr> <chr> <chr> +#> 1 list(~italic(p)[adjusted]==0.001) Yuen's trimmed means test Hommel +#> 2 list(~italic(p)[adjusted]==0.062) Yuen's trimmed means test Hommel +#> 3 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test Hommel +#> 4 list(~italic(p)[adjusted]==0.062) Yuen's trimmed means test Hommel +#> 5 list(~italic(p)[adjusted]==0.014) Yuen's trimmed means test Hommel +#> 6 list(~italic(p)[adjusted]<=0.001) Yuen's trimmed means test Hommel
    # Bayes Factor (Student's t-test) pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "bayes", - paired = TRUE -)
    #> # A tibble: 6 x 11 -#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 + data = bugs_long, + x = condition, + y = desire, + type = "bayes", + paired = TRUE +) +
    #> # A tibble: 6 x 11 +#> group1 group2 bf10 bf01 log_e_bf10 log_e_bf01 log_10_bf10 log_10_bf01 #> <chr> <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> #> 1 HDHF HDLF 4.16e+ 1 2.41e- 2 3.73 -3.73 1.62 -1.62 #> 2 HDHF LDHF 5.83e- 1 1.71e+ 0 -0.539 0.539 -0.234 0.234 @@ -477,14 +470,14 @@

    Examp #> 4 HDLF LDHF 6.98e- 1 1.43e+ 0 -0.359 0.359 -0.156 0.156 #> 5 HDLF LDLF 1.81e+ 1 5.52e- 2 2.90 -2.90 1.26 -1.26 #> 6 LDHF LDLF 4.81e+ 6 2.08e- 7 15.4 -15.4 6.68 -6.68 -#> bf.prior label test.details +#> bf.prior label test.details #> <dbl> <chr> <chr> #> 1 0.707 list(~log[e](BF[10])==3.73) Student's t-test #> 2 0.707 list(~log[e](BF[10])==-0.54) Student's t-test #> 3 0.707 list(~log[e](BF[10])==23.21) Student's t-test #> 4 0.707 list(~log[e](BF[10])==-0.36) Student's t-test #> 5 0.707 list(~log[e](BF[10])==2.90) Student's t-test -#> 6 0.707 list(~log[e](BF[10])==15.39) Student's t-test

    # } +#> 6 0.707 list(~log[e](BF[10])==15.39) Student's t-test
    # }
    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/docs/reference/reexports.html b/docs/reference/reexports.html index b675a13..98307ca 100644 --- a/docs/reference/reexports.html +++ b/docs/reference/reexports.html @@ -95,7 +95,7 @@ pairwiseComparisons - 1.1.2.9000 + 2.0.0 @@ -148,8 +148,8 @@

    Objects exported from other packages

    These objects are imported from other packages. Follow the links below to see their documentation.

    - -
    ipmisc

    %$%, %<-%, %<>%, %>%, as_tibble, enframe, long_to_wide_converter, signif_column, specify_decimal_p, tibble

    +
    +
    ipmisc

    %$%, %<-%, %<>%, %>%, as_tibble, enframe, long_to_wide_converter, signif_column, specify_decimal_p, tibble

    rlang

    %|%, %||%, :=

    @@ -174,7 +174,7 @@

    Contents

    -

    Site built with pkgdown 1.5.1.

    +

    Site built with pkgdown 1.5.1.9000.

    diff --git a/man/figures/README-ggsignif-1.png b/man/figures/README-ggsignif-1.png index 6eaaab1..4399dd6 100644 Binary files a/man/figures/README-ggsignif-1.png and b/man/figures/README-ggsignif-1.png differ diff --git a/man/games_howell.Rd b/man/games_howell.Rd index 1352a4d..f56bd4b 100644 --- a/man/games_howell.Rd +++ b/man/games_howell.Rd @@ -7,8 +7,8 @@ games_howell(data, x, y) } \arguments{ -\item{data}{A dataframe (or a tibble) from which variables specified are to -be taken. A matrix or tables will \strong{not} be accepted.} +\item{data}{A dataframe from which variables specified are to be taken. A +matrix or tables will \strong{not} be accepted.} \item{x}{The grouping variable from the dataframe \code{data}.} diff --git a/man/movies_long.Rd b/man/movies_long.Rd index 54b93c0..30db52e 100644 --- a/man/movies_long.Rd +++ b/man/movies_long.Rd @@ -30,13 +30,9 @@ Movie information and user ratings from IMDB.com (long format). \details{ Modified dataset from \code{ggplot2movies} package. -The internet movie database, \url{http://imdb.com/}, is a website devoted +The internet movie database, \url{https://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}. +biggest movie database on the web and is run by amazon. Movies were are identical to those selected for inclusion in movies_wide but this dataset has been constructed such that every movie appears in one and only one diff --git a/man/movies_wide.Rd b/man/movies_wide.Rd index ad995f4..50b1f40 100644 --- a/man/movies_wide.Rd +++ b/man/movies_wide.Rd @@ -32,13 +32,9 @@ Movie information and user ratings from IMDB.com (wide format). \details{ Modified dataset from \code{ggplot2movies} package. -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 information -about 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}. +The internet movie database, \url{https://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. Movies were selected for inclusion if they had a known length and had been rated by at least one imdb user. Small categories such as documentaries diff --git a/man/pairwise_comparisons.Rd b/man/pairwise_comparisons.Rd index 421e347..83d00dd 100644 --- a/man/pairwise_comparisons.Rd +++ b/man/pairwise_comparisons.Rd @@ -34,8 +34,8 @@ pairwise_p( ) } \arguments{ -\item{data}{A dataframe (or a tibble) from which variables specified are to -be taken. A matrix or tables will \strong{not} be accepted.} +\item{data}{A dataframe from which variables specified are to be taken. A +matrix or tables will \strong{not} be accepted.} \item{x}{The grouping variable from the dataframe \code{data}.} diff --git a/tests/testthat/test-pairwise_comparisons.R b/tests/testthat/test-pairwise_comparisons_between.R similarity index 71% rename from tests/testthat/test-pairwise_comparisons.R rename to tests/testthat/test-pairwise_comparisons_between.R index 184f391..dec97c7 100644 --- a/tests/testthat/test-pairwise_comparisons.R +++ b/tests/testthat/test-pairwise_comparisons_between.R @@ -272,7 +272,7 @@ testthat::test_that( testthat::expect_equal( df2$mean.difference, - c(-0.058, -0.542, -0.6, -0.066, 0.476, -0.124), + c(0.542, -0.058, 0.066, -0.6, -0.476, 0.124), tolerance = 0.001 ) @@ -325,60 +325,60 @@ testthat::test_that( testthat::expect_identical( df1$label, c( - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 0.979 )", - "list(~italic(p)[ adjusted ]== 1.000 )" + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==0.979)", + "list(~italic(p)[adjusted]==1.000)" ) ) testthat::expect_identical( df2$label, c( - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )", - "list(~italic(p)[ adjusted ]== 1.000 )" + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)", + "list(~italic(p)[adjusted]==1.000)" ) ) testthat::expect_identical( df3$label, c( - "list(~italic(p)[ unadjusted ]== 0.561 )", - "list(~italic(p)[ unadjusted ]== 0.060 )", - "list(~italic(p)[ unadjusted ]== 0.254 )", - "list(~italic(p)[ unadjusted ]== 0.102 )", - "list(~italic(p)[ unadjusted ]== 0.474 )", - "list(~italic(p)[ unadjusted ]== 0.254 )" + "list(~italic(p)[unadjusted]==0.561)", + "list(~italic(p)[unadjusted]==0.060)", + "list(~italic(p)[unadjusted]==0.254)", + "list(~italic(p)[unadjusted]==0.102)", + "list(~italic(p)[unadjusted]==0.474)", + "list(~italic(p)[unadjusted]==0.254)" ) ) testthat::expect_identical( df4$label, c( - "list(~italic(p)[ adjusted ]== 0.969 )", - "list(~italic(p)[ adjusted ]== 0.969 )", - "list(~italic(p)[ adjusted ]== 0.969 )", - "list(~italic(p)[ adjusted ]== 0.969 )", - "list(~italic(p)[ adjusted ]== 0.969 )", - "list(~italic(p)[ adjusted ]== 0.969 )" + "list(~italic(p)[adjusted]==0.969)", + "list(~italic(p)[adjusted]==0.969)", + "list(~italic(p)[adjusted]==0.969)", + "list(~italic(p)[adjusted]==0.969)", + "list(~italic(p)[adjusted]==0.969)", + "list(~italic(p)[adjusted]==0.969)" ) ) testthat::expect_identical( df6$label, c( - "list(~log[e](BF[10])==-0.560)", - "list(~log[e](BF[10])==-0.851)", - "list(~log[e](BF[10])==-0.606)", "list(~log[e](BF[10])==-0.617)", + "list(~log[e](BF[10])==-0.332)", + "list(~log[e](BF[10])==-0.851)", "list(~log[e](BF[10])==-0.616)", - "list(~log[e](BF[10])==-0.332)" + "list(~log[e](BF[10])==-0.560)", + "list(~log[e](BF[10])==-0.606)" ) ) @@ -388,191 +388,16 @@ testthat::test_that( testthat::expect_is(df3, "tbl_df") testthat::expect_is(df4, "tbl_df") testthat::expect_is(df5, "tbl_df") - } -) - - -# within-subjects design -------------------------------------------------- - -testthat::test_that( - desc = "`pairwise_comparisons()` works for within-subjects design", - code = { - - # student's t test - set.seed(123) - df1 <- - pairwiseComparisons::pairwise_comparisons( - data = pairwiseComparisons::bugs_long, - x = "condition", - y = desire, - type = "p", - k = 3, - paired = TRUE, - p.adjust.method = "bonferroni" - ) - # Durbin-Conover test - set.seed(123) - df2 <- - pairwiseComparisons::pairwise_comparisons( - data = pairwiseComparisons::bugs_long, - x = condition, - y = "desire", - type = "np", - k = 3, - paired = TRUE, - p.adjust.method = "BY" - ) - - # robust t test - set.seed(123) - df3 <- - pairwiseComparisons::pairwise_comparisons( - data = pairwiseComparisons::bugs_long, - x = condition, - y = desire, - type = "r", - k = 3, - paired = TRUE, - p.adjust.method = "hommel" - ) - - # bf - df4 <- - pairwiseComparisons::pairwise_comparisons( - data = bugs_long, - x = condition, - y = desire, - type = "bf", - k = 4, - paired = TRUE - ) - - # test details - testthat::expect_identical(unique(df1$test.details), "Student's t-test") - testthat::expect_identical(unique(df2$test.details), "Durbin-Conover test") - testthat::expect_identical(unique(df3$test.details), "Yuen's trimmed means test") - testthat::expect_identical(unique(df4$test.details), "Student's t-test") - - # adjustment method - testthat::expect_identical(unique(df1$p.value.adjustment), "Bonferroni") - testthat::expect_identical(unique(df2$p.value.adjustment), "Benjamini & Yekutieli") - testthat::expect_identical(unique(df3$p.value.adjustment), "Hommel") - - # checking exact values - testthat::expect_equal( - df1$mean.difference, - c( - -1.14772727272727, - -0.471590909090914, - -2.16477272727272, - 0.676136363636358, - -1.01704545454545, - -1.69318181818181 - ), - tolerance = 0.001 - ) - - testthat::expect_identical( - df1$label, - c( - "list(~italic(p)[ adjusted ]== 0.003 )", - "list(~italic(p)[ adjusted ]== 0.421 )", - "list(~italic(p)[ adjusted ]<= 0.001 )", - "list(~italic(p)[ adjusted ]== 0.337 )", - "list(~italic(p)[ adjusted ]== 0.008 )", - "list(~italic(p)[ adjusted ]<= 0.001 )" - ) - ) - - testthat::expect_identical( - df1$significance, - c("**", "ns", "***", "ns", "**", "***") - ) - - testthat::expect_equal( - df2$W, - c( - 4.78004208516409, - 2.44393129166284, - 8.01465703001196, - 2.33611079350124, - 3.23461494484788, - 5.57072573834912 - ), - tolerance = 0.001 - ) - - testthat::expect_identical( - df2$label, - c( - "list(~italic(p)[ adjusted ]<= 0.001 )", - "list(~italic(p)[ adjusted ]== 0.045 )", - "list(~italic(p)[ adjusted ]<= 0.001 )", - "list(~italic(p)[ adjusted ]== 0.050 )", - "list(~italic(p)[ adjusted ]== 0.005 )", - "list(~italic(p)[ adjusted ]<= 0.001 )" - ) - ) - - testthat::expect_identical( - df2$significance, - c("***", "*", "***", "*", "**", "***") - ) - - testthat::expect_equal( - df3$psihat, - c( - -1.15972222222222, - -0.5, - 0.701388888888889, - -2.09722222222222, - -0.9375, - -1.54166666666667 - ), - tolerance = 0.001 - ) - - testthat::expect_identical( - df3$label, - c( - "list(~italic(p)[ adjusted ]== 0.001 )", - "list(~italic(p)[ adjusted ]== 0.062 )", - "list(~italic(p)[ adjusted ]== 0.062 )", - "list(~italic(p)[ adjusted ]<= 0.001 )", - "list(~italic(p)[ adjusted ]== 0.014 )", - "list(~italic(p)[ adjusted ]<= 0.001 )" - ) - ) - - testthat::expect_identical( - df3$significance, - c("**", "ns", "ns", "***", "*", "***") - ) - - testthat::expect_identical( - df4$label, - c( - "list(~log[e](BF[10])==3.7273)", - "list(~log[e](BF[10])==-0.5394)", - "list(~log[e](BF[10])==23.2071)", - "list(~log[e](BF[10])==-0.3589)", - "list(~log[e](BF[10])==2.8966)", - "list(~log[e](BF[10])==15.3854)" - ) - ) - - # checking dimensions of the results dataframe - testthat::expect_equal(dim(df1), c(6L, 8L)) - testthat::expect_equal(dim(df2), c(6L, 8L)) - testthat::expect_equal(dim(df3), c(6L, 10L)) - testthat::expect_equal(dim(df4), c(6L, 11L)) - - # checking if it is a tibble - testthat::expect_is(df1, "tbl_df") - testthat::expect_is(df2, "tbl_df") - testthat::expect_is(df3, "tbl_df") - testthat::expect_is(df4, "tbl_df") + # columns should be same no matter the test + testthat::expect_identical(df1$group1, df2$group1) + testthat::expect_identical(df1$group1, df3$group1) + testthat::expect_identical(df1$group1, df4$group1) + testthat::expect_identical(df1$group1, df6$group1) + testthat::expect_identical(df1$group2, df2$group2) + testthat::expect_identical(df1$group2, df3$group2) + testthat::expect_identical(df1$group2, df4$group2) + testthat::expect_identical(df1$group2, df6$group2) } ) @@ -602,7 +427,7 @@ testthat::test_that( y = brainwt, p.adjust.method = "none" ) %>% - dplyr::filter(.data = ., group1 == "omni", group2 == "carni") + dplyr::filter(.data = ., group2 == "omni", group1 == "carni") # tests testthat::expect_equal(dim(df1), c(1L, 11L)) @@ -610,7 +435,7 @@ testthat::test_that( testthat::expect_equal(df1$se, df2$se, tolerance = 0.01) testthat::expect_equal(df1$t.value, df2$t.value, tolerance = 0.01) testthat::expect_equal(df1$df, df2$df, tolerance = 0.01) - testthat::expect_identical(df2$label, "list(~italic(p)[ unadjusted ]== 0.865 )") + testthat::expect_identical(df2$label, "list(~italic(p)[unadjusted]==0.865)") } ) diff --git a/tests/testthat/test-pairwise_comparisons_within.R b/tests/testthat/test-pairwise_comparisons_within.R new file mode 100644 index 0000000..3b2bc4e --- /dev/null +++ b/tests/testthat/test-pairwise_comparisons_within.R @@ -0,0 +1,356 @@ +# within-subjects design - NAs -------------------------------------------------- + +testthat::test_that( + desc = "`pairwise_comparisons()` works for within-subjects design - NAs", + code = { + + # student's t test + set.seed(123) + df1 <- + pairwiseComparisons::pairwise_comparisons( + data = pairwiseComparisons::bugs_long, + x = "condition", + y = desire, + type = "p", + k = 3, + paired = TRUE, + p.adjust.method = "bonferroni" + ) + + # Durbin-Conover test + set.seed(123) + df2 <- + pairwiseComparisons::pairwise_comparisons( + data = pairwiseComparisons::bugs_long, + x = condition, + y = "desire", + type = "np", + k = 3, + paired = TRUE, + p.adjust.method = "BY" + ) + + # robust t test + set.seed(123) + df3 <- + pairwiseComparisons::pairwise_comparisons( + data = pairwiseComparisons::bugs_long, + x = condition, + y = desire, + type = "r", + k = 3, + paired = TRUE, + p.adjust.method = "hommel" + ) + + # bf + df4 <- + pairwiseComparisons::pairwise_comparisons( + data = bugs_long, + x = condition, + y = desire, + type = "bf", + k = 4, + paired = TRUE + ) + + # test details + testthat::expect_identical(unique(df1$test.details), "Student's t-test") + testthat::expect_identical(unique(df2$test.details), "Durbin-Conover test") + testthat::expect_identical(unique(df3$test.details), "Yuen's trimmed means test") + testthat::expect_identical(unique(df4$test.details), "Student's t-test") + + # adjustment method + testthat::expect_identical(unique(df1$p.value.adjustment), "Bonferroni") + testthat::expect_identical(unique(df2$p.value.adjustment), "Benjamini & Yekutieli") + testthat::expect_identical(unique(df3$p.value.adjustment), "Hommel") + + # checking exact values + testthat::expect_equal( + df1$mean.difference, + c( + -1.14772727272727, + -0.471590909090914, + -2.16477272727272, + 0.676136363636358, + -1.01704545454545, + -1.69318181818181 + ), + tolerance = 0.001 + ) + + testthat::expect_identical( + df1$label, + c( + "list(~italic(p)[adjusted]==0.003)", + "list(~italic(p)[adjusted]==0.421)", + "list(~italic(p)[adjusted]<=0.001)", + "list(~italic(p)[adjusted]==0.337)", + "list(~italic(p)[adjusted]==0.008)", + "list(~italic(p)[adjusted]<=0.001)" + ) + ) + + testthat::expect_identical( + df1$significance, + c("**", "ns", "***", "ns", "**", "***") + ) + + testthat::expect_equal( + df2$W, + c( + 4.78004208516409, + 2.44393129166284, + 8.01465703001196, + 2.33611079350124, + 3.23461494484788, + 5.57072573834912 + ), + tolerance = 0.001 + ) + + testthat::expect_identical( + df2$label, + c( + "list(~italic(p)[adjusted]<=0.001)", + "list(~italic(p)[adjusted]==0.045)", + "list(~italic(p)[adjusted]<=0.001)", + "list(~italic(p)[adjusted]==0.050)", + "list(~italic(p)[adjusted]==0.005)", + "list(~italic(p)[adjusted]<=0.001)" + ) + ) + + testthat::expect_identical( + df2$significance, + c("***", "*", "***", "*", "**", "***") + ) + + testthat::expect_equal( + df3$psihat, + c( + 1.15972222222222, + 0.5, + 2.09722222222222, + -0.701388888888889, + 0.9375, + 1.54166666666667 + ), + tolerance = 0.001 + ) + + testthat::expect_identical( + df3$label, + c( + "list(~italic(p)[adjusted]==0.001)", + "list(~italic(p)[adjusted]==0.062)", + "list(~italic(p)[adjusted]<=0.001)", + "list(~italic(p)[adjusted]==0.062)", + "list(~italic(p)[adjusted]==0.014)", + "list(~italic(p)[adjusted]<=0.001)" + ) + ) + + testthat::expect_identical( + df3$significance, + c("**", "ns", "***", "ns", "*", "***") + ) + + testthat::expect_identical( + df4$label, + c( + "list(~log[e](BF[10])==3.7273)", + "list(~log[e](BF[10])==-0.5394)", + "list(~log[e](BF[10])==23.2071)", + "list(~log[e](BF[10])==-0.3589)", + "list(~log[e](BF[10])==2.8966)", + "list(~log[e](BF[10])==15.3854)" + ) + ) + + # checking dimensions of the results dataframe + testthat::expect_equal(dim(df1), c(6L, 8L)) + testthat::expect_equal(dim(df2), c(6L, 8L)) + testthat::expect_equal(dim(df3), c(6L, 10L)) + testthat::expect_equal(dim(df4), c(6L, 11L)) + + # checking if it is a tibble + testthat::expect_is(df1, "tbl_df") + testthat::expect_is(df2, "tbl_df") + testthat::expect_is(df3, "tbl_df") + testthat::expect_is(df4, "tbl_df") + + # columns should be same no matter the test + testthat::expect_identical(df1$group1, df2$group1) + testthat::expect_identical(df1$group1, df3$group1) + testthat::expect_identical(df1$group1, df4$group1) + testthat::expect_identical(df1$group2, df2$group2) + testthat::expect_identical(df1$group2, df3$group2) + testthat::expect_identical(df1$group2, df4$group2) + } +) + + + +# within-subjects design - no NAs --------------------------------------------- + +testthat::test_that( + desc = "`pairwise_comparisons()` works for within-subjects design - NAs", + code = { + + # student's t test + set.seed(123) + df1 <- + pairwiseComparisons::pairwise_comparisons( + data = WRS2::WineTasting, + x = "Wine", + y = Taste, + type = "p", + k = 3, + paired = TRUE, + p.adjust.method = "none" + ) + + # Durbin-Conover test + set.seed(123) + df2 <- + pairwiseComparisons::pairwise_comparisons( + data = WRS2::WineTasting, + x = Wine, + y = "Taste", + type = "np", + k = 3, + paired = TRUE, + p.adjust.method = "none" + ) + + # robust t test + set.seed(123) + df3 <- + pairwiseComparisons::pairwise_comparisons( + data = WRS2::WineTasting, + x = Wine, + y = Taste, + type = "r", + k = 3, + paired = TRUE, + p.adjust.method = "none" + ) + + # bf + df4 <- + pairwiseComparisons::pairwise_comparisons( + data = WRS2::WineTasting, + x = Wine, + y = Taste, + type = "bf", + k = 4, + paired = TRUE + ) + + # test details + testthat::expect_identical(unique(df1$test.details), "Student's t-test") + testthat::expect_identical(unique(df2$test.details), "Durbin-Conover test") + testthat::expect_identical(unique(df3$test.details), "Yuen's trimmed means test") + testthat::expect_identical(unique(df4$test.details), "Student's t-test") + + # adjustment method + testthat::expect_identical(unique(df1$p.value.adjustment), "None") + testthat::expect_identical(unique(df2$p.value.adjustment), "None") + testthat::expect_identical(unique(df3$p.value.adjustment), "None") + + # checking exact values + testthat::expect_equal( + df1$mean.difference, + c( + -0.00909090909090882, + -0.084090909090909, + -0.0750000000000002 + ), + tolerance = 0.001 + ) + + testthat::expect_identical( + df1$label, + c( + "list(~italic(p)[unadjusted]==0.732)", + "list(~italic(p)[unadjusted]==0.014)", + "list(~italic(p)[unadjusted]==0.001)" + ) + ) + + testthat::expect_identical( + df1$significance, + c("ns", "*", "***") + ) + + testthat::expect_equal( + df2$W, + c(1.04673405118638, 3.66356917915232, 2.61683512796594), + tolerance = 0.001 + ) + + testthat::expect_identical( + df2$label, + c( + "list(~italic(p)[unadjusted]==0.301)", + "list(~italic(p)[unadjusted]==0.001)", + "list(~italic(p)[unadjusted]==0.012)" + ) + ) + + testthat::expect_identical( + df2$significance, + c("ns", "***", "*") + ) + + testthat::expect_equal( + df3$psihat, + c(0.0166666666666668, 0.1, 0.0777777777777778), + tolerance = 0.001 + ) + + testthat::expect_identical( + df3$label, + c( + "list(~italic(p)[unadjusted]==0.380)", + "list(~italic(p)[unadjusted]==0.011)", + "list(~italic(p)[unadjusted]==0.003)" + ) + ) + + testthat::expect_identical( + df3$significance, + c("ns", "*", "**") + ) + + testthat::expect_identical( + df4$label, + c( + "list(~log[e](BF[10])==-1.4462)", + "list(~log[e](BF[10])==1.3122)", + "list(~log[e](BF[10])==3.9214)" + ) + ) + + # checking dimensions of the results dataframe + testthat::expect_equal(dim(df1), c(3L, 8L)) + testthat::expect_equal(dim(df2), c(3L, 8L)) + testthat::expect_equal(dim(df3), c(3L, 10L)) + testthat::expect_equal(dim(df4), c(3L, 11L)) + + # checking if it is a tibble + testthat::expect_is(df1, "tbl_df") + testthat::expect_is(df2, "tbl_df") + testthat::expect_is(df3, "tbl_df") + testthat::expect_is(df4, "tbl_df") + + # columns should be same no matter the test + testthat::expect_identical(df1$group1, df2$group1) + testthat::expect_identical(df1$group1, df3$group1) + testthat::expect_identical(df1$group1, df4$group1) + testthat::expect_identical(df1$group2, df2$group2) + testthat::expect_identical(df1$group2, df3$group2) + testthat::expect_identical(df1$group2, df4$group2) + } +)
    data

    A dataframe (or a tibble) from which variables specified are to -be taken. A matrix or tables will not be accepted.

    A dataframe from which variables specified are to be taken. A +matrix or tables will not be accepted.

    x