Medidas de distancias para valoraciones multivariantes

Vamos a considerar unos datos simulados sobre valoraciones de 10 items por 3 usuarios, con el fin de ilustrar el funcionamiento de las diferentes medidas de distancias.

usuario_a <- c(4, 4, 4, 3,3, 5, 5, 2, 3, 5)
usuario_b <- c(2,2, 2,1,2, 4, 3, 2, 2, 4)
usuario_c=c(1,2,3,3,1,2,1,3,2,2)

items=c("i01","i02","i03","i04","i05","i06","i07","i08","i09","i10")
item=factor(rep(items,3),ordered=TRUE,levels=items)
m <- matrix(c(usuario_a, usuario_b, usuario_c), ncol=10,byrow=TRUE,
            dimnames=list(user=paste("u", 1:3, sep=''),item=items))
m
##     item
## user i01 i02 i03 i04 i05 i06 i07 i08 i09 i10
##   u1   4   4   4   3   3   5   5   2   3   5
##   u2   2   2   2   1   2   4   3   2   2   4
##   u3   1   2   3   3   1   2   1   3   2   2

La matriz de valoraciones ‘m’ la reconocemos como tal en R a través del comando `as(,“realRatingMatrix”).

# objeto realRatingMatrix
rr=as(m,"realRatingMatrix")
getRatingMatrix(rr)
## 3 x 10 sparse Matrix of class "dgCMatrix"
##                       
## u1 4 4 4 3 3 5 5 2 3 5
## u2 2 2 2 1 2 4 3 2 2 4
## u3 1 2 3 3 1 2 1 3 2 2

Es importante considerar la necesidad en ocasiones de estandarizar los valores, para corregir por el efecto de escala que proviene del diferente nivel de exigencia de los usuarios en sus valoraciones. Hay dos métodos para normalizar: restar la media, y restar la media y dividir por la desviación típica. Estas normalizaciones se realizan por usuario (filas).

# Estandarizacion de valores
rc <- normalize(rr, method="center")
rz <-normalize(rr, method="Z-score")

# integracion en un data.frame
r.df=as(rr,"data.frame");r.df
##    user item rating
## 1    u1  i01      4
## 4    u1  i02      4
## 7    u1  i03      4
## 10   u1  i04      3
## 13   u1  i05      3
## 16   u1  i06      5
## 19   u1  i07      5
## 22   u1  i08      2
## 25   u1  i09      3
## 28   u1  i10      5
## 2    u2  i01      2
## 5    u2  i02      2
## 8    u2  i03      2
## 11   u2  i04      1
## 14   u2  i05      2
## 17   u2  i06      4
## 20   u2  i07      3
## 23   u2  i08      2
## 26   u2  i09      2
## 29   u2  i10      4
## 3    u3  i01      1
## 6    u3  i02      2
## 9    u3  i03      3
## 12   u3  i04      3
## 15   u3  i05      1
## 18   u3  i06      2
## 21   u3  i07      1
## 24   u3  i08      3
## 27   u3  i09      2
## 30   u3  i10      2

La representación de una matriz de valoraciones la podemos hacer básicamente de dos maneras:

ggplot(r.df, aes(x = as.factor(item), y = rating, colour = user)) +
  geom_path(aes(group = user)) +
  geom_point() +
  labs(x = "item") +
  theme_bw() +
  theme(legend.position = "bottom")

image(rr, main = "Raw Ratings")

image(rc, main = "Raw Ratings")

image(rz, main = "Raw Ratings")

Las principales medidas de distancia para valoraciones en una escala continua son las siguientes:

#####################################################################
#Calculo de distancias
mc=as(rc,"matrix")
mz=as(rz,"matrix")

#euclidea
dist(m,method="euclidean")
##          u1       u2
## u2 4.898979         
## u3 7.348469 4.472136
dist(mc,method="euclidean")
##          u1       u2
## u2 2.097618         
## u3 4.647580 4.289522
dist(mz,method="euclidean")
##          u1       u2
## u2 2.090377         
## u3 5.011499 4.803220
# manhattan
dist(m,method="manhattan")
##    u1 u2
## u2 14   
## u3 20 12
dist(mc,method="manhattan")
##      u1   u2
## u2  6.0     
## u3 12.4 12.0
dist(mz,method="manhattan")
##           u1        u2
## u2  6.076885          
## u3 13.545243 13.559059
# correlacion
cor(t(m),method="pearson")
##            u1         u2         u3
## u1  1.0000000  0.7572402 -0.3952847
## u2  0.7572402  1.0000000 -0.2817181
## u3 -0.3952847 -0.2817181  1.0000000
cor(t(m),method="kendall")
##            u1         u2         u3
## u1  1.0000000  0.7118321 -0.3191424
## u2  0.7118321  1.0000000 -0.2909287
## u3 -0.3191424 -0.2909287  1.0000000
# correlacion jacknife
library(bootstrap)
mm=m

xdata <- mm[-3,]
theta <- function(i,xdata){ cor(xdata[1,i],xdata[2,i]) }
results <- jackknife(1:dim(xdata)[2],theta,xdata);results; 
## $jack.se
## [1] 0.1247936
## 
## $jack.bias
## [1] 0.01625689
## 
## $jack.values
##  [1] 0.7771889 0.7771889 0.7771889 0.7470179 0.7538191 0.7000000 0.7500000
##  [8] 0.8542422 0.7538191 0.7000000
## 
## $call
## jackknife(x = 1:dim(xdata)[2], theta = theta, xdata)
min(abs(results$jack.values)); mean(results$jack.values)
## [1] 0.7
## [1] 0.7590465
xdata <- mm[-2,]
results <- jackknife(1:dim(xdata)[2],theta,xdata)#;results; 
min(abs(results$jack.values)); mean(results$jack.values)
## [1] 0.1846372
## [1] -0.3912174
xdata <- mm[-1,]
results <- jackknife(1:dim(xdata)[2],theta,xdata)#;results; 
min(abs(results$jack.values)); mean(results$jack.values)
## [1] 0.0805823
## [1] -0.2817897
# distancia coseno
mm=m
mm=mz
coseno=function(x,y){
  result=x%*%y/sqrt((x%*%x)*(y%*%y))
  return(as.numeric(result))
}
coseno(mm[1,],mm[2,])
## [1] 0.7572402
coseno(mm[1,],mm[3,])
## [1] -0.3952847
coseno(mm[2,],mm[3,])
## [1] -0.2817181

Las principales medidas de distancia para valoraciones en una escala binaria son las siguientes:

set.seed(3456)
N=10
megusta_a=rbinom(N,1,0.2)
megusta_b=rbinom(N,1,0.7)
megusta=rbind(megusta_a,megusta_b)

#library(ade4)
table(megusta[1,],megusta[2,])
##    
##     0 1
##   0 2 6
##   1 1 1
binary.dist=function(mdatos){
  # una matriz de datos en la que las filas son los usuarios
  x=table(mdatos[1,],mdatos[2,])
  a=x[2,2]
  b=x[2,1]
  c=x[1,2]
  d=x[1,1]
  jaccard=round((b+c)/(a+b+c),4)
  smc=round((b+c)/sum(x),4)
  return(list(jaccard=jaccard, smc=smc))
}
binary.dist(megusta)
## $jaccard
## [1] 0.875
## 
## $smc
## [1] 0.7

Manipulación de datos en recommenderlab

Como ya hemos visto antes, una matriz de valoraciones hemos de convertirla a un objeto específico en R

m <- matrix(sample(c(as.numeric(0:5), NA), 50,
                   replace=TRUE, prob=c(rep(.4/6,6),.6)), ncol=10,
            dimnames=list(user=paste("u", 1:5, sep=''),
                          item=paste("i", 1:10, sep='')))
m
##     item
## user i1 i2 i3 i4 i5 i6 i7 i8 i9 i10
##   u1 NA NA  1  0 NA NA  3 NA  4   1
##   u2  2 NA NA  3  5  4  3 NA  4   1
##   u3 NA NA NA NA NA NA  3 NA  0  NA
##   u4 NA NA NA  2  2 NA  0  5  4  NA
##   u5 NA NA NA  0 NA  1  5 NA  2  NA
# objeto realRatingMatrix
r=as(m,"realRatingMatrix")
r
## 5 x 10 rating matrix of class 'realRatingMatrix' with 23 ratings.
class(r)
## [1] "realRatingMatrix"
## attr(,"package")
## [1] "recommenderlab"
# La matriz original es identica a la conversion a matriz del objeto de valoraciones r
identical(as(r, "matrix"),m)
## [1] TRUE

Podemos visualizar los datos disponibles (y los valores faltantes), en global (en forma de matriz) o por usuarios (en forma de lista) con:

# visualiza la matriz con las valoraciones
getRatingMatrix(r)
## 5 x 10 sparse Matrix of class "dgCMatrix"
##                       
## u1 . . 1 0 . . 3 . 4 1
## u2 2 . . 3 5 4 3 . 4 1
## u3 . . . . . . 3 . 0 .
## u4 . . . 2 2 . 0 5 4 .
## u5 . . . 0 . 1 5 . 2 .
# extrae un vector con las valoraciones (por columnas y no faltantes) sin identificar 
# usuarios ni items
getRatings(r)
##  [1] 2 1 0 3 2 0 5 2 4 1 3 3 3 0 5 5 4 4 0 4 2 1 1
# para visualizar los usuarios se puede convertir en lista
as(r, "list")
## $u1
##  i3  i4  i7  i9 i10 
##   1   0   3   4   1 
## 
## $u2
##  i1  i4  i5  i6  i7  i9 i10 
##   2   3   5   4   3   4   1 
## 
## $u3
## i7 i9 
##  3  0 
## 
## $u4
## i4 i5 i7 i8 i9 
##  2  2  0  5  4 
## 
## $u5
## i4 i6 i7 i9 
##  0  1  5  2
# o como data.frame
head(as(r, "data.frame"))
##    user item rating
## 2    u1   i3      1
## 3    u1   i4      0
## 11   u1   i7      3
## 17   u1   i9      4
## 22   u1  i10      1
## 1    u2   i1      2

De nuevo la visualización de las valoraciones estandarizadas sigue la misma estructura:

# Normalizamos (las puntuaciones de cada usuario) de dos modos posibles
# method="center" (restando la media), "Z-score" (restando la media y dividiendo por la sd)
rc <- normalize(r) 
head(as(rc, "data.frame"))
##    user item    rating
## 2    u1   i3 -0.800000
## 3    u1   i4 -1.800000
## 11   u1   i7  1.200000
## 17   u1   i9  2.200000
## 22   u1  i10 -0.800000
## 1    u2   i1 -1.142857
getRatingMatrix(rc)
## 5 x 10 sparse Matrix of class "dgCMatrix"
##                                                                   
## u1  .        . -0.8 -1.8000000  .         .          1.2000000 .  
## u2 -1.142857 .  .   -0.1428571  1.857143  0.8571429 -0.1428571 .  
## u3  .        .  .    .          .         .          1.5000000 .  
## u4  .        .  .   -0.6000000 -0.600000  .         -2.6000000 2.4
## u5  .        .  .   -2.0000000  .        -1.0000000  3.0000000 .  
##                        
## u1  2.2000000 -0.800000
## u2  0.8571429 -2.142857
## u3 -1.5000000  .       
## u4  1.4000000  .       
## u5  0.0000000  .
getRatingMatrix(rc[1])
## 1 x 10 sparse Matrix of class "dgCMatrix"
##                                    
## u1 . . -0.8 -1.8 . . 1.2 . 2.2 -0.8
# tambien podemos deshacer la normalizacion
denormalize(rc)
## 5 x 10 rating matrix of class 'realRatingMatrix' with 23 ratings.
rz <- normalize(r,method="Z-score") 
head(as(rz, "data.frame"))
##    user item     rating
## 2    u1   i3 -0.4868645
## 3    u1   i4 -1.0954451
## 11   u1   i7  0.7302967
## 17   u1   i9  1.3388774
## 22   u1  i10 -0.4868645
## 1    u2   i1 -0.8495908

Y la visualización de dichas valoraciones en escala tridimensional:

# visualizacion
image(rr, main = "Valoraciones de los usuarios")

image(rc, main = "Valoraciones centradas")

Por último, a partir de unas valoraciones continuas podemos derivar unas de tipo binario, con el comando binarize()

# conversion a datos binarios; minRating es la frontera
rb <- binarize(r, minRating=4) 
as(rb, "matrix")
##       i1    i2    i3    i4    i5    i6    i7    i8    i9   i10
## u1 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE  TRUE FALSE
## u2 FALSE FALSE FALSE FALSE  TRUE  TRUE FALSE FALSE  TRUE FALSE
## u3 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE
## u4 FALSE FALSE FALSE FALSE FALSE FALSE FALSE  TRUE  TRUE FALSE
## u5 FALSE FALSE FALSE FALSE FALSE FALSE  TRUE FALSE FALSE FALSE

MovieLense. Descripción de la base de datos

A continuación ilustraremos el funcionamiento de los sistemas de recomendación con la base de datos MoviLense, incluida en la librería de R recommenderlab. Como primer paso, abordamos la visualización y descripción de la base de datos.

The 100k MovieLense ratings data set. The data was collected through the MovieLens web site (movielens.umn.edu) during the seven-month period from September 19th, 1997 through April 22nd, 1998. The data set contains about 100,000 ratings (1-5) from 943 users on 1664 movies. Movie metadata is also provided in MovieLenseMeta.

# INSPECCION DE DATOS MOVIELENSE. DESCRIPTIVA

data("MovieLense")
MovieLense
## 943 x 1664 rating matrix of class 'realRatingMatrix' with 99392 ratings.
# Para no arrastrar el nombre completo de los datos, lo asignamos al objeto 'r'
r=MovieLense
getRatingMatrix(r[1:10])
## 10 x 1664 sparse Matrix of class "dgCMatrix"
##                                                                           
## 1  5 3 4 3 3 5 4 1 5 3 2 5 5 5 5 5 3 4 5 4 1 4 4 3 4 3 2 4 1 3 3 5 4 2 1 2
## 2  4 . . . . . . . . 2 . . 4 4 . . . . 3 . . . . . 4 . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . 4 . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  4 3 . . . . . . . . . . . . . . 4 . . . 3 . . 4 3 . . . 4 . . . . . . .
## 6  4 . . . . . 2 4 4 . . 4 2 5 3 . . . 4 . 3 3 4 . . . . 2 . . . 4 . . . .
## 7  . . . 5 . . 5 5 5 4 3 5 . . . . . . . . . 5 3 . 3 . 4 5 3 . 4 4 . . . .
## 8  . . . . . . 3 . . . 3 . . . . . . . . . . 5 . . . . . . . . . . . . . .
## 9  . . . . . 5 4 . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 4 . . 4 . . 4 . 4 . 4 5 3 . . 4 . . . . . 5 5 . . . . . . . . 4 4 . . .
##                                                                           
## 1  2 3 4 3 2 5 4 5 5 4 4 5 3 5 4 4 3 3 5 4 5 4 5 5 4 3 2 5 4 4 3 4 3 3 3 4
## 2  . . . . . . . . . . . . . 5 . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . 5 . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . 4 . 5 . . . . . . . 4 . . . . . . . . . . . 4 1 . . 1 . . 1 4 . .
## 6  . . . . . . . . . . 3 . . 4 . . . . . 4 . . 5 . . . . 4 . . . . 3 3 4 .
## 7  . . 5 . . . . 5 . . 5 . . 5 2 4 5 3 . 5 . . . . . 3 . 5 . . . 4 5 1 5 5
## 8  . . . . . . . . . . . . . 5 . . . . 5 5 . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . 5 . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . 4 . . . . . . . 4 . 5 . . . . . 5 . . 4 3 . . . 4 . . . . 4 4 . .
##                                                                           
## 1  3 1 4 4 4 1 4 4 5 5 3 4 3 5 5 4 5 4 5 3 5 2 4 5 3 4 3 5 2 2 1 1 2 4 4 5
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . 5 . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . 3 2 . . . . . . . . 5 3 . . . 3 4 . . 3 3 5 5 3 . . 3 . . .
## 6  . . . . . . 3 . 4 . . . . 3 4 . 4 . . . . . 2 . . 5 . 5 . . . . . . . .
## 7  3 . . . 5 3 4 4 5 3 . . . 4 . . 5 3 3 5 5 . . 5 5 4 5 5 5 . . . . 4 . .
## 8  . . . . . . 4 . . 5 . . . . . . 4 . . . . . . 3 . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . 4 . . 4 . . . . . . . 4 . . . . 4 5 5 . . . . . . . .
##                                                                           
## 1  5 1 5 1 5 5 5 3 3 3 5 1 4 3 4 5 3 2 5 4 5 3 1 4 4 4 4 3 5 1 3 1 3 2 1 4
## 2  . . 4 . . . . . . . . . . . . . . . 5 . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  5 1 . . . . . . . . . . 4 . . . . . . . . . . . . . 4 . . . 3 . . . 3 3
## 6  . . 2 . . . . . 2 . . . . . . 5 3 . 5 . . . 5 5 4 5 5 5 5 . . . . . 2 .
## 7  . . . . . . . . . 2 . . 5 . . . 4 3 5 . . . 5 5 5 4 5 5 . . 3 5 5 3 3 5
## 8  . . . . . . . . . . . . . . . . . . 5 . . . . . . . . . . . . . . . . 5
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . 4 . . . . . . . 5 . . 5 . 4 . . 5 5 5 5 . 4 . . . . . . 4
##                                                                           
## 1  2 4 3 2 2 5 4 5 3 5 2 4 4 3 3 4 4 4 4 3 5 5 2 5 5 5 5 5 5 5 5 5 5 5 3 3
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  1 . . . . . 3 . 5 3 . . . . . . . 1 5 . . . 2 3 5 . . 5 4 5 . 3 . . . .
## 6  . . . . . . 3 . 4 3 . 3 . . . . . . . . 5 4 . 4 4 4 . . 5 4 4 . 4 4 . 4
## 7  1 . . . . . 4 4 5 5 . 5 5 . . . 3 5 4 5 . 3 . 5 . . 3 4 5 5 5 3 4 4 5 5
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . 5 . 5 . 5 4 . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . 4 . 4 4 5 . . 4 4 4 . 4 . . . 4 . 4 . . . 4 3 4 . 5 5 5
##                                                                           
## 1  5 4 5 4 4 4 4 3 3 5 5 4 4 4 5 5 5 5 4 3 3 5 4 5 3 4 5 5 4 4 3 4 2 4 3 5
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  4 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . 3 . . . . . .
## 5  5 . 4 . 3 5 . . 5 . . . . 4 . . . . . 2 . . . 4 . . . 4 5 3 4 . . 3 . 1
## 6  . 4 4 . 5 4 4 3 3 . 4 4 3 4 4 . 5 . 4 3 . 3 3 3 3 . . 4 4 . 5 . 4 . . 5
## 7  3 4 4 . 5 4 4 5 . 5 5 4 5 5 5 5 4 3 5 5 2 3 5 5 5 . 4 5 . 4 5 1 3 5 4 4
## 8  4 5 5 . . . 4 5 . 4 . . . . 5 . . . . . . . . . . . . . . 4 . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . 5 . . . . . . . . . . . . . . .
## 10 . 5 5 . 5 4 . . . . 5 4 . 4 4 . 5 3 4 5 . . 4 . 5 . . . . . 5 . . . . 4
##                                                                           
## 1  3 3 1 3 5 4 5 5 2 3 4 5 4 4 1 3 2 4 5 4 2 4 4 3 4 5 1 2 2 5 1 4 4 4 4 2
## 2  . . . . . . . . . . . . . . . . . . . . 4 . . . . 5 . . . . . . . . 5 .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . 1 . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . 3 . . 4 . . 2 3 4 5 2 3 2 . 4 2 4 . . . 4 . 1 . 1 . . . . . . 3 . .
## 6  . . . . 4 . 4 . . . . . . . . . . . . . 2 5 . . . 4 . . . 3 . 3 . . . .
## 7  4 . 1 . . . 5 . . 5 3 4 3 3 3 3 . 5 . . 5 5 . . 4 . . . . . . . . . . .
## 8  . . . . . 5 . . . . 4 5 5 . . . 4 . . . . . . . 4 . 2 . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . 4 . . . . . . . . . .
## 10 . 4 . . 4 . 5 . . . . . . 4 . . . 4 . . . 4 . . . . . . 4 . . . . . . .
##                                                                           
## 1  5 1 2 4 4 5 1 1 1 3 1 2 4 1 4 5 5 2 3 . . . . . . . . . . . . . . . . .
## 2  . . 4 . 4 3 . . . . . . . . . 4 . . 5 4 3 5 4 4 3 4 3 3 4 5 4 5 4 3 3 3
## 3  . . . . . 2 . 4 . . . 2 . . . . . 3 2 . . . . . . . . . . . . . . . 2 .
## 4  . . . . . 5 . 4 . . . 3 . . . . . 4 . . . . . . . . . . . . . . . . 4 .
## 5  . . . . 5 . 1 . . . . . . . 4 . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . 2 2 1 . 3 . . . . . . 4 . . 4 . 4 4 2 . . . . . . . 2 3 2 . . .
## 7  . . . . . 4 3 1 . . . 4 5 4 . 3 . . . 3 . 4 . . . . . 3 . . . 5 4 . 4 .
## 8  . . . . . 5 1 3 . . . . . . . . . . . 3 . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . 4 . . . . . . . . . 5 . . .
## 10 . . . . . . . . . . . . . . . 4 . . . 4 4 4 4 . . . . . . 4 . 5 4 . . 4
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  3 3 4 4 1 4 3 4 3 4 4 4 5 4 3 4 3 3 1 4 5 3 5 1 1 5 . . . . . . . . . .
## 3  . . . . 2 . . . . 3 2 . 2 . . . 3 . . . . . . . . . 2 4 2 5 5 3 2 2 1 2
## 4  . . . . 5 . . . . . 5 5 . . . . . . . . . . . . . . . . . . . . . 5 . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . 3 2 . . 3 3 . . 2 4 4 . 4 . 3 2 2 . . . . . . 3 4 . . 3 . . . . .
## 7  . . . . 1 . . . . . 4 . . . . . 5 . 3 . . . . . . . 4 5 . . . . . 1 . .
## 8  . . . . 3 . . . . . . 4 . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . 4 . . . 5 . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . 3 . . . . . . . 4 . . . . . . . . . . . . . . . 3 . 4 . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  4 5 4 2 4 1 2 3 1 1 1 2 3 5 1 4 3 4 3 5 5 3 3 3 2 1 3 3 . . . . . . . .
## 4  5 3 5 . . . . . . . . . . . . . . . . . . . . . . . 5 . 3 4 2 5 5 5 5 .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . 3
## 6  . . . . . . . . . . . . . 2 . . . . . . . . . . . . . . . 4 . . . . . .
## 7  . . . . . . . 5 . . . . . . 3 . . . . . . . . . . . . . 4 5 . . . . . .
## 8  . . . . . . . . . 3 . 4 . . 2 . . . . . . . . . . . . . . . 2 . . . . .
## 9  . . . . . . . . . . . . . 4 . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . 4 4 . . . . . 4 . . . . . . . . . . . . . . . 5 . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  1 1 3 3 1 1 1 1 3 3 3 3 2 1 1 3 3 1 5 3 3 4 2 3 2 1 5 4 2 2 2 2 5 2 2 3
## 6  . . . 2 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . 4 . 5 . . . . . . . . . . 5 4 4 . 4 . 3 5 4 3 . 4 . 3 . 4 . . 4 . . 4
## 8  . . . . . . . . . . . . . . . . . . . . . 1 . . . . . . . . . . . . . .
## 9  . . . . . . . 5 . . . . . . . . . . . . . 5 . . . . . . . . . . . . . .
## 10 . . . 4 . . . 4 . . . . . . . . . . . . . 4 . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  1 5 1 3 2 3 1 3 5 2 1 1 3 3 3 1 1 3 3 3 3 1 4 4 1 2 3 3 5 3 5 3 4 5 5 4
## 6  . . . . . 1 . . 4 . 4 . . . . . . . . 4 . . . 3 . 3 . 4 . . . . 4 . . 4
## 7  . 4 5 4 5 3 . . . . . . . . . 2 5 3 4 3 5 3 . 5 . . . 5 5 5 3 4 4 5 4 5
## 8  . . . 4 . . . . . . . . . . . . . . . . . . . . . . . . . . . 2 . . . 5
## 9  . . 4 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . 4 . . . . . . . . . 4 . . . 4 . 4 . . . . . . . . . 3 . 4 . . 5
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  5 1 1 1 1 1 1 4 2 3 4 3 2 2 1 1 1 1 1 4 1 1 . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . 1 2 2 4 5 4 2 1 4 4 3 5 3 2
## 7  5 . . . 1 2 . 5 5 . 2 5 3 3 4 5 5 . . 4 . . . . . 4 . 4 . 4 . . . . 3 4
## 8  . . . . . . . . . . . . . . . . . . . . . 1 . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . 4 . . . . . . . . . . . . . 3 3 4 . . . 4 . . 4 .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  1 2 5 5 1 1 4 5 4 5 4 5 5 5 4 5 5 5 5 4 5 5 4 4 4 4 4 4 5 4 3 3 4 4 4 3
## 7  2 . 5 . . . . 4 4 5 3 4 5 5 . 3 4 3 . 5 5 . . 5 5 4 5 4 5 5 4 5 3 5 5 .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . 4 . . . 5 . . . 5 . . . . . . . . . . . . . . . . . . 4 .
## 10 . . 4 4 . . 5 5 5 . 4 5 5 . 4 . 5 4 . . . 4 . 4 5 4 5 4 . 4 . 5 4 . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  4 4 5 4 4 5 4 4 4 3 5 4 4 5 5 3 5 3 4 4 4 4 4 3 4 4 2 4 4 2 2 . . . . .
## 7  5 5 5 . 4 2 3 . . . 4 5 5 . 4 . . 5 5 5 2 5 . . . . . . 3 . . 3 2 4 3 3
## 8  . 4 5 . . . . . . 4 . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . 4 . . . . . 3 . . . . . . . . . . . . . . . . .
## 10 4 5 4 . 4 . . . . 4 5 . 4 . . . 5 . 4 . 3 4 5 . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  2 4 3 5 4 4 1 4 3 3 4 3 4 4 5 3 4 5 2 3 4 4 1 5 4 3 3 3 5 5 3 5 2 3 4 3
## 8  . . . . . 3 . . . . . . . . . . . . . . . 3 . 4 . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . 4 . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  5 5 2 4 4 3 4 4 5 2 3 5 5 3 2 5 3 3 1 4 5 3 4 3 4 3 3 4 3 5 3 5 4 5 4 4
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . 4 .
## 10 . 4 . . . . . 4 5 . . . . . . . . . . . . 5 5 4 . 5 . . . 4 5 . . . 4 .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  5 4 3 4 5 4 3 4 3 5 3 3 3 5 4 5 5 5 3 4 4 4 5 3 5 3 4 5 4 5 5 5 5 3 5 3
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . 5 .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 5 . . . . . . . . . . . 4 . . . . . . . . . . . . . . . . . . . . . 4 3
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  4 5 5 3 4 3 5 5 5 3 5 3 4 4 5 4 1 5 1 3 2 5 3 3 3 5 1 2 4 . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . 4 4 3 1 1 4 .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . 1
## 10 . 5 5 5 4 . . . . . 3 4 . . . . . . . . . . . . . . . . . . . 4 . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  5 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . 4 4 5 3 4 3 4 4 4 4 3 5 3 4 4 5 4 4 4 4 4 . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                                                                           
## 1  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 2  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 3  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 4  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 5  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 6  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 7  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 8  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 9  . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
## 10 . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . . .
##                   
## 1  . . . . . . . .
## 2  . . . . . . . .
## 3  . . . . . . . .
## 4  . . . . . . . .
## 5  . . . . . . . .
## 6  . . . . . . . .
## 7  . . . . . . . .
## 8  . . . . . . . .
## 9  . . . . . . . .
## 10 . . . . . . . .
# la convertimos a data.frame para visualizar mejor (sin valores faltantes)
rdf=as(r,"data.frame")
head(rdf)
##     user                                                 item rating
## 1      1                                     Toy Story (1995)      5
## 453    1                                     GoldenEye (1995)      3
## 584    1                                    Four Rooms (1995)      4
## 674    1                                    Get Shorty (1995)      3
## 883    1                                       Copycat (1995)      3
## 969    1 Shanghai Triad (Yao a yao yao dao waipo qiao) (1995)      5

Es posible contar cuántas valoraciones tiene cada usuario y cuántos usuarios han valorado cada ítem, así como calcular el promedio de la valoracion de cada uno (usuario o ítem):

rowCounts(r[1,])
##   1 
## 271
head(rowCounts(r))
##   1   2   3   4   5   6 
## 271  61  51  23 175 208
# y cuantos usuarios han valorado cada item
colCounts(r[,1])
## Toy Story (1995) 
##              452
# Asi como calcular el promedio de la valoracion de cada uno (usuario o item)
rowMeans(r[1,])
##        1 
## 3.605166
colMeans(r[,1])
## Toy Story (1995) 
##         3.878319

Se describen las valoraciones en global

summary(getRatings(r))
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    1.00    3.00    4.00    3.53    4.00    5.00
image(r)

qplot(getRatings(r))+geom_bar()+labs(x="Valoraciones")

summary(rowCounts(r))
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    19.0    32.0    64.0   105.4   147.5   735.0
hist(rowCounts(r),main="Numero de valoraciones por usuario",xlab="")

summary(colCounts(r))
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    1.00    7.00   27.00   59.73   80.00  583.00
hist(colCounts(r),main="Numero de valoraciones por item",xlab="")

summary(rowMeans(r))
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.497   3.325   3.619   3.588   3.871   4.870
hist(rowMeans(r),main="Valoracion media de los usuarios",xlab="",ylab="")

summary(colMeans(r))
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   2.665   3.162   3.077   3.653   5.000
hist(colMeans(r),xlab="", main="Valoracion media de las películas",ylab="")

Visualizamos las valoraciones y sus estandarizaciones

# method="center" , "Z-score"
image(r)

rz=normalize(r, method="Z-score")
rc=normalize(r, method="center")

# y añadimos en el data frame las valoraciones estandarizadas
rdf$ratingc=as(rc,"data.frame")$rating
rdf$ratingz=as(rz,"data.frame")$rating
head(rdf)
##     user                                                 item rating
## 1      1                                     Toy Story (1995)      5
## 453    1                                     GoldenEye (1995)      3
## 584    1                                    Four Rooms (1995)      4
## 674    1                                    Get Shorty (1995)      3
## 883    1                                       Copycat (1995)      3
## 969    1 Shanghai Triad (Yao a yao yao dao waipo qiao) (1995)      5
##        ratingc    ratingz
## 1    1.3948339  1.1043083
## 453 -0.6051661 -0.4791179
## 584  0.3948339  0.3125952
## 674 -0.6051661 -0.4791179
## 883 -0.6051661 -0.4791179
## 969  1.3948339  1.1043083
# y  representamos a continuación las valoraciones y las estandarizadas

image(r,main="Z-score")

image(normalize(rc, method="center"),main="Center")

image(normalize(rz, method="center"),main="Z-Score")

así como eliminando los valores faltantes:

ggplot(rdf,aes(x=ratingc))+geom_histogram(bins=15,fill="steelblue",col="grey")+
  labs(x="Valoraciones C",y="")+ theme_classic()+
  theme(legend.position="NONE") 

ggplot(rdf,aes(x=ratingz))+geom_histogram(bins=15,fill="skyblue2",col="grey")+
  labs(x="Valoraciones Z",y="")+ theme_classic()+
  theme(legend.position="NONE")

Sistemas de recomendación

El OBJETIVO prioritario de un sistema de recomendación es conseguir la recomendación de S items/productos no valorados por un usuario \(u_x\) en base a su experiencia y la información disponible sobre los items y resto de usuarios.

Sistema de recomendación basado en contenido

En un sistema de recomendación basado en contenido se utiliza para la recomendación la experiencia del usuarios \(u_x\) (para ofrecer recomendaciónes) y la información sobre el etiquetado de los productos (para establecer similaridades).

Nuestro usuario objetivo será \(u_x=329\) y trataremos de recomendarle 10 productos.

x=329
S=10

MoviLenseMeta contiene información sobre atributos de las películas. Básicamente clasificación por géneros (19 géneros).

#En atributos tenemos el etiquetado (0/1) de las (1664) películas en la bd: 
# filas=películas, columnas=generos en que son clasificadas
atributos <- MovieLenseMeta
colnames(atributos)
##  [1] "title"       "year"        "url"         "unknown"     "Action"     
##  [6] "Adventure"   "Animation"   "Children's"  "Comedy"      "Crime"      
## [11] "Documentary" "Drama"       "Fantasy"     "Film-Noir"   "Horror"     
## [16] "Musical"     "Mystery"     "Romance"     "Sci-Fi"      "Thriller"   
## [21] "War"         "Western"
head(atributos)
##                                                  title year
## 1                                     Toy Story (1995) 1995
## 2                                     GoldenEye (1995) 1995
## 3                                    Four Rooms (1995) 1995
## 4                                    Get Shorty (1995) 1995
## 5                                       Copycat (1995) 1995
## 6 Shanghai Triad (Yao a yao yao dao waipo qiao) (1995) 1995
##                                                            url unknown
## 1        http://us.imdb.com/M/title-exact?Toy%20Story%20(1995)       0
## 2          http://us.imdb.com/M/title-exact?GoldenEye%20(1995)       0
## 3       http://us.imdb.com/M/title-exact?Four%20Rooms%20(1995)       0
## 4       http://us.imdb.com/M/title-exact?Get%20Shorty%20(1995)       0
## 5            http://us.imdb.com/M/title-exact?Copycat%20(1995)       0
## 6 http://us.imdb.com/Title?Yao+a+yao+yao+dao+waipo+qiao+(1995)       0
##   Action Adventure Animation Children's Comedy Crime Documentary Drama
## 1      0         0         1          1      1     0           0     0
## 2      1         1         0          0      0     0           0     0
## 3      0         0         0          0      0     0           0     0
## 4      1         0         0          0      1     0           0     1
## 5      0         0         0          0      0     1           0     1
## 6      0         0         0          0      0     0           0     1
##   Fantasy Film-Noir Horror Musical Mystery Romance Sci-Fi Thriller War
## 1       0         0      0       0       0       0      0        0   0
## 2       0         0      0       0       0       0      0        1   0
## 3       0         0      0       0       0       0      0        1   0
## 4       0         0      0       0       0       0      0        0   0
## 5       0         0      0       0       0       0      0        1   0
## 6       0         0      0       0       0       0      0        0   0
##   Western
## 1       0
## 2       0
## 3       0
## 4       0
## 5       0
## 6       0

A la hora de describir los datos, proponemos varias descripciones:

  • las películas disponibles por el anyo en que se estrenaron
atributos %>% 
  select(year) %>% 
  group_by(year) %>% 
  count() %>% 
  ggplot(aes(x = as.factor(year), y = n)) + 
  geom_col() + theme_bw() + labs(x = "year") + 
  theme(axis.text.x = element_text(angle = 90, size = 6))

  • las películas disponibles por el género/temática al que pertenecen
atributos %>% 
  select(-title, -url, -year) %>% 
  gather(key = "variable", value = "valor") %>% 
  filter(valor != 0) %>% 
  group_by(variable) %>% 
  count() %>% 
  ggplot(aes(x = reorder(variable, desc(n)), y = n)) + 
  geom_col() + theme_bw() + labs(x = "Tematica") + 
  theme(axis.text.x = element_text(angle = 90))

Procedemos a continuación con la aplicación del algoritmo de recomendación basado en contenido.

PASO 1. Cálculo de similitud de todos los items no valorados con los items valorados.

Se identifican las películas vistas y no vistas por el usuario \(u_x\), asumiendo que si la pelicula no ha sido valorada es que no ha sido vista.

length(as(r[x],"list")[[1]])
## [1] 64
# Identificacion de las películas vistas y no vistas por el usuario $u_x$ 
# Se asume que si la pelicula no ha sido valorada es que no ha sido vista. 
películas=as.vector(unique(rdf$item))
películas_vistas=as.vector(rdf[rdf$user==x,2])
sel_vistas=which(películas %in% películas_vistas)
sel_vistas
##  [1]    7    8   11   12   39   50   79   81   98  100  117  124  127  129
## [15]  137  147  169  174  181  185  186  194  197  198  199  245  248  250
## [29]  258  268  271  273  275  281  283  285  287  293  294  296  299  301
## [43]  311  320  321  324  329  331  336  420  480  508  511  530  587  647
## [57]  651  653  699  849  872  884  916 1002
películas_no_vistas=películas[-sel_vistas]
películas_vistas
##  [1] "Twelve Monkeys (1995)"               
##  [2] "Babe (1995)"                         
##  [3] "Seven (Se7en) (1995)"                
##  [4] "Usual Suspects, The (1995)"          
##  [5] "Strange Days (1995)"                 
##  [6] "Star Wars (1977)"                    
##  [7] "Fugitive, The (1993)"                
##  [8] "Hudsucker Proxy, The (1994)"         
##  [9] "Silence of the Lambs, The (1991)"    
## [10] "Fargo (1996)"                        
## [11] "Rock, The (1996)"                    
## [12] "Lone Star (1996)"                    
## [13] "Godfather, The (1972)"               
## [14] "Bound (1996)"                        
## [15] "Big Night (1996)"                    
## [16] "Long Kiss Goodnight, The (1996)"     
## [17] "Wrong Trousers, The (1993)"          
## [18] "Raiders of the Lost Ark (1981)"      
## [19] "Return of the Jedi (1983)"           
## [20] "Psycho (1960)"                       
## [21] "Blues Brothers, The (1980)"          
## [22] "Sting, The (1973)"                   
## [23] "Graduate, The (1967)"                
## [24] "Nikita (La Femme Nikita) (1990)"     
## [25] "Bridge on the River Kwai, The (1957)"
## [26] "Devil's Own, The (1997)"             
## [27] "Grosse Pointe Blank (1997)"          
## [28] "Fifth Element, The (1997)"           
## [29] "Contact (1997)"                      
## [30] "Full Monty, The (1997)"              
## [31] "Good Will Hunting (1997)"            
## [32] "Sabrina (1995)"                      
## [33] "Leaving Las Vegas (1995)"            
## [34] "Time to Kill, A (1996)"              
## [35] "Tin Cup (1996)"                      
## [36] "English Patient, The (1996)"         
## [37] "Scream (1996)"                       
## [38] "Liar Liar (1997)"                    
## [39] "Breakdown (1997)"                    
## [40] "Ulee's Gold (1997)"                  
## [41] "Air Force One (1997)"                
## [42] "L.A. Confidential (1997)"            
## [43] "Titanic (1997)"                      
## [44] "Murder at 1600 (1997)"               
## [45] "Dante's Peak (1997)"                 
## [46] "G.I. Jane (1997)"                    
## [47] "Edge, The (1997)"                    
## [48] "Game, The (1997)"                    
## [49] "Bean (1997)"                         
## [50] "E.T. the Extra-Terrestrial (1982)"   
## [51] "Casablanca (1942)"                   
## [52] "Wings of Desire (1987)"              
## [53] "Boot, Das (1981)"                    
## [54] "Traveller (1997)"                    
## [55] "Primal Fear (1996)"                  
## [56] "Glory (1989)"                        
## [57] "Stand by Me (1986)"                  
## [58] "Manchurian Candidate, The (1962)"    
## [59] "Singin' in the Rain (1952)"          
## [60] "Diva (1981)"                         
## [61] "Peacemaker, The (1997)"              
## [62] "Flubber (1997)"                      
## [63] "White Squall (1996)"                 
## [64] "2 Days in the Valley (1996)"
películas_no_vistas
##    [1] "Toy Story (1995)"                                                                 
##    [2] "GoldenEye (1995)"                                                                 
##    [3] "Four Rooms (1995)"                                                                
##    [4] "Get Shorty (1995)"                                                                
##    [5] "Copycat (1995)"                                                                   
##    [6] "Shanghai Triad (Yao a yao yao dao waipo qiao) (1995)"                             
##    [7] "Dead Man Walking (1995)"                                                          
##    [8] "Richard III (1995)"                                                               
##    [9] "Mighty Aphrodite (1995)"                                                          
##   [10] "Postino, Il (1994)"                                                               
##   [11] "Mr. Holland's Opus (1995)"                                                        
##   [12] "French Twist (Gazon maudit) (1995)"                                               
##   [13] "From Dusk Till Dawn (1996)"                                                       
##   [14] "White Balloon, The (1995)"                                                        
##   [15] "Antonia's Line (1995)"                                                            
##   [16] "Angels and Insects (1995)"                                                        
##   [17] "Muppet Treasure Island (1996)"                                                    
##   [18] "Braveheart (1995)"                                                                
##   [19] "Taxi Driver (1976)"                                                               
##   [20] "Rumble in the Bronx (1995)"                                                       
##   [21] "Birdcage, The (1996)"                                                             
##   [22] "Brothers McMullen, The (1995)"                                                    
##   [23] "Bad Boys (1995)"                                                                  
##   [24] "Apollo 13 (1995)"                                                                 
##   [25] "Batman Forever (1995)"                                                            
##   [26] "Belle de jour (1967)"                                                             
##   [27] "Crimson Tide (1995)"                                                              
##   [28] "Crumb (1994)"                                                                     
##   [29] "Desperado (1995)"                                                                 
##   [30] "Doom Generation, The (1995)"                                                      
##   [31] "Free Willy 2: The Adventure Home (1995)"                                          
##   [32] "Mad Love (1995)"                                                                  
##   [33] "Nadja (1994)"                                                                     
##   [34] "Net, The (1995)"                                                                  
##   [35] "To Wong Foo, Thanks for Everything! Julie Newmar (1995)"                          
##   [36] "Billy Madison (1995)"                                                             
##   [37] "Clerks (1994)"                                                                    
##   [38] "Disclosure (1994)"                                                                
##   [39] "Dolores Claiborne (1994)"                                                         
##   [40] "Eat Drink Man Woman (1994)"                                                       
##   [41] "Exotica (1994)"                                                                   
##   [42] "Ed Wood (1994)"                                                                   
##   [43] "Hoop Dreams (1994)"                                                               
##   [44] "I.Q. (1994)"                                                                      
##   [45] "Legends of the Fall (1994)"                                                       
##   [46] "Madness of King George, The (1994)"                                               
##   [47] "Natural Born Killers (1994)"                                                      
##   [48] "Outbreak (1995)"                                                                  
##   [49] "Professional, The (1994)"                                                         
##   [50] "Pulp Fiction (1994)"                                                              
##   [51] "Priest (1994)"                                                                    
##   [52] "Quiz Show (1994)"                                                                 
##   [53] "Three Colors: Red (1994)"                                                         
##   [54] "Three Colors: Blue (1993)"                                                        
##   [55] "Three Colors: White (1994)"                                                       
##   [56] "Stargate (1994)"                                                                  
##   [57] "Santa Clause, The (1994)"                                                         
##   [58] "Shawshank Redemption, The (1994)"                                                 
##   [59] "What's Eating Gilbert Grape (1993)"                                               
##   [60] "While You Were Sleeping (1995)"                                                   
##   [61] "Ace Ventura: Pet Detective (1994)"                                                
##   [62] "Crow, The (1994)"                                                                 
##   [63] "Forrest Gump (1994)"                                                              
##   [64] "Four Weddings and a Funeral (1994)"                                               
##   [65] "Lion King, The (1994)"                                                            
##   [66] "Mask, The (1994)"                                                                 
##   [67] "Maverick (1994)"                                                                  
##   [68] "Faster Pussycat! Kill! Kill! (1965)"                                              
##   [69] "Brother Minister: The Assassination of Malcolm X (1994)"                          
##   [70] "Carlito's Way (1993)"                                                             
##   [71] "Firm, The (1993)"                                                                 
##   [72] "Free Willy (1993)"                                                                
##   [73] "Hot Shots! Part Deux (1993)"                                                      
##   [74] "Jurassic Park (1993)"                                                             
##   [75] "Much Ado About Nothing (1993)"                                                    
##   [76] "Robert A. Heinlein's The Puppet Masters (1994)"                                   
##   [77] "Ref, The (1994)"                                                                  
##   [78] "Remains of the Day, The (1993)"                                                   
##   [79] "Searching for Bobby Fischer (1993)"                                               
##   [80] "Sleepless in Seattle (1993)"                                                      
##   [81] "Blade Runner (1982)"                                                              
##   [82] "So I Married an Axe Murderer (1993)"                                              
##   [83] "Nightmare Before Christmas, The (1993)"                                           
##   [84] "True Romance (1993)"                                                              
##   [85] "Welcome to the Dollhouse (1995)"                                                  
##   [86] "Home Alone (1990)"                                                                
##   [87] "Aladdin (1992)"                                                                   
##   [88] "Terminator 2: Judgment Day (1991)"                                                
##   [89] "Dances with Wolves (1990)"                                                        
##   [90] "Snow White and the Seven Dwarfs (1937)"                                           
##   [91] "Heavy Metal (1981)"                                                               
##   [92] "Aristocats, The (1970)"                                                           
##   [93] "All Dogs Go to Heaven 2 (1996)"                                                   
##   [94] "Theodore Rex (1995)"                                                              
##   [95] "Sgt. Bilko (1996)"                                                                
##   [96] "Diabolique (1996)"                                                                
##   [97] "Moll Flanders (1996)"                                                             
##   [98] "Kids in the Hall: Brain Candy (1996)"                                             
##   [99] "Mystery Science Theater 3000: The Movie (1996)"                                   
##  [100] "Operation Dumbo Drop (1995)"                                                      
##  [101] "Truth About Cats & Dogs, The (1996)"                                              
##  [102] "Flipper (1996)"                                                                   
##  [103] "Horseman on the Roof, The (Hussard sur le toit, Le) (1995)"                       
##  [104] "Wallace & Gromit: The Best of Aardman Animation (1996)"                           
##  [105] "Haunted World of Edward D. Wood Jr., The (1995)"                                  
##  [106] "Cold Comfort Farm (1995)"                                                         
##  [107] "Twister (1996)"                                                                   
##  [108] "Maya Lin: A Strong Clear Vision (1994)"                                           
##  [109] "Striptease (1996)"                                                                
##  [110] "Independence Day (ID4) (1996)"                                                    
##  [111] "Cable Guy, The (1996)"                                                            
##  [112] "Frighteners, The (1996)"                                                          
##  [113] "Phenomenon (1996)"                                                                
##  [114] "Spitfire Grill, The (1996)"                                                       
##  [115] "Supercop (1992)"                                                                  
##  [116] "Kansas City (1996)"                                                               
##  [117] "Breakfast at Tiffany's (1961)"                                                    
##  [118] "Wizard of Oz, The (1939)"                                                         
##  [119] "Gone with the Wind (1939)"                                                        
##  [120] "Citizen Kane (1941)"                                                              
##  [121] "2001: A Space Odyssey (1968)"                                                     
##  [122] "Mr. Smith Goes to Washington (1939)"                                              
##  [123] "D3: The Mighty Ducks (1996)"                                                      
##  [124] "Love Bug, The (1969)"                                                             
##  [125] "Homeward Bound: The Incredible Journey (1993)"                                    
##  [126] "20,000 Leagues Under the Sea (1954)"                                              
##  [127] "Bedknobs and Broomsticks (1971)"                                                  
##  [128] "Sound of Music, The (1965)"                                                       
##  [129] "Die Hard (1988)"                                                                  
##  [130] "Lawnmower Man, The (1992)"                                                        
##  [131] "Unhook the Stars (1996)"                                                          
##  [132] "Ghost and the Darkness, The (1996)"                                               
##  [133] "Jude (1996)"                                                                      
##  [134] "Swingers (1996)"                                                                  
##  [135] "Willy Wonka and the Chocolate Factory (1971)"                                     
##  [136] "Sleeper (1973)"                                                                   
##  [137] "Fish Called Wanda, A (1988)"                                                      
##  [138] "Monty Python's Life of Brian (1979)"                                              
##  [139] "Dirty Dancing (1987)"                                                             
##  [140] "Reservoir Dogs (1992)"                                                            
##  [141] "Platoon (1986)"                                                                   
##  [142] "Weekend at Bernie's (1989)"                                                       
##  [143] "Basic Instinct (1992)"                                                            
##  [144] "Glengarry Glen Ross (1992)"                                                       
##  [145] "Top Gun (1986)"                                                                   
##  [146] "On Golden Pond (1981)"                                                            
##  [147] "Return of the Pink Panther, The (1974)"                                           
##  [148] "Abyss, The (1989)"                                                                
##  [149] "Jean de Florette (1986)"                                                          
##  [150] "Manon of the Spring (Manon des sources) (1986)"                                   
##  [151] "Private Benjamin (1980)"                                                          
##  [152] "Monty Python and the Holy Grail (1974)"                                           
##  [153] "Cinema Paradiso (1988)"                                                           
##  [154] "Delicatessen (1991)"                                                              
##  [155] "Empire Strikes Back, The (1980)"                                                  
##  [156] "Princess Bride, The (1987)"                                                       
##  [157] "Brazil (1985)"                                                                    
##  [158] "Aliens (1986)"                                                                    
##  [159] "Good, The Bad and The Ugly, The (1966)"                                           
##  [160] "12 Angry Men (1957)"                                                              
##  [161] "Clockwork Orange, A (1971)"                                                       
##  [162] "Apocalypse Now (1979)"                                                            
##  [163] "GoodFellas (1990)"                                                                
##  [164] "Alien (1979)"                                                                     
##  [165] "Army of Darkness (1993)"                                                          
##  [166] "Godfather: Part II, The (1974)"                                                   
##  [167] "Full Metal Jacket (1987)"                                                         
##  [168] "Grand Day Out, A (1992)"                                                          
##  [169] "Henry V (1989)"                                                                   
##  [170] "Amadeus (1984)"                                                                   
##  [171] "Raging Bull (1980)"                                                               
##  [172] "Right Stuff, The (1983)"                                                          
##  [173] "Terminator, The (1984)"                                                           
##  [174] "Dead Poets Society (1989)"                                                        
##  [175] "Shining, The (1980)"                                                              
##  [176] "Evil Dead II (1987)"                                                              
##  [177] "Groundhog Day (1993)"                                                             
##  [178] "Unforgiven (1992)"                                                                
##  [179] "Back to the Future (1985)"                                                        
##  [180] "Patton (1970)"                                                                    
##  [181] "Akira (1988)"                                                                     
##  [182] "Cyrano de Bergerac (1990)"                                                        
##  [183] "Young Frankenstein (1974)"                                                        
##  [184] "This Is Spinal Tap (1984)"                                                        
##  [185] "Indiana Jones and the Last Crusade (1989)"                                        
##  [186] "M*A*S*H (1970)"                                                                   
##  [187] "Unbearable Lightness of Being, The (1988)"                                        
##  [188] "Room with a View, A (1986)"                                                       
##  [189] "Pink Floyd - The Wall (1982)"                                                     
##  [190] "Field of Dreams (1989)"                                                           
##  [191] "When Harry Met Sally... (1989)"                                                   
##  [192] "Bram Stoker's Dracula (1992)"                                                     
##  [193] "Cape Fear (1991)"                                                                 
##  [194] "Nightmare on Elm Street, A (1984)"                                                
##  [195] "Mirror Has Two Faces, The (1996)"                                                 
##  [196] "Breaking the Waves (1996)"                                                        
##  [197] "Star Trek: First Contact (1996)"                                                  
##  [198] "Sling Blade (1996)"                                                               
##  [199] "Ridicule (1996)"                                                                  
##  [200] "101 Dalmatians (1996)"                                                            
##  [201] "Die Hard 2 (1990)"                                                                
##  [202] "Star Trek VI: The Undiscovered Country (1991)"                                    
##  [203] "Star Trek: The Wrath of Khan (1982)"                                              
##  [204] "Star Trek III: The Search for Spock (1984)"                                       
##  [205] "Star Trek IV: The Voyage Home (1986)"                                             
##  [206] "Batman Returns (1992)"                                                            
##  [207] "Young Guns (1988)"                                                                
##  [208] "Under Siege (1992)"                                                               
##  [209] "Jaws (1975)"                                                                      
##  [210] "Mars Attacks! (1996)"                                                             
##  [211] "Citizen Ruth (1996)"                                                              
##  [212] "Jerry Maguire (1996)"                                                             
##  [213] "Raising Arizona (1987)"                                                           
##  [214] "Sneakers (1992)"                                                                  
##  [215] "Beavis and Butt-head Do America (1996)"                                           
##  [216] "Last of the Mohicans, The (1992)"                                                 
##  [217] "Kolya (1996)"                                                                     
##  [218] "Jungle2Jungle (1997)"                                                             
##  [219] "Smilla's Sense of Snow (1997)"                                                    
##  [220] "Chasing Amy (1997)"                                                               
##  [221] "Turbo: A Power Rangers Movie (1997)"                                              
##  [222] "Austin Powers: International Man of Mystery (1997)"                               
##  [223] "Shall We Dance? (1996)"                                                           
##  [224] "Lost World: Jurassic Park, The (1997)"                                            
##  [225] "Pillow Book, The (1995)"                                                          
##  [226] "Batman & Robin (1997)"                                                            
##  [227] "My Best Friend's Wedding (1997)"                                                  
##  [228] "When the Cats Away (Chacun cherche son chat) (1996)"                              
##  [229] "Men in Black (1997)"                                                              
##  [230] "George of the Jungle (1997)"                                                      
##  [231] "Event Horizon (1997)"                                                             
##  [232] "Air Bud (1997)"                                                                   
##  [233] "In the Company of Men (1997)"                                                     
##  [234] "Steel (1997)"                                                                     
##  [235] "Mimic (1997)"                                                                     
##  [236] "Hunt for Red October, The (1990)"                                                 
##  [237] "Kull the Conqueror (1997)"                                                        
##  [238] "unknown"                                                                          
##  [239] "Gattaca (1997)"                                                                   
##  [240] "Starship Troopers (1997)"                                                         
##  [241] "Heat (1995)"                                                                      
##  [242] "Sense and Sensibility (1995)"                                                     
##  [243] "Restoration (1995)"                                                               
##  [244] "Bed of Roses (1996)"                                                              
##  [245] "Once Upon a Time... When We Were Colored (1995)"                                  
##  [246] "Up Close and Personal (1996)"                                                     
##  [247] "River Wild, The (1994)"                                                           
##  [248] "Emma (1996)"                                                                      
##  [249] "Secrets & Lies (1996)"                                                            
##  [250] "Marvin's Room (1996)"                                                             
##  [251] "Evita (1996)"                                                                     
##  [252] "Fierce Creatures (1997)"                                                          
##  [253] "Absolute Power (1997)"                                                            
##  [254] "Rosewood (1997)"                                                                  
##  [255] "Donnie Brasco (1997)"                                                             
##  [256] "Promesse, La (1996)"                                                              
##  [257] "Face/Off (1997)"                                                                  
##  [258] "Hoodlum (1997)"                                                                   
##  [259] "In & Out (1997)"                                                                  
##  [260] "Fly Away Home (1996)"                                                             
##  [261] "Ice Storm, The (1997)"                                                            
##  [262] "Mrs. Brown (Her Majesty, Mrs. Brown) (1997)"                                      
##  [263] "Devil's Advocate, The (1997)"                                                     
##  [264] "FairyTale: A True Story (1997)"                                                   
##  [265] "Deceiver (1997)"                                                                  
##  [266] "Rainmaker, The (1997)"                                                            
##  [267] "Wings of the Dove, The (1997)"                                                    
##  [268] "Midnight in the Garden of Good and Evil (1997)"                                   
##  [269] "3 Ninjas: High Noon At Mega Mountain (1998)"                                      
##  [270] "Apt Pupil (1998)"                                                                 
##  [271] "As Good As It Gets (1997)"                                                        
##  [272] "In the Name of the Father (1993)"                                                 
##  [273] "Schindler's List (1993)"                                                          
##  [274] "Everyone Says I Love You (1996)"                                                  
##  [275] "Paradise Lost: The Child Murders at Robin Hood Hills (1996)"                      
##  [276] "Mother (1996)"                                                                    
##  [277] "Lost Highway (1997)"                                                              
##  [278] "Crash (1996)"                                                                     
##  [279] "Cop Land (1997)"                                                                  
##  [280] "Conspiracy Theory (1997)"                                                         
##  [281] "Desperate Measures (1998)"                                                        
##  [282] "187 (1997)"                                                                       
##  [283] "Kiss the Girls (1997)"                                                            
##  [284] "U Turn (1997)"                                                                    
##  [285] "How to Be a Player (1997)"                                                        
##  [286] "Playing God (1997)"                                                               
##  [287] "House of Yes, The (1997)"                                                         
##  [288] "Mad City (1997)"                                                                  
##  [289] "Boogie Nights (1997)"                                                             
##  [290] "Critical Care (1997)"                                                             
##  [291] "Man Who Knew Too Little, The (1997)"                                              
##  [292] "Alien: Resurrection (1997)"                                                       
##  [293] "Apostle, The (1997)"                                                              
##  [294] "Deconstructing Harry (1997)"                                                      
##  [295] "Jackie Brown (1997)"                                                              
##  [296] "Wag the Dog (1997)"                                                               
##  [297] "Hard Rain (1998)"                                                                 
##  [298] "Fallen (1998)"                                                                    
##  [299] "Prophecy II, The (1998)"                                                          
##  [300] "Spice World (1997)"                                                               
##  [301] "Deep Rising (1998)"                                                               
##  [302] "Wedding Singer, The (1998)"                                                       
##  [303] "Sphere (1998)"                                                                    
##  [304] "Client, The (1994)"                                                               
##  [305] "One Flew Over the Cuckoo's Nest (1975)"                                           
##  [306] "Spawn (1997)"                                                                     
##  [307] "Assignment, The (1997)"                                                           
##  [308] "Wonderland (1997)"                                                                
##  [309] "Incognito (1997)"                                                                 
##  [310] "Blues Brothers 2000 (1998)"                                                       
##  [311] "Sudden Death (1995)"                                                              
##  [312] "Ace Ventura: When Nature Calls (1995)"                                            
##  [313] "Powder (1995)"                                                                    
##  [314] "Dangerous Minds (1995)"                                                           
##  [315] "Clueless (1995)"                                                                  
##  [316] "Bio-Dome (1996)"                                                                  
##  [317] "Black Sheep (1996)"                                                               
##  [318] "Mary Reilly (1996)"                                                               
##  [319] "Bridges of Madison County, The (1995)"                                            
##  [320] "Jeffrey (1995)"                                                                   
##  [321] "Judge Dredd (1995)"                                                               
##  [322] "Mighty Morphin Power Rangers: The Movie (1995)"                                   
##  [323] "Showgirls (1995)"                                                                 
##  [324] "Houseguest (1994)"                                                                
##  [325] "Heavyweights (1994)"                                                              
##  [326] "Miracle on 34th Street (1994)"                                                    
##  [327] "Tales From the Crypt Presents: Demon Knight (1995)"                               
##  [328] "Star Trek: Generations (1994)"                                                    
##  [329] "Muriel's Wedding (1994)"                                                          
##  [330] "Adventures of Priscilla, Queen of the Desert, The (1994)"                         
##  [331] "Flintstones, The (1994)"                                                          
##  [332] "Naked Gun 33 1/3: The Final Insult (1994)"                                        
##  [333] "True Lies (1994)"                                                                 
##  [334] "Addams Family Values (1993)"                                                      
##  [335] "Age of Innocence, The (1993)"                                                     
##  [336] "Beverly Hills Cop III (1994)"                                                     
##  [337] "Black Beauty (1994)"                                                              
##  [338] "Fear of a Black Hat (1993)"                                                       
##  [339] "Last Action Hero (1993)"                                                          
##  [340] "Man Without a Face, The (1993)"                                                   
##  [341] "Mrs. Doubtfire (1993)"                                                            
##  [342] "Radioland Murders (1994)"                                                         
##  [343] "Robin Hood: Men in Tights (1993)"                                                 
##  [344] "Serial Mom (1994)"                                                                
##  [345] "Striking Distance (1993)"                                                         
##  [346] "Super Mario Bros. (1993)"                                                         
##  [347] "Three Musketeers, The (1993)"                                                     
##  [348] "Little Rascals, The (1994)"                                                       
##  [349] "Brady Bunch Movie, The (1995)"                                                    
##  [350] "Ghost (1990)"                                                                     
##  [351] "Batman (1989)"                                                                    
##  [352] "Pinocchio (1940)"                                                                 
##  [353] "Mission: Impossible (1996)"                                                       
##  [354] "Thinner (1996)"                                                                   
##  [355] "Spy Hard (1996)"                                                                  
##  [356] "Close Shave, A (1995)"                                                            
##  [357] "Jack (1996)"                                                                      
##  [358] "Kingpin (1996)"                                                                   
##  [359] "Nutty Professor, The (1996)"                                                      
##  [360] "Very Brady Sequel, A (1996)"                                                      
##  [361] "Tales from the Crypt Presents: Bordello of Blood (1996)"                          
##  [362] "My Favorite Year (1982)"                                                          
##  [363] "Apple Dumpling Gang, The (1975)"                                                  
##  [364] "Old Yeller (1957)"                                                                
##  [365] "Parent Trap, The (1961)"                                                          
##  [366] "Cinderella (1950)"                                                                
##  [367] "Mary Poppins (1964)"                                                              
##  [368] "Alice in Wonderland (1951)"                                                       
##  [369] "William Shakespeare's Romeo and Juliet (1996)"                                    
##  [370] "Aladdin and the King of Thieves (1996)"                                           
##  [371] "Children of the Corn: The Gathering (1996)"                                       
##  [372] "Bob Roberts (1992)"                                                               
##  [373] "Transformers: The Movie, The (1986)"                                              
##  [374] "To Kill a Mockingbird (1962)"                                                     
##  [375] "Harold and Maude (1971)"                                                          
##  [376] "Day the Earth Stood Still, The (1951)"                                            
##  [377] "Duck Soup (1933)"                                                                 
##  [378] "Highlander (1986)"                                                                
##  [379] "Fantasia (1940)"                                                                  
##  [380] "Heathers (1989)"                                                                  
##  [381] "Forbidden Planet (1956)"                                                          
##  [382] "Butch Cassidy and the Sundance Kid (1969)"                                        
##  [383] "American Werewolf in London, An (1981)"                                           
##  [384] "Amityville 1992: It's About Time (1992)"                                          
##  [385] "Amityville 3-D (1983)"                                                            
##  [386] "Amityville: A New Generation (1993)"                                              
##  [387] "Amityville II: The Possession (1982)"                                             
##  [388] "Amityville Horror, The (1979)"                                                    
##  [389] "Amityville Curse, The (1990)"                                                     
##  [390] "Birds, The (1963)"                                                                
##  [391] "Blob, The (1958)"                                                                 
##  [392] "Body Snatcher, The (1945)"                                                        
##  [393] "Burnt Offerings (1976)"                                                           
##  [394] "Carrie (1976)"                                                                    
##  [395] "Omen, The (1976)"                                                                 
##  [396] "Star Trek: The Motion Picture (1979)"                                             
##  [397] "Star Trek V: The Final Frontier (1989)"                                           
##  [398] "Grease (1978)"                                                                    
##  [399] "Jaws 2 (1978)"                                                                    
##  [400] "Jaws 3-D (1983)"                                                                  
##  [401] "Bastard Out of Carolina (1996)"                                                   
##  [402] "Jackie Chan's First Strike (1996)"                                                
##  [403] "Beverly Hills Ninja (1997)"                                                       
##  [404] "Free Willy 3: The Rescue (1997)"                                                  
##  [405] "Nixon (1995)"                                                                     
##  [406] "Cry, the Beloved Country (1995)"                                                  
##  [407] "Crossing Guard, The (1995)"                                                       
##  [408] "Smoke (1995)"                                                                     
##  [409] "Like Water For Chocolate (Como agua para chocolate) (1992)"                       
##  [410] "Secret of Roan Inish, The (1994)"                                                 
##  [411] "Vanya on 42nd Street (1994)"                                                      
##  [412] "Jungle Book, The (1994)"                                                          
##  [413] "Red Rock West (1992)"                                                             
##  [414] "Bronx Tale, A (1993)"                                                             
##  [415] "Rudy (1993)"                                                                      
##  [416] "Short Cuts (1993)"                                                                
##  [417] "Tombstone (1993)"                                                                 
##  [418] "Courage Under Fire (1996)"                                                        
##  [419] "Dragonheart (1996)"                                                               
##  [420] "James and the Giant Peach (1996)"                                                 
##  [421] "Dr. Strangelove or: How I Learned to Stop Worrying and Love the Bomb (1963)"      
##  [422] "Trainspotting (1996)"                                                             
##  [423] "First Wives Club, The (1996)"                                                     
##  [424] "Matilda (1996)"                                                                   
##  [425] "Philadelphia Story, The (1940)"                                                   
##  [426] "Vertigo (1958)"                                                                   
##  [427] "North by Northwest (1959)"                                                        
##  [428] "Apartment, The (1960)"                                                            
##  [429] "Some Like It Hot (1959)"                                                          
##  [430] "Maltese Falcon, The (1941)"                                                       
##  [431] "My Fair Lady (1964)"                                                              
##  [432] "Sabrina (1954)"                                                                   
##  [433] "Roman Holiday (1953)"                                                             
##  [434] "Sunset Blvd. (1950)"                                                              
##  [435] "Notorious (1946)"                                                                 
##  [436] "To Catch a Thief (1955)"                                                          
##  [437] "Adventures of Robin Hood, The (1938)"                                             
##  [438] "East of Eden (1955)"                                                              
##  [439] "Thin Man, The (1934)"                                                             
##  [440] "His Girl Friday (1940)"                                                           
##  [441] "Around the World in 80 Days (1956)"                                               
##  [442] "It's a Wonderful Life (1946)"                                                     
##  [443] "Bringing Up Baby (1938)"                                                          
##  [444] "African Queen, The (1951)"                                                        
##  [445] "Cat on a Hot Tin Roof (1958)"                                                     
##  [446] "Dumbo (1941)"                                                                     
##  [447] "Bananas (1971)"                                                                   
##  [448] "Candidate, The (1972)"                                                            
##  [449] "Bonnie and Clyde (1967)"                                                          
##  [450] "Dial M for Murder (1954)"                                                         
##  [451] "Rebel Without a Cause (1955)"                                                     
##  [452] "Streetcar Named Desire, A (1951)"                                                 
##  [453] "People vs. Larry Flynt, The (1996)"                                               
##  [454] "My Left Foot (1989)"                                                              
##  [455] "Magnificent Seven, The (1954)"                                                    
##  [456] "Lawrence of Arabia (1962)"                                                        
##  [457] "Third Man, The (1949)"                                                            
##  [458] "Annie Hall (1977)"                                                                
##  [459] "Local Hero (1983)"                                                                
##  [460] "Manhattan (1979)"                                                                 
##  [461] "Miller's Crossing (1990)"                                                         
##  [462] "Treasure of the Sierra Madre, The (1948)"                                         
##  [463] "Great Escape, The (1963)"                                                         
##  [464] "Deer Hunter, The (1978)"                                                          
##  [465] "Down by Law (1986)"                                                               
##  [466] "Cool Hand Luke (1967)"                                                            
##  [467] "Great Dictator, The (1940)"                                                       
##  [468] "Big Sleep, The (1946)"                                                            
##  [469] "Ben-Hur (1959)"                                                                   
##  [470] "Gandhi (1982)"                                                                    
##  [471] "Killing Fields, The (1984)"                                                       
##  [472] "My Life as a Dog (Mitt liv som hund) (1985)"                                      
##  [473] "Man Who Would Be King, The (1975)"                                                
##  [474] "Shine (1996)"                                                                     
##  [475] "Kama Sutra: A Tale of Love (1996)"                                                
##  [476] "Daytrippers, The (1996)"                                                          
##  [477] "Addicted to Love (1997)"                                                          
##  [478] "Ponette (1996)"                                                                   
##  [479] "My Own Private Idaho (1991)"                                                      
##  [480] "Anastasia (1997)"                                                                 
##  [481] "Mouse Hunt (1997)"                                                                
##  [482] "Money Train (1995)"                                                               
##  [483] "Mortal Kombat (1995)"                                                             
##  [484] "Pocahontas (1995)"                                                                
##  [485] "Miserables, Les (1995)"                                                           
##  [486] "Things to Do in Denver when You're Dead (1995)"                                   
##  [487] "Vampire in Brooklyn (1995)"                                                       
##  [488] "Broken Arrow (1996)"                                                              
##  [489] "Young Poisoner's Handbook, The (1995)"                                            
##  [490] "NeverEnding Story III, The (1994)"                                                
##  [491] "Rob Roy (1995)"                                                                   
##  [492] "Die Hard: With a Vengeance (1995)"                                                
##  [493] "Lord of Illusions (1995)"                                                         
##  [494] "Species (1995)"                                                                   
##  [495] "Walk in the Clouds, A (1995)"                                                     
##  [496] "Waterworld (1995)"                                                                
##  [497] "White Man's Burden (1995)"                                                        
##  [498] "Wild Bill (1995)"                                                                 
##  [499] "Farinelli: il castrato (1994)"                                                    
##  [500] "Heavenly Creatures (1994)"                                                        
##  [501] "Interview with the Vampire (1994)"                                                
##  [502] "Kid in King Arthur's Court, A (1995)"                                             
##  [503] "Mary Shelley's Frankenstein (1994)"                                               
##  [504] "Quick and the Dead, The (1995)"                                                   
##  [505] "Stephen King's The Langoliers (1995)"                                             
##  [506] "Tales from the Hood (1995)"                                                       
##  [507] "Village of the Damned (1995)"                                                     
##  [508] "Clear and Present Danger (1994)"                                                  
##  [509] "Wes Craven's New Nightmare (1994)"                                                
##  [510] "Speed (1994)"                                                                     
##  [511] "Wolf (1994)"                                                                      
##  [512] "Wyatt Earp (1994)"                                                                
##  [513] "Another Stakeout (1993)"                                                          
##  [514] "Blown Away (1994)"                                                                
##  [515] "Body Snatchers (1993)"                                                            
##  [516] "Boxing Helena (1993)"                                                             
##  [517] "City Slickers II: The Legend of Curly's Gold (1994)"                              
##  [518] "Cliffhanger (1993)"                                                               
##  [519] "Coneheads (1993)"                                                                 
##  [520] "Demolition Man (1993)"                                                            
##  [521] "Fatal Instinct (1993)"                                                            
##  [522] "Englishman Who Went Up a Hill, But Came Down a Mountain, The (1995)"              
##  [523] "Kalifornia (1993)"                                                                
##  [524] "Piano, The (1993)"                                                                
##  [525] "Romeo Is Bleeding (1993)"                                                         
##  [526] "Secret Garden, The (1993)"                                                        
##  [527] "Son in Law (1993)"                                                                
##  [528] "Terminal Velocity (1994)"                                                         
##  [529] "Hour of the Pig, The (1993)"                                                      
##  [530] "Beauty and the Beast (1991)"                                                      
##  [531] "Wild Bunch, The (1969)"                                                           
##  [532] "Hellraiser: Bloodline (1996)"                                                     
##  [533] "True Crime (1995)"                                                                
##  [534] "Stalingrad (1993)"                                                                
##  [535] "Heavy (1995)"                                                                     
##  [536] "Fan, The (1996)"                                                                  
##  [537] "Hunchback of Notre Dame, The (1996)"                                              
##  [538] "Eraser (1996)"                                                                    
##  [539] "Big Squeeze, The (1996)"                                                          
##  [540] "Police Story 4: Project S (Chao ji ji hua) (1993)"                                
##  [541] "Daniel Defoe's Robinson Crusoe (1996)"                                            
##  [542] "For Whom the Bell Tolls (1943)"                                                   
##  [543] "American in Paris, An (1951)"                                                     
##  [544] "Rear Window (1954)"                                                               
##  [545] "It Happened One Night (1934)"                                                     
##  [546] "Meet Me in St. Louis (1944)"                                                      
##  [547] "All About Eve (1950)"                                                             
##  [548] "Rebecca (1940)"                                                                   
##  [549] "Spellbound (1945)"                                                                
##  [550] "Father of the Bride (1950)"                                                       
##  [551] "Gigi (1958)"                                                                      
##  [552] "Laura (1944)"                                                                     
##  [553] "Lost Horizon (1937)"                                                              
##  [554] "My Man Godfrey (1936)"                                                            
##  [555] "Giant (1956)"                                                                     
##  [556] "39 Steps, The (1935)"                                                             
##  [557] "Night of the Living Dead (1968)"                                                  
##  [558] "Blue Angel, The (Blaue Engel, Der) (1930)"                                        
##  [559] "Picnic (1955)"                                                                    
##  [560] "Extreme Measures (1996)"                                                          
##  [561] "Chamber, The (1996)"                                                              
##  [562] "Davy Crockett, King of the Wild Frontier (1955)"                                  
##  [563] "Swiss Family Robinson (1960)"                                                     
##  [564] "Angels in the Outfield (1994)"                                                    
##  [565] "Three Caballeros, The (1945)"                                                     
##  [566] "Sword in the Stone, The (1963)"                                                   
##  [567] "So Dear to My Heart (1949)"                                                       
##  [568] "Robin Hood: Prince of Thieves (1991)"                                             
##  [569] "Sleepers (1996)"                                                                  
##  [570] "Victor/Victoria (1982)"                                                           
##  [571] "Great Race, The (1965)"                                                           
##  [572] "Crying Game, The (1992)"                                                          
##  [573] "Sophie's Choice (1982)"                                                           
##  [574] "Christmas Carol, A (1938)"                                                        
##  [575] "Microcosmos: Le peuple de l'herbe (1996)"                                         
##  [576] "Fog, The (1980)"                                                                  
##  [577] "Escape from New York (1981)"                                                      
##  [578] "Howling, The (1981)"                                                              
##  [579] "Return of Martin Guerre, The (Retour de Martin Guerre, Le) (1982)"                
##  [580] "Tin Drum, The (Blechtrommel, Die) (1979)"                                         
##  [581] "Cook the Thief His Wife & Her Lover, The (1989)"                                  
##  [582] "Paths of Glory (1957)"                                                            
##  [583] "Grifters, The (1990)"                                                             
##  [584] "The Innocent (1994)"                                                              
##  [585] "Thin Blue Line, The (1988)"                                                       
##  [586] "Paris Is Burning (1990)"                                                          
##  [587] "Once Upon a Time in the West (1969)"                                              
##  [588] "Ran (1985)"                                                                       
##  [589] "Quiet Man, The (1952)"                                                            
##  [590] "Once Upon a Time in America (1984)"                                               
##  [591] "Seventh Seal, The (Sjunde inseglet, Det) (1957)"                                  
##  [592] "Rosencrantz and Guildenstern Are Dead (1990)"                                     
##  [593] "Touch of Evil (1958)"                                                             
##  [594] "Chinatown (1974)"                                                                 
##  [595] "M (1931)"                                                                         
##  [596] "Pump Up the Volume (1990)"                                                        
##  [597] "Arsenic and Old Lace (1944)"                                                      
##  [598] "Fried Green Tomatoes (1991)"                                                      
##  [599] "High Noon (1952)"                                                                 
##  [600] "Somewhere in Time (1980)"                                                         
##  [601] "Being There (1979)"                                                               
##  [602] "Paris, Texas (1984)"                                                              
##  [603] "Alien 3 (1992)"                                                                   
##  [604] "Blood For Dracula (Andy Warhol's Dracula) (1974)"                                 
##  [605] "Audrey Rose (1977)"                                                               
##  [606] "Blood Beach (1981)"                                                               
##  [607] "Body Parts (1991)"                                                                
##  [608] "Bride of Frankenstein (1935)"                                                     
##  [609] "Candyman (1992)"                                                                  
##  [610] "Cape Fear (1962)"                                                                 
##  [611] "Cat People (1982)"                                                                
##  [612] "Nosferatu (Nosferatu, eine Symphonie des Grauens) (1922)"                         
##  [613] "Crucible, The (1996)"                                                             
##  [614] "Fire on the Mountain (1996)"                                                      
##  [615] "Volcano (1997)"                                                                   
##  [616] "Conan the Barbarian (1981)"                                                       
##  [617] "Wishmaster (1997)"                                                                
##  [618] "I Know What You Did Last Summer (1997)"                                           
##  [619] "Rocket Man (1997)"                                                                
##  [620] "In the Line of Fire (1993)"                                                       
##  [621] "Executive Decision (1996)"                                                        
##  [622] "Perfect World, A (1993)"                                                          
##  [623] "McHale's Navy (1997)"                                                             
##  [624] "Leave It to Beaver (1997)"                                                        
##  [625] "Jackal, The (1997)"                                                               
##  [626] "Seven Years in Tibet (1997)"                                                      
##  [627] "Dark City (1998)"                                                                 
##  [628] "American President, The (1995)"                                                   
##  [629] "Casino (1995)"                                                                    
##  [630] "Persuasion (1995)"                                                                
##  [631] "Kicking and Screaming (1995)"                                                     
##  [632] "City Hall (1996)"                                                                 
##  [633] "Basketball Diaries, The (1995)"                                                   
##  [634] "Browning Version, The (1994)"                                                     
##  [635] "Little Women (1994)"                                                              
##  [636] "Miami Rhapsody (1995)"                                                            
##  [637] "Wonderful, Horrible Life of Leni Riefenstahl, The (1993)"                         
##  [638] "Barcelona (1994)"                                                                 
##  [639] "Widows' Peak (1994)"                                                              
##  [640] "House of the Spirits, The (1993)"                                                 
##  [641] "Bad Moon (1996)"                                                                  
##  [642] "Enchanted April (1991)"                                                           
##  [643] "Sex, Lies, and Videotape (1989)"                                                  
##  [644] "Strictly Ballroom (1992)"                                                         
##  [645] "Better Off Dead... (1985)"                                                        
##  [646] "Substance of Fire, The (1996)"                                                    
##  [647] "Tin Men (1987)"                                                                   
##  [648] "Othello (1995)"                                                                   
##  [649] "Carrington (1995)"                                                                
##  [650] "To Die For (1995)"                                                                
##  [651] "Home for the Holidays (1995)"                                                     
##  [652] "Juror, The (1996)"                                                                
##  [653] "In the Bleak Midwinter (1995)"                                                    
##  [654] "Canadian Bacon (1994)"                                                            
##  [655] "First Knight (1995)"                                                              
##  [656] "Mallrats (1995)"                                                                  
##  [657] "Nine Months (1995)"                                                               
##  [658] "Boys on the Side (1995)"                                                          
##  [659] "Circle of Friends (1995)"                                                         
##  [660] "Exit to Eden (1994)"                                                              
##  [661] "Fluke (1995)"                                                                     
##  [662] "Immortal Beloved (1994)"                                                          
##  [663] "Junior (1994)"                                                                    
##  [664] "Nell (1994)"                                                                      
##  [665] "Queen Margot (Reine Margot, La) (1994)"                                           
##  [666] "Corrina, Corrina (1994)"                                                          
##  [667] "Dave (1993)"                                                                      
##  [668] "Go Fish (1994)"                                                                   
##  [669] "Made in America (1993)"                                                           
##  [670] "Philadelphia (1993)"                                                              
##  [671] "Shadowlands (1993)"                                                               
##  [672] "Sirens (1994)"                                                                    
##  [673] "Threesome (1994)"                                                                 
##  [674] "Pretty Woman (1990)"                                                              
##  [675] "Jane Eyre (1996)"                                                                 
##  [676] "Last Supper, The (1995)"                                                          
##  [677] "Ransom (1996)"                                                                    
##  [678] "Crow: City of Angels, The (1996)"                                                 
##  [679] "Michael Collins (1996)"                                                           
##  [680] "Ruling Class, The (1972)"                                                         
##  [681] "Real Genius (1985)"                                                               
##  [682] "Benny & Joon (1993)"                                                              
##  [683] "Saint, The (1997)"                                                                
##  [684] "MatchMaker, The (1997)"                                                           
##  [685] "Amistad (1997)"                                                                   
##  [686] "Tomorrow Never Dies (1997)"                                                       
##  [687] "Replacement Killers, The (1998)"                                                  
##  [688] "Burnt By the Sun (1994)"                                                          
##  [689] "Red Corner (1997)"                                                                
##  [690] "Jumanji (1995)"                                                                   
##  [691] "Father of the Bride Part II (1995)"                                               
##  [692] "Across the Sea of Time (1995)"                                                    
##  [693] "Lawnmower Man 2: Beyond Cyberspace (1996)"                                        
##  [694] "Fair Game (1995)"                                                                 
##  [695] "Screamers (1995)"                                                                 
##  [696] "Nick of Time (1995)"                                                              
##  [697] "Beautiful Girls (1996)"                                                           
##  [698] "Happy Gilmore (1996)"                                                             
##  [699] "If Lucy Fell (1996)"                                                              
##  [700] "Boomerang (1992)"                                                                 
##  [701] "Man of the Year (1995)"                                                           
##  [702] "Addiction, The (1995)"                                                            
##  [703] "Casper (1995)"                                                                    
##  [704] "Congo (1995)"                                                                     
##  [705] "Devil in a Blue Dress (1995)"                                                     
##  [706] "Johnny Mnemonic (1995)"                                                           
##  [707] "Kids (1995)"                                                                      
##  [708] "Mute Witness (1994)"                                                              
##  [709] "Prophecy, The (1995)"                                                             
##  [710] "Something to Talk About (1995)"                                                   
##  [711] "Three Wishes (1995)"                                                              
##  [712] "Castle Freak (1995)"                                                              
##  [713] "Don Juan DeMarco (1995)"                                                          
##  [714] "Drop Zone (1994)"                                                                 
##  [715] "Dumb & Dumber (1994)"                                                             
##  [716] "French Kiss (1995)"                                                               
##  [717] "Little Odessa (1994)"                                                             
##  [718] "Milk Money (1994)"                                                                
##  [719] "Beyond Bedlam (1993)"                                                             
##  [720] "Only You (1994)"                                                                  
##  [721] "Perez Family, The (1995)"                                                         
##  [722] "Roommates (1995)"                                                                 
##  [723] "Relative Fear (1994)"                                                             
##  [724] "Swimming with Sharks (1995)"                                                      
##  [725] "Tommy Boy (1995)"                                                                 
##  [726] "Baby-Sitters Club, The (1995)"                                                    
##  [727] "Bullets Over Broadway (1994)"                                                     
##  [728] "Crooklyn (1994)"                                                                  
##  [729] "It Could Happen to You (1994)"                                                    
##  [730] "Richie Rich (1994)"                                                               
##  [731] "Speechless (1994)"                                                                
##  [732] "Timecop (1994)"                                                                   
##  [733] "Bad Company (1995)"                                                               
##  [734] "Boys Life (1995)"                                                                 
##  [735] "In the Mouth of Madness (1995)"                                                   
##  [736] "Air Up There, The (1994)"                                                         
##  [737] "Hard Target (1993)"                                                               
##  [738] "Heaven & Earth (1993)"                                                            
##  [739] "Jimmy Hollywood (1994)"                                                           
##  [740] "Manhattan Murder Mystery (1993)"                                                  
##  [741] "Menace II Society (1993)"                                                         
##  [742] "Poetic Justice (1993)"                                                            
##  [743] "Program, The (1993)"                                                              
##  [744] "Rising Sun (1993)"                                                                
##  [745] "Shadow, The (1994)"                                                               
##  [746] "Thirty-Two Short Films About Glenn Gould (1993)"                                  
##  [747] "Andre (1994)"                                                                     
##  [748] "Celluloid Closet, The (1995)"                                                     
##  [749] "Great Day in Harlem, A (1994)"                                                    
##  [750] "One Fine Day (1996)"                                                              
##  [751] "Candyman: Farewell to the Flesh (1995)"                                           
##  [752] "Frisk (1995)"                                                                     
##  [753] "Girl 6 (1996)"                                                                    
##  [754] "Eddie (1996)"                                                                     
##  [755] "Space Jam (1996)"                                                                 
##  [756] "Mrs. Winterbourne (1996)"                                                         
##  [757] "Faces (1968)"                                                                     
##  [758] "Mulholland Falls (1996)"                                                          
##  [759] "Great White Hype, The (1996)"                                                     
##  [760] "Arrival, The (1996)"                                                              
##  [761] "Phantom, The (1996)"                                                              
##  [762] "Daylight (1996)"                                                                  
##  [763] "Alaska (1996)"                                                                    
##  [764] "Fled (1996)"                                                                      
##  [765] "Power 98 (1995)"                                                                  
##  [766] "Escape from L.A. (1996)"                                                          
##  [767] "Bogus (1996)"                                                                     
##  [768] "Bulletproof (1996)"                                                               
##  [769] "Halloween: The Curse of Michael Myers (1995)"                                     
##  [770] "Gay Divorcee, The (1934)"                                                         
##  [771] "Ninotchka (1939)"                                                                 
##  [772] "Meet John Doe (1941)"                                                             
##  [773] "In the Line of Duty 2 (1987)"                                                     
##  [774] "Loch Ness (1995)"                                                                 
##  [775] "Last Man Standing (1996)"                                                         
##  [776] "Glimmer Man, The (1996)"                                                          
##  [777] "Pollyanna (1960)"                                                                 
##  [778] "Shaggy Dog, The (1959)"                                                           
##  [779] "Freeway (1996)"                                                                   
##  [780] "That Thing You Do! (1996)"                                                        
##  [781] "To Gillian on Her 37th Birthday (1996)"                                           
##  [782] "Looking for Richard (1996)"                                                       
##  [783] "Murder, My Sweet (1944)"                                                          
##  [784] "Days of Thunder (1990)"                                                           
##  [785] "Perfect Candidate, A (1996)"                                                      
##  [786] "Two or Three Things I Know About Her (1966)"                                      
##  [787] "Bloody Child, The (1996)"                                                         
##  [788] "Braindead (1992)"                                                                 
##  [789] "Bad Taste (1987)"                                                                 
##  [790] "Night on Earth (1991)"                                                            
##  [791] "Paris Was a Woman (1995)"                                                         
##  [792] "Amityville: Dollhouse (1996)"                                                     
##  [793] "April Fool's Day (1986)"                                                          
##  [794] "Believers, The (1987)"                                                            
##  [795] "Nosferatu a Venezia (1986)"                                                       
##  [796] "Jingle All the Way (1996)"                                                        
##  [797] "Garden of Finzi-Contini, The (Giardino dei Finzi-Contini, Il) (1970)"             
##  [798] "My Fellow Americans (1996)"                                                       
##  [799] "Michael (1996)"                                                                   
##  [800] "Whole Wide World, The (1996)"                                                     
##  [801] "Hearts and Minds (1996)"                                                          
##  [802] "Fools Rush In (1997)"                                                             
##  [803] "Touch (1997)"                                                                     
##  [804] "Vegas Vacation (1997)"                                                            
##  [805] "Love Jones (1997)"                                                                
##  [806] "Picture Perfect (1997)"                                                           
##  [807] "Career Girls (1997)"                                                              
##  [808] "She's So Lovely (1997)"                                                           
##  [809] "Money Talks (1997)"                                                               
##  [810] "Excess Baggage (1997)"                                                            
##  [811] "That Darn Cat! (1997)"                                                            
##  [812] "Soul Food (1997)"                                                                 
##  [813] "Washington Square (1997)"                                                         
##  [814] "Telling Lies in America (1997)"                                                   
##  [815] "Year of the Horse (1997)"                                                         
##  [816] "Phantoms (1998)"                                                                  
##  [817] "Life Less Ordinary, A (1997)"                                                     
##  [818] "Eve's Bayou (1997)"                                                               
##  [819] "One Night Stand (1997)"                                                           
##  [820] "Tango Lesson, The (1997)"                                                         
##  [821] "Mortal Kombat: Annihilation (1997)"                                               
##  [822] "Bent (1997)"                                                                      
##  [823] "For Richer or Poorer (1997)"                                                      
##  [824] "Home Alone 3 (1997)"                                                              
##  [825] "Scream 2 (1997)"                                                                  
##  [826] "Sweet Hereafter, The (1997)"                                                      
##  [827] "Time Tracers (1995)"                                                              
##  [828] "Postman, The (1997)"                                                              
##  [829] "Winter Guest, The (1997)"                                                         
##  [830] "Kundun (1997)"                                                                    
##  [831] "Mr. Magoo (1997)"                                                                 
##  [832] "Big Lebowski, The (1998)"                                                         
##  [833] "Afterglow (1997)"                                                                 
##  [834] "Ma vie en rose (My Life in Pink) (1997)"                                          
##  [835] "Great Expectations (1998)"                                                        
##  [836] "Oscar & Lucinda (1997)"                                                           
##  [837] "Vermin (1998)"                                                                    
##  [838] "Half Baked (1998)"                                                                
##  [839] "Dangerous Beauty (1998)"                                                          
##  [840] "Nil By Mouth (1997)"                                                              
##  [841] "Twilight (1998)"                                                                  
##  [842] "U.S. Marshalls (1998)"                                                            
##  [843] "Love and Death on Long Island (1997)"                                             
##  [844] "Wild Things (1998)"                                                               
##  [845] "Primary Colors (1998)"                                                            
##  [846] "Lost in Space (1998)"                                                             
##  [847] "Mercury Rising (1998)"                                                            
##  [848] "City of Angels (1998)"                                                            
##  [849] "City of Lost Children, The (1995)"                                                
##  [850] "Two Bits (1995)"                                                                  
##  [851] "Farewell My Concubine (1993)"                                                     
##  [852] "Dead Man (1995)"                                                                  
##  [853] "Raise the Red Lantern (1991)"                                                     
##  [854] "Unforgettable (1996)"                                                             
##  [855] "Down Periscope (1996)"                                                            
##  [856] "Flower of My Secret, The (Flor de mi secreto, La) (1995)"                         
##  [857] "Craft, The (1996)"                                                                
##  [858] "Harriet the Spy (1996)"                                                           
##  [859] "Chain Reaction (1996)"                                                            
##  [860] "Island of Dr. Moreau, The (1996)"                                                 
##  [861] "First Kid (1996)"                                                                 
##  [862] "Funeral, The (1996)"                                                              
##  [863] "Preacher's Wife, The (1996)"                                                      
##  [864] "Paradise Road (1997)"                                                             
##  [865] "Brassed Off (1996)"                                                               
##  [866] "Thousand Acres, A (1997)"                                                         
##  [867] "Smile Like Yours, A (1997)"                                                       
##  [868] "Murder in the First (1995)"                                                       
##  [869] "Airheads (1994)"                                                                  
##  [870] "With Honors (1994)"                                                               
##  [871] "What's Love Got to Do with It (1993)"                                             
##  [872] "Killing Zoe (1994)"                                                               
##  [873] "Renaissance Man (1994)"                                                           
##  [874] "Charade (1963)"                                                                   
##  [875] "Fox and the Hound, The (1981)"                                                    
##  [876] "Big Blue, The (Grand bleu, Le) (1988)"                                            
##  [877] "Booty Call (1997)"                                                                
##  [878] "How to Make an American Quilt (1995)"                                             
##  [879] "Georgia (1995)"                                                                   
##  [880] "Indian in the Cupboard, The (1995)"                                               
##  [881] "Blue in the Face (1995)"                                                          
##  [882] "Unstrung Heroes (1995)"                                                           
##  [883] "Unzipped (1995)"                                                                  
##  [884] "Before Sunrise (1995)"                                                            
##  [885] "Nobody's Fool (1994)"                                                             
##  [886] "Pushing Hands (1992)"                                                             
##  [887] "To Live (Huozhe) (1994)"                                                          
##  [888] "Dazed and Confused (1993)"                                                        
##  [889] "Naked (1993)"                                                                     
##  [890] "Orlando (1993)"                                                                   
##  [891] "Ruby in Paradise (1993)"                                                          
##  [892] "Some Folks Call It a Sling Blade (1993)"                                          
##  [893] "Month by the Lake, A (1995)"                                                      
##  [894] "Funny Face (1957)"                                                                
##  [895] "Affair to Remember, An (1957)"                                                    
##  [896] "Little Lord Fauntleroy (1936)"                                                    
##  [897] "Inspector General, The (1949)"                                                    
##  [898] "Winnie the Pooh and the Blustery Day (1968)"                                      
##  [899] "Hear My Song (1991)"                                                              
##  [900] "Mediterraneo (1991)"                                                              
##  [901] "Passion Fish (1992)"                                                              
##  [902] "Grateful Dead (1995)"                                                             
##  [903] "Eye for an Eye (1996)"                                                            
##  [904] "Fear (1996)"                                                                      
##  [905] "Solo (1996)"                                                                      
##  [906] "Substitute, The (1996)"                                                           
##  [907] "Heaven's Prisoners (1996)"                                                        
##  [908] "Trigger Effect, The (1996)"                                                       
##  [909] "Mother Night (1996)"                                                              
##  [910] "Dangerous Ground (1997)"                                                          
##  [911] "Maximum Risk (1996)"                                                              
##  [912] "Rich Man's Wife, The (1996)"                                                      
##  [913] "Shadow Conspiracy (1997)"                                                         
##  [914] "Blood & Wine (1997)"                                                              
##  [915] "Turbulence (1997)"                                                                
##  [916] "Underworld (1997)"                                                                
##  [917] "Beautician and the Beast, The (1997)"                                             
##  [918] "Cats Don't Dance (1997)"                                                          
##  [919] "Anna Karenina (1997)"                                                             
##  [920] "Keys to Tulsa (1997)"                                                             
##  [921] "Head Above Water (1996)"                                                          
##  [922] "Hercules (1997)"                                                                  
##  [923] "Last Time I Committed Suicide, The (1997)"                                        
##  [924] "Kiss Me, Guido (1997)"                                                            
##  [925] "Big Green, The (1995)"                                                            
##  [926] "Stuart Saves His Family (1995)"                                                   
##  [927] "Cabin Boy (1994)"                                                                 
##  [928] "Clean Slate (1994)"                                                               
##  [929] "Lightning Jack (1994)"                                                            
##  [930] "Stupids, The (1996)"                                                              
##  [931] "Pest, The (1997)"                                                                 
##  [932] "Geronimo: An American Legend (1993)"                                              
##  [933] "Double vie de Veronique, La (Double Life of Veronique, The) (1991)"               
##  [934] "Until the End of the World (Bis ans Ende der Welt) (1991)"                        
##  [935] "Waiting for Guffman (1996)"                                                       
##  [936] "I Shot Andy Warhol (1996)"                                                        
##  [937] "Stealing Beauty (1996)"                                                           
##  [938] "Basquiat (1996)"                                                                  
##  [939] "Private Parts (1997)"                                                             
##  [940] "Anaconda (1997)"                                                                  
##  [941] "Romy and Michele's High School Reunion (1997)"                                    
##  [942] "Shiloh (1997)"                                                                    
##  [943] "Con Air (1997)"                                                                   
##  [944] "Trees Lounge (1996)"                                                              
##  [945] "Tie Me Up! Tie Me Down! (1990)"                                                   
##  [946] "Die xue shuang xiong (Killer, The) (1989)"                                        
##  [947] "Gaslight (1944)"                                                                  
##  [948] "8 1/2 (1963)"                                                                     
##  [949] "Fast, Cheap & Out of Control (1997)"                                              
##  [950] "Fathers' Day (1997)"                                                              
##  [951] "Mrs. Dalloway (1997)"                                                             
##  [952] "Fire Down Below (1997)"                                                           
##  [953] "Lay of the Land, The (1997)"                                                      
##  [954] "Shooter, The (1995)"                                                              
##  [955] "Grumpier Old Men (1995)"                                                          
##  [956] "Jury Duty (1995)"                                                                 
##  [957] "Beverly Hillbillies, The (1993)"                                                  
##  [958] "Lassie (1994)"                                                                    
##  [959] "Little Big League (1994)"                                                         
##  [960] "Homeward Bound II: Lost in San Francisco (1996)"                                  
##  [961] "Quest, The (1996)"                                                                
##  [962] "Cool Runnings (1993)"                                                             
##  [963] "Drop Dead Fred (1991)"                                                            
##  [964] "Grease 2 (1982)"                                                                  
##  [965] "Switchback (1997)"                                                                
##  [966] "Hamlet (1996)"                                                                    
##  [967] "Two if by Sea (1996)"                                                             
##  [968] "Forget Paris (1995)"                                                              
##  [969] "Just Cause (1995)"                                                                
##  [970] "Rent-a-Kid (1995)"                                                                
##  [971] "Paper, The (1994)"                                                                
##  [972] "Fearless (1993)"                                                                  
##  [973] "Malice (1993)"                                                                    
##  [974] "Multiplicity (1996)"                                                              
##  [975] "She's the One (1996)"                                                             
##  [976] "House Arrest (1996)"                                                              
##  [977] "Ghost and Mrs. Muir, The (1947)"                                                  
##  [978] "Associate, The (1996)"                                                            
##  [979] "Dracula: Dead and Loving It (1995)"                                               
##  [980] "Now and Then (1995)"                                                              
##  [981] "Mr. Wrong (1996)"                                                                 
##  [982] "Simple Twist of Fate, A (1994)"                                                   
##  [983] "Cronos (1992)"                                                                    
##  [984] "Pallbearer, The (1996)"                                                           
##  [985] "War, The (1994)"                                                                  
##  [986] "Don't Be a Menace to South Central While Drinking Your Juice in the Hood (1996)"  
##  [987] "Adventures of Pinocchio, The (1996)"                                              
##  [988] "Evening Star, The (1996)"                                                         
##  [989] "Four Days in September (1997)"                                                    
##  [990] "Little Princess, A (1995)"                                                        
##  [991] "Crossfire (1947)"                                                                 
##  [992] "Koyaanisqatsi (1983)"                                                             
##  [993] "Balto (1995)"                                                                     
##  [994] "Bottle Rocket (1996)"                                                             
##  [995] "Star Maker, The (Uomo delle stelle, L') (1995)"                                   
##  [996] "Amateur (1994)"                                                                   
##  [997] "Living in Oblivion (1995)"                                                        
##  [998] "Party Girl (1995)"                                                                
##  [999] "Pyromaniac's Love Story, A (1995)"                                                
## [1000] "Shallow Grave (1994)"                                                             
## [1001] "Reality Bites (1994)"                                                             
## [1002] "Man of No Importance, A (1994)"                                                   
## [1003] "Pagemaster, The (1994)"                                                           
## [1004] "Love and a .45 (1994)"                                                            
## [1005] "Oliver & Company (1988)"                                                          
## [1006] "Joe's Apartment (1996)"                                                           
## [1007] "Celestial Clockwork (1994)"                                                       
## [1008] "Curdled (1996)"                                                                   
## [1009] "Female Perversions (1996)"                                                        
## [1010] "Albino Alligator (1996)"                                                          
## [1011] "Anne Frank Remembered (1995)"                                                     
## [1012] "Carried Away (1996)"                                                              
## [1013] "It's My Party (1995)"                                                             
## [1014] "Bloodsport 2 (1995)"                                                              
## [1015] "Double Team (1997)"                                                               
## [1016] "Speed 2: Cruise Control (1997)"                                                   
## [1017] "Sliver (1993)"                                                                    
## [1018] "Pete's Dragon (1977)"                                                             
## [1019] "Dear God (1996)"                                                                  
## [1020] "Live Nude Girls (1995)"                                                           
## [1021] "Thin Line Between Love and Hate, A (1996)"                                        
## [1022] "High School High (1996)"                                                          
## [1023] "Commandments (1997)"                                                              
## [1024] "Hate (Haine, La) (1995)"                                                          
## [1025] "Flirting With Disaster (1996)"                                                    
## [1026] "Red Firecracker, Green Firecracker (1994)"                                        
## [1027] "What Happened Was... (1994)"                                                      
## [1028] "Six Degrees of Separation (1993)"                                                 
## [1029] "Two Much (1996)"                                                                  
## [1030] "Trust (1990)"                                                                     
## [1031] "C'est arrive pres de chez vous (1992)"                                            
## [1032] "Firestorm (1998)"                                                                 
## [1033] "Newton Boys, The (1998)"                                                          
## [1034] "Beyond Rangoon (1995)"                                                            
## [1035] "Feast of July (1995)"                                                             
## [1036] "Death and the Maiden (1994)"                                                      
## [1037] "Tank Girl (1995)"                                                                 
## [1038] "Double Happiness (1994)"                                                          
## [1039] "Cobb (1994)"                                                                      
## [1040] "Mrs. Parker and the Vicious Circle (1994)"                                        
## [1041] "Faithful (1996)"                                                                  
## [1042] "Twelfth Night (1996)"                                                             
## [1043] "Mark of Zorro, The (1940)"                                                        
## [1044] "Surviving Picasso (1996)"                                                         
## [1045] "Up in Smoke (1978)"                                                               
## [1046] "Some Kind of Wonderful (1987)"                                                    
## [1047] "I'm Not Rappaport (1996)"                                                         
## [1048] "Umbrellas of Cherbourg, The (Parapluies de Cherbourg, Les) (1964)"                
## [1049] "They Made Me a Criminal (1939)"                                                   
## [1050] "Last Time I Saw Paris, The (1954)"                                                
## [1051] "Farewell to Arms, A (1932)"                                                       
## [1052] "Innocents, The (1961)"                                                            
## [1053] "Old Man and the Sea, The (1958)"                                                  
## [1054] "Truman Show, The (1998)"                                                          
## [1055] "Heidi Fleiss: Hollywood Madam (1995) "                                            
## [1056] "Chungking Express (1994)"                                                         
## [1057] "Jupiter's Wife (1994)"                                                            
## [1058] "Safe (1995)"                                                                      
## [1059] "Feeling Minnesota (1996)"                                                         
## [1060] "Escape to Witch Mountain (1975)"                                                  
## [1061] "Get on the Bus (1996)"                                                            
## [1062] "Doors, The (1991)"                                                                
## [1063] "Ghosts of Mississippi (1996)"                                                     
## [1064] "Beautiful Thing (1996)"                                                           
## [1065] "Best Men (1997)"                                                                  
## [1066] "Hackers (1995)"                                                                   
## [1067] "Road to Wellville, The (1994)"                                                    
## [1068] "War Room, The (1993)"                                                             
## [1069] "When We Were Kings (1996)"                                                        
## [1070] "Hard Eight (1996)"                                                                
## [1071] "Quiet Room, The (1996)"                                                           
## [1072] "Blue Chips (1994)"                                                                
## [1073] "Calendar Girl (1993)"                                                             
## [1074] "My Family (1995)"                                                                 
## [1075] "Tom & Viv (1994)"                                                                 
## [1076] "Walkabout (1971)"                                                                 
## [1077] "Last Dance (1996)"                                                                
## [1078] "Original Gangstas (1996)"                                                         
## [1079] "In Love and War (1996)"                                                           
## [1080] "Backbeat (1993)"                                                                  
## [1081] "Alphaville (1965)"                                                                
## [1082] "Rendezvous in Paris (Rendez-vous de Paris, Les) (1995)"                           
## [1083] "Cyclo (1995)"                                                                     
## [1084] "Relic, The (1997)"                                                                
## [1085] "Fille seule, La (A Single Girl) (1995)"                                           
## [1086] "Stalker (1979)"                                                                   
## [1087] "Love! Valour! Compassion! (1997)"                                                 
## [1088] "Palookaville (1996)"                                                              
## [1089] "Phat Beach (1996)"                                                                
## [1090] "Portrait of a Lady, The (1996)"                                                   
## [1091] "Zeus and Roxanne (1997)"                                                          
## [1092] "Big Bully (1996)"                                                                 
## [1093] "Love & Human Remains (1993)"                                                      
## [1094] "Sum of Us, The (1994)"                                                            
## [1095] "Little Buddha (1993)"                                                             
## [1096] "Fresh (1994)"                                                                     
## [1097] "Spanking the Monkey (1994)"                                                       
## [1098] "Wild Reeds (1994)"                                                                
## [1099] "Women, The (1939)"                                                                
## [1100] "Bliss (1997)"                                                                     
## [1101] "Caught (1996)"                                                                    
## [1102] "Hugo Pool (1997)"                                                                 
## [1103] "Welcome To Sarajevo (1997)"                                                       
## [1104] "Dunston Checks In (1996)"                                                         
## [1105] "Major Payne (1994)"                                                               
## [1106] "Man of the House (1995)"                                                          
## [1107] "I Love Trouble (1994)"                                                            
## [1108] "Low Down Dirty Shame, A (1994)"                                                   
## [1109] "Cops and Robbersons (1994)"                                                       
## [1110] "Cowboy Way, The (1994)"                                                           
## [1111] "Endless Summer 2, The (1994)"                                                     
## [1112] "In the Army Now (1994)"                                                           
## [1113] "Inkwell, The (1994)"                                                              
## [1114] "Switchblade Sisters (1975)"                                                       
## [1115] "Young Guns II (1990)"                                                             
## [1116] "Prefontaine (1997)"                                                               
## [1117] "That Old Feeling (1997)"                                                          
## [1118] "Letter From Death Row, A (1998)"                                                  
## [1119] "Boys of St. Vincent, The (1993)"                                                  
## [1120] "Before the Rain (Pred dozhdot) (1994)"                                            
## [1121] "Once Were Warriors (1994)"                                                        
## [1122] "Strawberry and Chocolate (Fresa y chocolate) (1993)"                              
## [1123] "Savage Nights (Nuits fauves, Les) (1992)"                                         
## [1124] "Family Thing, A (1996)"                                                           
## [1125] "Purple Noon (1960)"                                                               
## [1126] "Cemetery Man (Dellamorte Dellamore) (1994)"                                       
## [1127] "Kim (1950)"                                                                       
## [1128] "Marlene Dietrich: Shadow and Light (1996) "                                       
## [1129] "Maybe, Maybe Not (Bewegte Mann, Der) (1994)"                                      
## [1130] "Top Hat (1935)"                                                                   
## [1131] "To Be or Not to Be (1942)"                                                        
## [1132] "Secret Agent, The (1996)"                                                         
## [1133] "Amos & Andrew (1993)"                                                             
## [1134] "Jade (1995)"                                                                      
## [1135] "Kiss of Death (1995)"                                                             
## [1136] "Mixed Nuts (1994)"                                                                
## [1137] "Virtuosity (1995)"                                                                
## [1138] "Blue Sky (1994)"                                                                  
## [1139] "Flesh and Bone (1993)"                                                            
## [1140] "Guilty as Sin (1993)"                                                             
## [1141] "In the Realm of the Senses (Ai no corrida) (1976)"                                
## [1142] "Barb Wire (1996)"                                                                 
## [1143] "Kissed (1996)"                                                                    
## [1144] "Assassins (1995)"                                                                 
## [1145] "Friday (1995)"                                                                    
## [1146] "Goofy Movie, A (1995)"                                                            
## [1147] "Higher Learning (1995)"                                                           
## [1148] "When a Man Loves a Woman (1994)"                                                  
## [1149] "Judgment Night (1993)"                                                            
## [1150] "King of the Hill (1993)"                                                          
## [1151] "Scout, The (1994)"                                                                
## [1152] "Angus (1995)"                                                                     
## [1153] "Night Falls on Manhattan (1997)"                                                  
## [1154] "Awfully Big Adventure, An (1995)"                                                 
## [1155] "Under Siege 2: Dark Territory (1995)"                                             
## [1156] "Poison Ivy II (1995)"                                                             
## [1157] "Ready to Wear (Pret-A-Porter) (1994)"                                             
## [1158] "Marked for Death (1990)"                                                          
## [1159] "Madonna: Truth or Dare (1991)"                                                    
## [1160] "Nenette et Boni (1996)"                                                           
## [1161] "Chairman of the Board (1998)"                                                     
## [1162] "Big Bang Theory, The (1994)"                                                      
## [1163] "Other Voices, Other Rooms (1997)"                                                 
## [1164] "Twisted (1996)"                                                                   
## [1165] "Full Speed (1996)"                                                                
## [1166] "Cutthroat Island (1995)"                                                          
## [1167] "Ghost in the Shell (Kokaku kidotai) (1995)"                                       
## [1168] "Van, The (1996)"                                                                  
## [1169] "Old Lady Who Walked in the Sea, The (Vieille qui marchait dans la mer, La) (1991)"
## [1170] "Night Flier (1997)"                                                               
## [1171] "Metro (1997)"                                                                     
## [1172] "Gridlock'd (1997)"                                                                
## [1173] "Bushwhacked (1995)"                                                               
## [1174] "Bad Girls (1994)"                                                                 
## [1175] "Blink (1994)"                                                                     
## [1176] "For Love or Money (1993)"                                                         
## [1177] "Best of the Best 3: No Turning Back (1995)"                                       
## [1178] "A Chef in Love (1996)"                                                            
## [1179] "Contempt (Mepris, Le) (1963)"                                                     
## [1180] "Tie That Binds, The (1995)"                                                       
## [1181] "Gone Fishin' (1997)"                                                              
## [1182] "Broken English (1996)"                                                            
## [1183] "Designated Mourner, The (1997)"                                                   
## [1184] "Trial and Error (1997)"                                                           
## [1185] "Pie in the Sky (1995)"                                                            
## [1186] "Total Eclipse (1995)"                                                             
## [1187] "Run of the Country, The (1995)"                                                   
## [1188] "Walking and Talking (1996)"                                                       
## [1189] "Foxfire (1996)"                                                                   
## [1190] "Nothing to Lose (1994)"                                                           
## [1191] "Star Maps (1997)"                                                                 
## [1192] "Bread and Chocolate (Pane e cioccolata) (1973)"                                   
## [1193] "Clockers (1995)"                                                                  
## [1194] "Bitter Moon (1992)"                                                               
## [1195] "Love in the Afternoon (1957)"                                                     
## [1196] "Life with Mikey (1993)"                                                           
## [1197] "North (1994)"                                                                     
## [1198] "Talking About Sex (1994)"                                                         
## [1199] "Color of Night (1994)"                                                            
## [1200] "Robocop 3 (1993)"                                                                 
## [1201] "Killer (Bulletproof Heart) (1994)"                                                
## [1202] "Sunset Park (1996)"                                                               
## [1203] "Set It Off (1996)"                                                                
## [1204] "Selena (1997)"                                                                    
## [1205] "Wild America (1997)"                                                              
## [1206] "Gang Related (1997)"                                                              
## [1207] "Manny & Lo (1996)"                                                                
## [1208] "Grass Harp, The (1995)"                                                           
## [1209] "Out to Sea (1997)"                                                                
## [1210] "Before and After (1996)"                                                          
## [1211] "Princess Caraboo (1994)"                                                          
## [1212] "Shall We Dance? (1937)"                                                           
## [1213] "Ed (1996)"                                                                        
## [1214] "Denise Calls Up (1995)"                                                           
## [1215] "Jack and Sarah (1995)"                                                            
## [1216] "Country Life (1994)"                                                              
## [1217] "Celtic Pride (1996)"                                                              
## [1218] "Simple Wish, A (1997)"                                                            
## [1219] "Star Kid (1997)"                                                                  
## [1220] "Ayn Rand: A Sense of Life (1997)"                                                 
## [1221] "Kicked in the Head (1997)"                                                        
## [1222] "Indian Summer (1996)"                                                             
## [1223] "Love Affair (1994)"                                                               
## [1224] "Band Wagon, The (1953)"                                                           
## [1225] "Penny Serenade (1941)"                                                            
## [1226] "'Til There Was You (1997)"                                                        
## [1227] "Stripes (1981)"                                                                   
## [1228] "Late Bloomers (1996)"                                                             
## [1229] "Getaway, The (1994)"                                                              
## [1230] "New York Cop (1996)"                                                              
## [1231] "National Lampoon's Senior Trip (1995)"                                            
## [1232] "Delta of Venus (1994)"                                                            
## [1233] "Carmen Miranda: Bananas Is My Business (1994)"                                    
## [1234] "Babyfever (1994)"                                                                 
## [1235] "Very Natural Thing, A (1974)"                                                     
## [1236] "Walk in the Sun, A (1945)"                                                        
## [1237] "Waiting to Exhale (1995)"                                                         
## [1238] "Pompatus of Love, The (1996)"                                                     
## [1239] "Palmetto (1998)"                                                                  
## [1240] "Surviving the Game (1994)"                                                        
## [1241] "Inventing the Abbotts (1997)"                                                     
## [1242] "Horse Whisperer, The (1998)"                                                      
## [1243] "Journey of August King, The (1995)"                                               
## [1244] "Catwalk (1995)"                                                                   
## [1245] "Neon Bible, The (1995)"                                                           
## [1246] "Homage (1995)"                                                                    
## [1247] "Open Season (1996)"                                                               
## [1248] "Metisse (Cafe au Lait) (1993)"                                                    
## [1249] "Wooden Man's Bride, The (Wu Kui) (1994)"                                          
## [1250] "Loaded (1994)"                                                                    
## [1251] "August (1996)"                                                                    
## [1252] "Boys (1996)"                                                                      
## [1253] "Captives (1994)"                                                                  
## [1254] "Of Love and Shadows (1994)"                                                       
## [1255] "Low Life, The (1994)"                                                             
## [1256] "An Unforgettable Summer (1994)"                                                   
## [1257] "Last Klezmer: Leopold Kozlowski, His Life and Music, The (1995)"                  
## [1258] "My Life and Times With Antonin Artaud (En compagnie d'Antonin Artaud) (1993)"     
## [1259] "Midnight Dancers (Sibak) (1994)"                                                  
## [1260] "Somebody to Love (1994)"                                                          
## [1261] "American Buffalo (1996)"                                                          
## [1262] "Kazaam (1996)"                                                                    
## [1263] "Larger Than Life (1996)"                                                          
## [1264] "Two Deaths (1995)"                                                                
## [1265] "Stefano Quantestorie (1993)"                                                      
## [1266] "Crude Oasis, The (1995)"                                                          
## [1267] "Hedd Wyn (1992)"                                                                  
## [1268] "Convent, The (Convento, O) (1995)"                                                
## [1269] "Lotto Land (1995)"                                                                
## [1270] "Story of Xinghua, The (1993)"                                                     
## [1271] "Day the Sun Turned Cold, The (Tianguo niezi) (1994)"                              
## [1272] "Dingo (1992)"                                                                     
## [1273] "Ballad of Narayama, The (Narayama Bushiko) (1958)"                                
## [1274] "Every Other Weekend (1990)"                                                       
## [1275] "Mille bolle blu (1993)"                                                           
## [1276] "Crows and Sparrows (1949)"                                                        
## [1277] "Lover's Knot (1996)"                                                              
## [1278] "Shadow of Angels (Schatten der Engel) (1976)"                                     
## [1279] "1-900 (1994)"                                                                     
## [1280] "Venice/Venice (1992)"                                                             
## [1281] "Infinity (1996)"                                                                  
## [1282] "Ed's Next Move (1996)"                                                            
## [1283] "For the Moment (1994)"                                                            
## [1284] "The Deadly Cure (1996)"                                                           
## [1285] "Boys in Venice (1996)"                                                            
## [1286] "Sexual Life of the Belgians, The (1994)"                                          
## [1287] "Search for One-eye Jimmy, The (1996)"                                             
## [1288] "American Strays (1996)"                                                           
## [1289] "Leopard Son, The (1996)"                                                          
## [1290] "Bird of Prey (1996)"                                                              
## [1291] "Johnny 100 Pesos (1993)"                                                          
## [1292] "JLG/JLG - autoportrait de decembre (1994)"                                        
## [1293] "Faust (1994)"                                                                     
## [1294] "Mina Tannenbaum (1994)"                                                           
## [1295] "Forbidden Christ, The (Cristo proibito, Il) (1950)"                               
## [1296] "I Can't Sleep (J'ai pas sommeil) (1994)"                                          
## [1297] "Machine, The (1994)"                                                              
## [1298] "Stranger, The (1994)"                                                             
## [1299] "Good Morning (1971)"                                                              
## [1300] "Falling in Love Again (1980)"                                                     
## [1301] "Cement Garden, The (1993)"                                                        
## [1302] "Meet Wally Sparks (1997)"                                                         
## [1303] "Hotel de Love (1996)"                                                             
## [1304] "Rhyme & Reason (1997)"                                                            
## [1305] "Love and Other Catastrophes (1996)"                                               
## [1306] "Hollow Reed (1996)"                                                               
## [1307] "Losing Chase (1996)"                                                              
## [1308] "Bonheur, Le (1965)"                                                               
## [1309] "Second Jungle Book: Mowgli & Baloo, The (1997)"                                   
## [1310] "Squeeze (1996)"                                                                   
## [1311] "Roseanna's Grave (For Roseanna) (1997)"                                           
## [1312] "Tetsuo II: Body Hammer (1992)"                                                    
## [1313] "Fall (1997)"                                                                      
## [1314] "Gabbeh (1996)"                                                                    
## [1315] "Mondo (1996)"                                                                     
## [1316] "Innocent Sleep, The (1995)"                                                       
## [1317] "For Ever Mozart (1996)"                                                           
## [1318] "Locusts, The (1997)"                                                              
## [1319] "Stag (1997)"                                                                      
## [1320] "Swept from the Sea (1997)"                                                        
## [1321] "Hurricane Streets (1998)"                                                         
## [1322] "Stonewall (1995)"                                                                 
## [1323] "Of Human Bondage (1934)"                                                          
## [1324] "Anna (1996)"                                                                      
## [1325] "Stranger in the House (1997)"                                                     
## [1326] "Picture Bride (1995)"                                                             
## [1327] "M. Butterfly (1993)"                                                              
## [1328] "Ciao, Professore! (1993)"                                                         
## [1329] "Caro Diario (Dear Diary) (1994)"                                                  
## [1330] "Withnail and I (1987)"                                                            
## [1331] "Boy's Life 2 (1997)"                                                              
## [1332] "When Night Is Falling (1995)"                                                     
## [1333] "Specialist, The (1994)"                                                           
## [1334] "Gordy (1995)"                                                                     
## [1335] "Swan Princess, The (1994)"                                                        
## [1336] "Harlem (1993)"                                                                    
## [1337] "Barbarella (1968)"                                                                
## [1338] "Land Before Time III: The Time of the Great Giving (1995) (V)"                    
## [1339] "Street Fighter (1994)"                                                            
## [1340] "Coldblooded (1995)"                                                               
## [1341] "Next Karate Kid, The (1994)"                                                      
## [1342] "No Escape (1994)"                                                                 
## [1343] "Turning, The (1992)"                                                              
## [1344] "Joy Luck Club, The (1993)"                                                        
## [1345] "Highlander III: The Sorcerer (1994)"                                              
## [1346] "Gilligan's Island: The Movie (1998)"                                              
## [1347] "My Crazy Life (Mi vida loca) (1993)"                                              
## [1348] "Suture (1993)"                                                                    
## [1349] "Walking Dead, The (1995)"                                                         
## [1350] "I Like It Like That (1994)"                                                       
## [1351] "I'll Do Anything (1994)"                                                          
## [1352] "Grace of My Heart (1996)"                                                         
## [1353] "Drunks (1995)"                                                                    
## [1354] "SubUrbia (1997)"                                                                  
## [1355] "Sliding Doors (1998)"                                                             
## [1356] "Ill Gotten Gains (1997)"                                                          
## [1357] "Legal Deceit (1997)"                                                              
## [1358] "Mighty, The (1998)"                                                               
## [1359] "Men of Means (1998)"                                                              
## [1360] "Shooting Fish (1997)"                                                             
## [1361] "Steal Big, Steal Little (1995)"                                                   
## [1362] "Mr. Jones (1993)"                                                                 
## [1363] "House Party 3 (1994)"                                                             
## [1364] "Panther (1995)"                                                                   
## [1365] "Jason's Lyric (1994)"                                                             
## [1366] "Above the Rim (1994)"                                                             
## [1367] "Moonlight and Valentino (1995)"                                                   
## [1368] "Scarlet Letter, The (1995)"                                                       
## [1369] "8 Seconds (1994)"                                                                 
## [1370] "That Darn Cat! (1965)"                                                            
## [1371] "Ladybird Ladybird (1994)"                                                         
## [1372] "Bye Bye, Love (1995)"                                                             
## [1373] "Century (1993)"                                                                   
## [1374] "My Favorite Season (1993)"                                                        
## [1375] "Pather Panchali (1955)"                                                           
## [1376] "Golden Earrings (1947)"                                                           
## [1377] "Foreign Correspondent (1940)"                                                     
## [1378] "Lady of Burlesque (1943)"                                                         
## [1379] "Angel on My Shoulder (1946)"                                                      
## [1380] "Angel and the Badman (1947)"                                                      
## [1381] "Outlaw, The (1943)"                                                               
## [1382] "Beat the Devil (1954)"                                                            
## [1383] "Love Is All There Is (1996)"                                                      
## [1384] "Damsel in Distress, A (1937)"                                                     
## [1385] "Madame Butterfly (1995)"                                                          
## [1386] "Sleepover (1995)"                                                                 
## [1387] "Here Comes Cookie (1935)"                                                         
## [1388] "Thieves (Voleurs, Les) (1996)"                                                    
## [1389] "Boys, Les (1997)"                                                                 
## [1390] "Stars Fell on Henrietta, The (1995)"                                              
## [1391] "Last Summer in the Hamptons (1995)"                                               
## [1392] "Margaret's Museum (1995)"                                                         
## [1393] "Saint of Fort Washington, The (1993)"                                             
## [1394] "Cure, The (1995)"                                                                 
## [1395] "Tom and Huck (1995)"                                                              
## [1396] "Gumby: The Movie (1995)"                                                          
## [1397] "Hideaway (1995)"                                                                  
## [1398] "Visitors, The (Visiteurs, Les) (1993)"                                            
## [1399] "Little Princess, The (1939)"                                                      
## [1400] "Nina Takes a Lover (1994)"                                                        
## [1401] "Bhaji on the Beach (1993)"                                                        
## [1402] "Raw Deal (1948)"                                                                  
## [1403] "Nightwatch (1997)"                                                                
## [1404] "Dead Presidents (1995)"                                                           
## [1405] "Reckless (1995)"                                                                  
## [1406] "Herbie Rides Again (1974)"                                                        
## [1407] "S.F.W. (1994)"                                                                    
## [1408] "Gate of Heavenly Peace, The (1995)"                                               
## [1409] "Man in the Iron Mask, The (1998)"                                                 
## [1410] "Jerky Boys, The (1994)"                                                           
## [1411] "Colonel Chabert, Le (1994)"                                                       
## [1412] "Girl in the Cadillac (1995)"                                                      
## [1413] "Even Cowgirls Get the Blues (1993)"                                               
## [1414] "Germinal (1993)"                                                                  
## [1415] "Chasers (1994)"                                                                   
## [1416] "Fausto (1993)"                                                                    
## [1417] "Tough and Deadly (1995)"                                                          
## [1418] "Window to Paris (1994)"                                                           
## [1419] "Modern Affair, A (1995)"                                                          
## [1420] "Mostro, Il (1994)"                                                                
## [1421] "Flirt (1995)"                                                                     
## [1422] "Carpool (1996)"                                                                   
## [1423] "Line King: Al Hirschfeld, The (1996)"                                             
## [1424] "Farmer & Chase (1995)"                                                            
## [1425] "Grosse Fatigue (1994)"                                                            
## [1426] "Santa with Muscles (1996)"                                                        
## [1427] "Prisoner of the Mountains (Kavkazsky Plennik) (1996)"                             
## [1428] "Naked in New York (1994)"                                                         
## [1429] "Gold Diggers: The Secret of Bear Mountain (1995)"                                 
## [1430] "Bewegte Mann, Der (1994)"                                                         
## [1431] "Killer: A Journal of Murder (1995)"                                               
## [1432] "Nelly & Monsieur Arnaud (1995)"                                                   
## [1433] "Three Lives and Only One Death (1996)"                                            
## [1434] "Babysitter, The (1995)"                                                           
## [1435] "Getting Even with Dad (1994)"                                                     
## [1436] "Mad Dog Time (1996)"                                                              
## [1437] "Children of the Revolution (1996)"                                                
## [1438] "World of Apu, The (Apur Sansar) (1959)"                                           
## [1439] "Sprung (1997)"                                                                    
## [1440] "Dream With the Fishes (1997)"                                                     
## [1441] "Wings of Courage (1995)"                                                          
## [1442] "Wedding Gift, The (1994)"                                                         
## [1443] "Race the Sun (1996)"                                                              
## [1444] "Losing Isaiah (1995)"                                                             
## [1445] "New Jersey Drive (1995)"                                                          
## [1446] "Fear, The (1995)"                                                                 
## [1447] "Mr. Wonderful (1993)"                                                             
## [1448] "Trial by Jury (1994)"                                                             
## [1449] "Good Man in Africa, A (1994)"                                                     
## [1450] "Kaspar Hauser (1993)"                                                             
## [1451] "Object of My Affection, The (1998)"                                               
## [1452] "Witness (1985)"                                                                   
## [1453] "Senseless (1998)"                                                                 
## [1454] "Nowhere (1997)"                                                                   
## [1455] "Underground (1995)"                                                               
## [1456] "Jefferson in Paris (1995)"                                                        
## [1457] "Far From Home: The Adventures of Yellow Dog (1995)"                               
## [1458] "Foreign Student (1994)"                                                           
## [1459] "I Don't Want to Talk About It (De eso no se habla) (1993)"                        
## [1460] "Twin Town (1997)"                                                                 
## [1461] "Enfer, L' (1994)"                                                                 
## [1462] "Aiqing wansui (1994)"                                                             
## [1463] "Cosi (1996)"                                                                      
## [1464] "All Over Me (1997)"                                                               
## [1465] "Being Human (1993)"                                                               
## [1466] "Amazing Panda Adventure, The (1995)"                                              
## [1467] "Beans of Egypt, Maine, The (1994)"                                                
## [1468] "Scarlet Letter, The (1926)"                                                       
## [1469] "Johns (1996)"                                                                     
## [1470] "It Takes Two (1995)"                                                              
## [1471] "Frankie Starlight (1995)"                                                         
## [1472] "Shadows (Cienie) (1988)"                                                          
## [1473] "Show, The (1995)"                                                                 
## [1474] "The Courtyard (1995)"                                                             
## [1475] "Dream Man (1995)"                                                                 
## [1476] "Destiny Turns on the Radio (1995)"                                                
## [1477] "Glass Shield, The (1994)"                                                         
## [1478] "Hunted, The (1995)"                                                               
## [1479] "Underneath, The (1995)"                                                           
## [1480] "Safe Passage (1994)"                                                              
## [1481] "Secret Adventures of Tom Thumb, The (1993)"                                       
## [1482] "Condition Red (1995)"                                                             
## [1483] "Yankee Zulu (1994)"                                                               
## [1484] "Aparajito (1956)"                                                                 
## [1485] "Hostile Intentions (1994)"                                                        
## [1486] "Clean Slate (Coup de Torchon) (1981)"                                             
## [1487] "Tigrero: A Film That Was Never Made (1994)"                                       
## [1488] "Eye of Vichy, The (Oeil de Vichy, L') (1993)"                                     
## [1489] "Promise, The (Versprechen, Das) (1994)"                                           
## [1490] "To Cross the Rubicon (1991)"                                                      
## [1491] "Daens (1992)"                                                                     
## [1492] "Man from Down Under, The (1943)"                                                  
## [1493] "Careful (1992)"                                                                   
## [1494] "Vermont Is For Lovers (1992)"                                                     
## [1495] "Vie est belle, La (Life is Rosey) (1987)"                                         
## [1496] "Quartier Mozart (1992)"                                                           
## [1497] "Touki Bouki (Journey of the Hyena) (1973)"                                        
## [1498] "Wend Kuuni (God's Gift) (1982)"                                                   
## [1499] "Spirits of the Dead (Tre passi nel delirio) (1968)"                               
## [1500] "Pharaoh's Army (1995)"                                                            
## [1501] "I, Worst of All (Yo, la peor de todas) (1990)"                                    
## [1502] "Hungarian Fairy Tale, A (1987)"                                                   
## [1503] "Death in the Garden (Mort en ce jardin, La) (1956)"                               
## [1504] "Collectionneuse, La (1967)"                                                       
## [1505] "Baton Rouge (1988)"                                                               
## [1506] "Liebelei (1933)"                                                                  
## [1507] "Woman in Question, The (1950)"                                                    
## [1508] "T-Men (1947)"                                                                     
## [1509] "Invitation, The (Zaproszenie) (1986)"                                             
## [1510] "Symphonie pastorale, La (1946)"                                                   
## [1511] "American Dream (1990)"                                                            
## [1512] "Lashou shentan (1992)"                                                            
## [1513] "Terror in a Texas Town (1958)"                                                    
## [1514] "Salut cousin! (1996)"                                                             
## [1515] "Schizopolis (1996)"                                                               
## [1516] "To Have, or Not (1995)"                                                           
## [1517] "Duoluo tianshi (1995)"                                                            
## [1518] "Magic Hour, The (1998)"                                                           
## [1519] "Death in Brunswick (1991)"                                                        
## [1520] "Everest (1998)"                                                                   
## [1521] "Shopping (1994)"                                                                  
## [1522] "Nemesis 2: Nebula (1995)"                                                         
## [1523] "Romper Stomper (1992)"                                                            
## [1524] "City of Industry (1997)"                                                          
## [1525] "Someone Else's America (1995)"                                                    
## [1526] "Guantanamera (1994)"                                                              
## [1527] "Office Killer (1997)"                                                             
## [1528] "Price Above Rubies, A (1998)"                                                     
## [1529] "Angela (1995)"                                                                    
## [1530] "He Walked by Night (1948)"                                                        
## [1531] "Love Serenade (1996)"                                                             
## [1532] "Buddy (1997)"                                                                     
## [1533] "B*A*P*S (1997)"                                                                   
## [1534] "Truth or Consequences, N.M. (1997)"                                               
## [1535] "Intimate Relations (1996)"                                                        
## [1536] "Leading Man, The (1996)"                                                          
## [1537] "Tokyo Fist (1995)"                                                                
## [1538] "Reluctant Debutante, The (1958)"                                                  
## [1539] "Warriors of Virtue (1997)"                                                        
## [1540] "Desert Winds (1995)"                                                              
## [1541] "King of New York (1990)"                                                          
## [1542] "All Things Fair (1996)"                                                           
## [1543] "Sixth Man, The (1997)"                                                            
## [1544] "Butterfly Kiss (1995)"                                                            
## [1545] "Paris, France (1993)"                                                             
## [1546] "Ceremonie, La (1995)"                                                             
## [1547] "Hush (1998)"                                                                      
## [1548] "Nobody Loves Me (Keiner liebt mich) (1994)"                                       
## [1549] "Wife, The (1995)"                                                                 
## [1550] "Lamerica (1994)"                                                                  
## [1551] "Nico Icon (1995)"                                                                 
## [1552] "Silence of the Palace, The (Saimt el Qusur) (1994)"                               
## [1553] "Slingshot, The (1993)"                                                            
## [1554] "Land and Freedom (Tierra y libertad) (1995)"                                      
## [1555] "A koldum klaka (Cold Fever) (1994)"                                               
## [1556] "Etz Hadomim Tafus (Under the Domin Tree) (1994)"                                  
## [1557] "Two Friends (1986) "                                                              
## [1558] "Brothers in Trouble (1995)"                                                       
## [1559] "Girls Town (1996)"                                                                
## [1560] "Normal Life (1996)"                                                               
## [1561] "Bitter Sugar (Azucar Amargo) (1996)"                                              
## [1562] "Eighth Day, The (1996)"                                                           
## [1563] "Dadetown (1995)"                                                                  
## [1564] "Some Mother's Son (1996)"                                                         
## [1565] "Angel Baby (1995)"                                                                
## [1566] "Sudden Manhattan (1996)"                                                          
## [1567] "Butcher Boy, The (1998)"                                                          
## [1568] "Men With Guns (1997)"                                                             
## [1569] "Hana-bi (1997)"                                                                   
## [1570] "Niagara, Niagara (1997)"                                                          
## [1571] "Big One, The (1997)"                                                              
## [1572] "Spanish Prisoner, The (1997)"                                                     
## [1573] "Temptress Moon (Feng Yue) (1996)"                                                 
## [1574] "Entertaining Angels: The Dorothy Day Story (1996)"                                
## [1575] "Favor, The (1994)"                                                                
## [1576] "Little City (1998)"                                                               
## [1577] "Target (1995)"                                                                    
## [1578] "Getting Away With Murder (1996)"                                                  
## [1579] "Small Faces (1995)"                                                               
## [1580] "New Age, The (1994)"                                                              
## [1581] "Rough Magic (1995)"                                                               
## [1582] "Nothing Personal (1995)"                                                          
## [1583] "8 Heads in a Duffel Bag (1997)"                                                   
## [1584] "Brother's Kiss, A (1997)"                                                         
## [1585] "Ripe (1996)"                                                                      
## [1586] "Next Step, The (1995)"                                                            
## [1587] "Wedding Bell Blues (1996)"                                                        
## [1588] "MURDER and murder (1996)"                                                         
## [1589] "Tainted (1998)"                                                                   
## [1590] "Further Gesture, A (1996)"                                                        
## [1591] "Kika (1993)"                                                                      
## [1592] "Mirage (1995)"                                                                    
## [1593] "Mamma Roma (1962)"                                                                
## [1594] "Sunchaser, The (1996)"                                                            
## [1595] "War at Home, The (1996)"                                                          
## [1596] "Sweet Nothing (1995)"                                                             
## [1597] "Mat' i syn (1997)"                                                                
## [1598] "B. Monkey (1998)"                                                                 
## [1599] "You So Crazy (1994)"                                                              
## [1600] "Scream of Stone (Schrei aus Stein) (1991)"
# Se genera un grid con todas las similitudes que se tienen que calcular 
comparaciones <- expand.grid(películas_no_vistas, películas_vistas, stringsAsFactors = FALSE) 
colnames(comparaciones) <- c("pelicula_no_vista", "pelicula_vista") 
head(comparaciones)
##                                      pelicula_no_vista
## 1                                     Toy Story (1995)
## 2                                     GoldenEye (1995)
## 3                                    Four Rooms (1995)
## 4                                    Get Shorty (1995)
## 5                                       Copycat (1995)
## 6 Shanghai Triad (Yao a yao yao dao waipo qiao) (1995)
##          pelicula_vista
## 1 Twelve Monkeys (1995)
## 2 Twelve Monkeys (1995)
## 3 Twelve Monkeys (1995)
## 4 Twelve Monkeys (1995)
## 5 Twelve Monkeys (1995)
## 6 Twelve Monkeys (1995)
dim(comparaciones)
## [1] 102400      2

Reestructuramos los atributos convirtiendo filas en géneros y columnas en películas

# (prescindimos de url y year)
atributoss <- atributos %>% select(-url, -year)
atributoss <- atributoss %>% 
  gather(key = "atributo", value = "valor", -title) %>% 
  spread(key = title, value = valor) 
head(atributoss[,1:5])
##     atributo 'Til There Was You (1997) 1-900 (1994) 101 Dalmatians (1996)
## 1     Action                         0            0                     0
## 2  Adventure                         0            0                     0
## 3  Animation                         0            0                     0
## 4 Children's                         0            0                     1
## 5     Comedy                         0            0                     1
## 6      Crime                         0            0                     0
##   12 Angry Men (1957)
## 1                   0
## 2                   0
## 3                   0
## 4                   0
## 5                   0
## 6                   0

Se define a continuación la función que calcula la similitud (opuesta a DISTANCIA JACCARD)

indice_jaccard <- function(pelicula1, pelicula2, datos) { 
  # Esta funcion calcula el indice jaccard entre dos vectores 
  # El valor 1 indica presencia y el valor 0 ausencia. 
  m11 <- sum(datos[, pelicula1] == 1 & datos[, pelicula2] == 1) 
  m10 <- sum(datos[, pelicula1] == 1 & datos[, pelicula2] == 0) 
  m01 <- sum(datos[, pelicula1] == 0 & datos[, pelicula2] == 1) 
  indice <- m11 / sum(m01 + m10 + m11) 
  return(indice)}

y se calcula la similitud entre las películas_no_vistas con las películas_vistas por el usuario \(u_x\) con la funcion map2 del paquete purrr

similitud <- comparaciones %>% 
  mutate(similitud = map2_dbl(.x = pelicula_no_vista, 
                              .y = pelicula_vista, .f = indice_jaccard, datos = atributoss))
head(similitud)
##                                      pelicula_no_vista
## 1                                     Toy Story (1995)
## 2                                     GoldenEye (1995)
## 3                                    Four Rooms (1995)
## 4                                    Get Shorty (1995)
## 5                                       Copycat (1995)
## 6 Shanghai Triad (Yao a yao yao dao waipo qiao) (1995)
##          pelicula_vista similitud
## 1 Twelve Monkeys (1995)      0.00
## 2 Twelve Monkeys (1995)      0.00
## 3 Twelve Monkeys (1995)      0.00
## 4 Twelve Monkeys (1995)      0.25
## 5 Twelve Monkeys (1995)      0.25
## 6 Twelve Monkeys (1995)      0.50

PASO 2. Selección de los N items (valorados) más afines a cada uno de los no valorados. En los algoritmos, N se elige por validación, pero en este caso lo concretamos para simplificar.

N=15
# Para cada pelicula no vista, se seleccionan las N películas vistas mas parecidas y se ordenan
# en orden descendente de similitud
recomendaciónesN <- similitud %>% 
  group_by(pelicula_no_vista) %>% 
  top_n(n = 15, wt = similitud) %>% 
  arrange(pelicula_no_vista, desc(similitud))

# NOTA: cuando las similitudes son las mismas para un rango de películas que sobrepasa N,
# se queda con todas ellas
nnn=recomendaciónesN %>%
  group_by(pelicula_no_vista) %>%
  count()
head(nnn)
## # A tibble: 6 x 2
## # Groups:   pelicula_no_vista [6]
##   pelicula_no_vista                       n
##   <chr>                               <int>
## 1 'Til There Was You (1997)              24
## 2 1-900 (1994)                           15
## 3 101 Dalmatians (1996)                  15
## 4 12 Angry Men (1957)                    25
## 5 187 (1997)                             25
## 6 20,000 Leagues Under the Sea (1954)    64

PASO 3. Cálculo de un índice de recomendación (predicción) con el promedio (ponderado por similitud) de las valoraciones del usuario \(u_x\) a los N items más afines.

Se añade la valoración que el usuario \(u_x\) ha hecho de cada una de las películas vistas seleccionadas

valoraciones_ux = filter(rdf,user==x)
#modificamos el tipo para compatibilizar la comparacion con las recomendaciónes en la columna pelicula
valoraciones_ux$item=as.character(valoraciones_ux$item)

recomendaciónesN_ux <- recomendaciónesN %>% 
  left_join(y = valoraciones_ux, by = c("pelicula_vista" = "item"))
head(recomendaciónesN_ux)
## # A tibble: 6 x 7
## # Groups:   pelicula_no_vista [1]
##   pelicula_no_vista pelicula_vista  similitud user  rating ratingc ratingz
##   <chr>             <chr>               <dbl> <fct>  <dbl>   <dbl>   <dbl>
## 1 'Til There Was Y… Graduate, The …     1     329        4   0.609   0.736
## 2 'Til There Was Y… Leaving Las Ve…     1     329        4   0.609   0.736
## 3 'Til There Was Y… English Patien…     0.667 329        4   0.609   0.736
## 4 'Til There Was Y… Titanic (1997)      0.667 329        4   0.609   0.736
## 5 'Til There Was Y… Casablanca (19…     0.667 329        4   0.609   0.736
## 6 'Til There Was Y… Wings of Desir…     0.667 329        4   0.609   0.736

Se calcula el índice de recomendación como la media de valoraciones ponderada por similitud del usuario \(u_x\), para lo que es preciso definir la función del cálculo de la media ponderada de las valoraciones por pelicula

media_ponderada <- function(df,rating){ 
  resultado <- sum(df$rating * df$similitud) / sum(df$similitud) 
  return(resultado) }

indice_recomendación_ux<-recomendaciónesN_ux %>% 
  group_by(pelicula_no_vista) %>% 
  nest() %>% 
  mutate(prediccion = map_dbl(.x = data, .f = media_ponderada)) %>% 
  select(-data) %>% 
  arrange(desc(prediccion))

PASO 4. Selección de los S items con mayor índice de recomendación.

S=10
topS_recomendaciónes<- head(indice_recomendación_ux,10) 
topS_recomendaciónes
## # A tibble: 10 x 2
##    pelicula_no_vista                                      prediccion
##    <chr>                                                       <dbl>
##  1 Daytrippers, The (1996)                                      4.13
##  2 Lost Highway (1997)                                          4.13
##  3 Thin Man, The (1934)                                         4.13
##  4 Woman in Question, The (1950)                                4.13
##  5 Big Sleep, The (1946)                                        4.08
##  6 Maltese Falcon, The (1941)                                   4.08
##  7 Faust (1994)                                                 4   
##  8 Wallace & Gromit: The Best of Aardman Animation (1996)       4   
##  9 Colonel Chabert, Le (1994)                                   3.87
## 10 Gone with the Wind (1939)                                    3.87
ggplot(data = topS_recomendaciónes, aes(x = reorder(pelicula_no_vista, prediccion), y = prediccion)) + 
  geom_col() + 
  labs(title = "Pelicula recomendada",x="") + 
  coord_flip() + theme_bw()

Sistemas de recomendación colaborativos en recommenderlab

Los sistemas de recomendación implementados en recomenderlab son:

recommenderRegistry$get_entries()
## $ALS_realRatingMatrix
## Recommender method: ALS for realRatingMatrix
## Description: Recommender for explicit ratings based on latent factors, calculated by alternating least squares algorithm.
## Reference: Yunhong Zhou, Dennis Wilkinson, Robert Schreiber, Rong Pan (2008). Large-Scale Parallel Collaborative Filtering for the Netflix Prize, 4th Int'l Conf. Algorithmic Aspects in Information and Management, LNCS 5034.
## Parameters:
##   normalize lambda n_factors n_iterations min_item_nr seed
## 1      NULL    0.1        10           10           1 NULL
## 
## $ALS_implicit_realRatingMatrix
## Recommender method: ALS_implicit for realRatingMatrix
## Description: Recommender for implicit data based on latent factors, calculated by alternating least squares algorithm.
## Reference: Yifan Hu, Yehuda Koren, Chris Volinsky (2008). Collaborative Filtering for Implicit Feedback Datasets, ICDM '08 Proceedings of the 2008 Eighth IEEE International Conference on Data Mining, pages 263-272.
## Parameters:
##   lambda alpha n_factors n_iterations min_item_nr seed
## 1    0.1    10        10           10           1 NULL
## 
## $ALS_implicit_binaryRatingMatrix
## Recommender method: ALS_implicit for binaryRatingMatrix
## Description: Recommender for implicit data based on latent factors, calculated by alternating least squares algorithm.
## Reference: Yifan Hu, Yehuda Koren, Chris Volinsky (2008). Collaborative Filtering for Implicit Feedback Datasets, ICDM '08 Proceedings of the 2008 Eighth IEEE International Conference on Data Mining, pages 263-272.
## Parameters:
##   lambda alpha n_factors n_iterations min_item_nr seed
## 1    0.1    10        10           10           1 NULL
## 
## $AR_binaryRatingMatrix
## Recommender method: AR for binaryRatingMatrix
## Description: Recommender based on association rules.
## Reference: NA
## Parameters:
##   support confidence maxlen sort_measure sort_decreasing apriori_control
## 1     0.1        0.8      3 "confidence"            TRUE          list()
##   verbose
## 1   FALSE
## 
## $IBCF_binaryRatingMatrix
## Recommender method: IBCF for binaryRatingMatrix
## Description: Recommender based on item-based collaborative filtering (binary rating data).
## Reference: NA
## Parameters:
##    k    method normalize_sim_matrix alpha
## 1 30 "Jaccard"                FALSE   0.5
## 
## $IBCF_realRatingMatrix
## Recommender method: IBCF for realRatingMatrix
## Description: Recommender based on item-based collaborative filtering.
## Reference: NA
## Parameters:
##    k   method normalize normalize_sim_matrix alpha na_as_zero
## 1 30 "Cosine"  "center"                FALSE   0.5      FALSE
## 
## $POPULAR_binaryRatingMatrix
## Recommender method: POPULAR for binaryRatingMatrix
## Description: Recommender based on item popularity.
## Reference: NA
## Parameters: None
## 
## $POPULAR_realRatingMatrix
## Recommender method: POPULAR for realRatingMatrix
## Description: Recommender based on item popularity.
## Reference: NA
## Parameters:
##   normalize
## 1  "center"
##                                                      aggregationRatings
## 1 new("standardGeneric", .Data = function (x, na.rm = FALSE, dims = 1, 
##                                                   aggregationPopularity
## 1 new("standardGeneric", .Data = function (x, na.rm = FALSE, dims = 1, 
## 
## $RANDOM_realRatingMatrix
## Recommender method: RANDOM for realRatingMatrix
## Description: Produce random recommendations (real ratings).
## Reference: NA
## Parameters: None
## 
## $RANDOM_binaryRatingMatrix
## Recommender method: RANDOM for binaryRatingMatrix
## Description: Produce random recommendations (binary ratings).
## Reference: NA
## Parameters: None
## 
## $RERECOMMEND_realRatingMatrix
## Recommender method: RERECOMMEND for realRatingMatrix
## Description: Re-recommends highly rated items (real ratings).
## Reference: NA
## Parameters:
##   randomize minRating
## 1         1        NA
## 
## $SVD_realRatingMatrix
## Recommender method: SVD for realRatingMatrix
## Description: Recommender based on SVD approximation with column-mean imputation.
## Reference: NA
## Parameters:
##    k maxiter normalize
## 1 10     100  "center"
## 
## $SVDF_realRatingMatrix
## Recommender method: SVDF for realRatingMatrix
## Description: Recommender based on Funk SVD with gradient descend.
## Reference: NA
## Parameters:
##    k gamma lambda min_epochs max_epochs min_improvement normalize verbose
## 1 10 0.015  0.001         50        200           1e-06  "center"   FALSE
## 
## $UBCF_binaryRatingMatrix
## Recommender method: UBCF for binaryRatingMatrix
## Description: Recommender based on user-based collaborative filtering.
## Reference: NA
## Parameters:
##      method nn weighted sample
## 1 "jaccard" 25     TRUE  FALSE
## 
## $UBCF_realRatingMatrix
## Recommender method: UBCF for realRatingMatrix
## Description: Recommender based on user-based collaborative filtering.
## Reference: NA
## Parameters:
##     method nn sample normalize
## 1 "cosine" 25  FALSE  "center"
recommenderRegistry$get_entries(dataType = "realRatingMatrix")
## $ALS_realRatingMatrix
## Recommender method: ALS for realRatingMatrix
## Description: Recommender for explicit ratings based on latent factors, calculated by alternating least squares algorithm.
## Reference: Yunhong Zhou, Dennis Wilkinson, Robert Schreiber, Rong Pan (2008). Large-Scale Parallel Collaborative Filtering for the Netflix Prize, 4th Int'l Conf. Algorithmic Aspects in Information and Management, LNCS 5034.
## Parameters:
##   normalize lambda n_factors n_iterations min_item_nr seed
## 1      NULL    0.1        10           10           1 NULL
## 
## $ALS_implicit_realRatingMatrix
## Recommender method: ALS_implicit for realRatingMatrix
## Description: Recommender for implicit data based on latent factors, calculated by alternating least squares algorithm.
## Reference: Yifan Hu, Yehuda Koren, Chris Volinsky (2008). Collaborative Filtering for Implicit Feedback Datasets, ICDM '08 Proceedings of the 2008 Eighth IEEE International Conference on Data Mining, pages 263-272.
## Parameters:
##   lambda alpha n_factors n_iterations min_item_nr seed
## 1    0.1    10        10           10           1 NULL
## 
## $IBCF_realRatingMatrix
## Recommender method: IBCF for realRatingMatrix
## Description: Recommender based on item-based collaborative filtering.
## Reference: NA
## Parameters:
##    k   method normalize normalize_sim_matrix alpha na_as_zero
## 1 30 "Cosine"  "center"                FALSE   0.5      FALSE
## 
## $POPULAR_realRatingMatrix
## Recommender method: POPULAR for realRatingMatrix
## Description: Recommender based on item popularity.
## Reference: NA
## Parameters:
##   normalize
## 1  "center"
##                                                      aggregationRatings
## 1 new("standardGeneric", .Data = function (x, na.rm = FALSE, dims = 1, 
##                                                   aggregationPopularity
## 1 new("standardGeneric", .Data = function (x, na.rm = FALSE, dims = 1, 
## 
## $RANDOM_realRatingMatrix
## Recommender method: RANDOM for realRatingMatrix
## Description: Produce random recommendations (real ratings).
## Reference: NA
## Parameters: None
## 
## $RERECOMMEND_realRatingMatrix
## Recommender method: RERECOMMEND for realRatingMatrix
## Description: Re-recommends highly rated items (real ratings).
## Reference: NA
## Parameters:
##   randomize minRating
## 1         1        NA
## 
## $SVD_realRatingMatrix
## Recommender method: SVD for realRatingMatrix
## Description: Recommender based on SVD approximation with column-mean imputation.
## Reference: NA
## Parameters:
##    k maxiter normalize
## 1 10     100  "center"
## 
## $SVDF_realRatingMatrix
## Recommender method: SVDF for realRatingMatrix
## Description: Recommender based on Funk SVD with gradient descend.
## Reference: NA
## Parameters:
##    k gamma lambda min_epochs max_epochs min_improvement normalize verbose
## 1 10 0.015  0.001         50        200           1e-06  "center"   FALSE
## 
## $UBCF_realRatingMatrix
## Recommender method: UBCF for realRatingMatrix
## Description: Recommender based on user-based collaborative filtering.
## Reference: NA
## Parameters:
##     method nn sample normalize
## 1 "cosine" 25  FALSE  "center"
recommenderRegistry$get_entries(dataType = "binaryRatingMatrix")
## $ALS_implicit_binaryRatingMatrix
## Recommender method: ALS_implicit for binaryRatingMatrix
## Description: Recommender for implicit data based on latent factors, calculated by alternating least squares algorithm.
## Reference: Yifan Hu, Yehuda Koren, Chris Volinsky (2008). Collaborative Filtering for Implicit Feedback Datasets, ICDM '08 Proceedings of the 2008 Eighth IEEE International Conference on Data Mining, pages 263-272.
## Parameters:
##   lambda alpha n_factors n_iterations min_item_nr seed
## 1    0.1    10        10           10           1 NULL
## 
## $AR_binaryRatingMatrix
## Recommender method: AR for binaryRatingMatrix
## Description: Recommender based on association rules.
## Reference: NA
## Parameters:
##   support confidence maxlen sort_measure sort_decreasing apriori_control
## 1     0.1        0.8      3 "confidence"            TRUE          list()
##   verbose
## 1   FALSE
## 
## $IBCF_binaryRatingMatrix
## Recommender method: IBCF for binaryRatingMatrix
## Description: Recommender based on item-based collaborative filtering (binary rating data).
## Reference: NA
## Parameters:
##    k    method normalize_sim_matrix alpha
## 1 30 "Jaccard"                FALSE   0.5
## 
## $POPULAR_binaryRatingMatrix
## Recommender method: POPULAR for binaryRatingMatrix
## Description: Recommender based on item popularity.
## Reference: NA
## Parameters: None
## 
## $RANDOM_binaryRatingMatrix
## Recommender method: RANDOM for binaryRatingMatrix
## Description: Produce random recommendations (binary ratings).
## Reference: NA
## Parameters: None
## 
## $UBCF_binaryRatingMatrix
## Recommender method: UBCF for binaryRatingMatrix
## Description: Recommender based on user-based collaborative filtering.
## Reference: NA
## Parameters:
##      method nn weighted sample
## 1 "jaccard" 25     TRUE  FALSE

Filtrado colaborativo basado en el ítem (method = “IBCF”)

Para predecir la valoración que un usuario \(u_x\) hará de un ítem cualquiera que todavía no ha valorado, se buscan otros items similares (en funcion del perfil de valoraciones que han recibido de todos los usuarios) y que el usuario \(u_x\) también haya valorado. Se utilizan las valoraciones que el propio usuario \(u_x\) ha hecho de los items similares como predicción de su valoración sobre el ítem objetivo. Este sistema puede parecer similar al basado en contenido, la diferencia se encuentra en que cada item no está definido por sus atributos sino por el perfil de valoraciones que ha recibido.

Objetivo: recomendar S películas al usuario \(u_x\) en base a su experiencia/valoraciones y las del resto de usuarios, sin tener en cuenta los atributos de las películas.

En este caso es importante la estandarización por usuario, con el fin de desafectar del efecto escala de dos usuarios similares en comportamiento y con escala de valoración distinta (sesgada). El índice de similitud entre cada película no vista y cada película vista por \(u_x\) se calcula con las correlaciones entre todas las valoraciones disponibles de todos los usuarios. La predicción de las valoraciones de las películas no vistas se calculan con el promedio de las valoraciones del usuario \(u_x\) a las películas vistas similares, ponderadas por el índice de similitud.

Creamos en primer lugar el modelo de recomendación:

x=239
# 
rec=Recommender(MovieLense[-x], method = "IBCF") 
rec
## Recommender of type 'IBCF' for 'realRatingMatrix' 
## learned using 942 users.
# que produce una serie de outputs
names(getModel(rec))
## [1] "description"          "sim"                  "k"                   
## [4] "method"               "normalize"            "normalize_sim_matrix"
## [7] "alpha"                "na_as_zero"           "verbose"

y a continuación podemos predecir directamente las 10 mejores recomendaciónes:

S=10
recom=predict(rec,MovieLense[x],n=S)
recomS=as(recom,"list")
head(recomS)
## $`239`
##  [1] "Bad Boys (1995)"                                           
##  [2] "Nadja (1994)"                                              
##  [3] "Disclosure (1994)"                                         
##  [4] "Madness of King George, The (1994)"                        
##  [5] "Priest (1994)"                                             
##  [6] "Faster Pussycat! Kill! Kill! (1965)"                       
##  [7] "Ref, The (1994)"                                           
##  [8] "Horseman on the Roof, The (Hussard sur le toit, Le) (1995)"
##  [9] "Weekend at Bernie's (1989)"                                
## [10] "Good, The Bad and The Ugly, The (1966)"

o seleccionar las mejores

recom3=bestN(recom,n=3)
as(recom3,"list")
## $`239`
## [1] "Bad Boys (1995)"   "Nadja (1994)"      "Disclosure (1994)"

así como obtener todos los indices de recomendación predichos por el algoritmo:

recom=predict(rec,MovieLense[x],type="ratings")
recom.df=as(recom,"data.frame")
head(recom.df)
##   user                                item rating
## 1  239                     Bad Boys (1995)      5
## 2  239                        Nadja (1994)      5
## 3  239                   Disclosure (1994)      5
## 4  239  Madness of King George, The (1994)      5
## 5  239                       Priest (1994)      5
## 6  239 Faster Pussycat! Kill! Kill! (1965)      5
recomS=recom.df %>% arrange(desc(rating)) %>% head(S)

o la matriz completa de valoraciones que incluyen las valoraciones disponibles y predichas para el usuario u_x

recom.ini=predict(rec,r[x], type="ratingMatrix") 
recom.ini
## 1 x 1664 rating matrix of class 'realRatingMatrix' with 514 ratings.
as(recom.ini,"list")
## $`239`
##                                                                  Babe (1995) 
##                                                                    0.7721519 
##                                                      Dead Man Walking (1995) 
##                                                                    0.7721519 
##                                                           Richard III (1995) 
##                                                                    0.7721519 
##                                                   Usual Suspects, The (1995) 
##                                                                    0.7721519 
##                                                           Postino, Il (1994) 
##                                                                    0.7721519 
##                                                              Bad Boys (1995) 
##                                                                    5.0000000 
##                                                                 Nadja (1994) 
##                                                                    5.0000000 
##                                                          Strange Days (1995) 
##                                                                    0.7721519 
##                                                                Clerks (1994) 
##                                                                    0.7721519 
##                                                            Disclosure (1994) 
##                                                                    5.0000000 
##                                                   Eat Drink Man Woman (1994) 
##                                                                    0.7721519 
##                                                               Exotica (1994) 
##                                                                   -0.2278481 
##                                                               Ed Wood (1994) 
##                                                                   -2.2278481 
##                                                             Star Wars (1977) 
##                                                                    0.7721519 
##                                           Madness of King George, The (1994) 
##                                                                    5.0000000 
##                                                          Pulp Fiction (1994) 
##                                                                   -0.2278481 
##                                                                Priest (1994) 
##                                                                    5.0000000 
##                                                             Quiz Show (1994) 
##                                                                    0.7721519 
##                                             Shawshank Redemption, The (1994) 
##                                                                   -3.2278481 
##                                           What's Eating Gilbert Grape (1993) 
##                                                                    0.7721519 
##                                                          Forrest Gump (1994) 
##                                                                   -3.2278481 
##                                          Faster Pussycat! Kill! Kill! (1965) 
##                                                                    5.0000000 
##                                                         Fugitive, The (1993) 
##                                                                   -1.2278481 
##                                                  Hudsucker Proxy, The (1994) 
##                                                                   -1.2278481 
##                                                              Ref, The (1994) 
##                                                                    5.0000000 
##                                                          Blade Runner (1982) 
##                                                                   -0.2278481 
##                                       Nightmare Before Christmas, The (1993) 
##                                                                   -0.2278481 
##                                            Terminator 2: Judgment Day (1991) 
##                                                                    0.7721519 
##                                             Silence of the Lambs, The (1991) 
##                                                                    0.7721519 
##                                                                 Fargo (1996) 
##                                                                   -1.2278481 
##                                                          Theodore Rex (1995) 
##                                                                    1.0000000 
##                   Horseman on the Roof, The (Hussard sur le toit, Le) (1995) 
##                                                                    5.0000000 
##                       Wallace & Gromit: The Best of Aardman Animation (1996) 
##                                                                   -1.2278481 
##                                                     Cold Comfort Farm (1995) 
##                                                                    0.7721519 
##                                       Maya Lin: A Strong Clear Vision (1994) 
##                                                                    3.0000000 
##                                                             Lone Star (1996) 
##                                                                    0.7721519 
##                                                     Wizard of Oz, The (1939) 
##                                                                    0.7721519 
##                                                    Gone with the Wind (1939) 
##                                                                   -1.2278481 
##                                                          Citizen Kane (1941) 
##                                                                    0.7721519 
##                                                 2001: A Space Odyssey (1968) 
##                                                                    0.7721519 
##                                                             Big Night (1996) 
##                                                                    0.7721519 
##                                                                  Jude (1996) 
##                                                                    3.0000000 
##                                                              Swingers (1996) 
##                                                                    0.7721519 
##                                                               Sleeper (1973) 
##                                                                   -1.2278481 
##                                                   Weekend at Bernie's (1989) 
##                                                                    5.0000000 
##                                                        On Golden Pond (1981) 
##                                                                    0.7721519 
##                                                      Jean de Florette (1986) 
##                                                                    0.7721519 
##                                                      Private Benjamin (1980) 
##                                                                    3.0000000 
##                                       Monty Python and the Holy Grail (1974) 
##                                                                   -0.2278481 
##                                                          Delicatessen (1991) 
##                                                                    0.7721519 
##                                              Empire Strikes Back, The (1980) 
##                                                                   -0.2278481 
##                                               Raiders of the Lost Ark (1981) 
##                                                                   -0.2278481 
##                                                                Brazil (1985) 
##                                                                    0.7721519 
##                                       Good, The Bad and The Ugly, The (1966) 
##                                                                    5.0000000 
##                                                   Clockwork Orange, A (1971) 
##                                                                    0.7721519 
##                                                        Apocalypse Now (1979) 
##                                                                    0.7721519 
##                                                    Return of the Jedi (1983) 
##                                                                   -1.2278481 
##                                                                 Alien (1979) 
##                                                                    0.7721519 
##                                                                Psycho (1960) 
##                                                                   -0.2278481 
##                                                   Blues Brothers, The (1980) 
##                                                                   -3.2278481 
##                                               Godfather: Part II, The (1974) 
##                                                                    0.7721519 
##                                                      Grand Day Out, A (1992) 
##                                                                    5.0000000 
##                                                               Henry V (1989) 
##                                                                   -3.2278481 
##                                                            Sting, The (1973) 
##                                                                    0.7721519 
##                                                       Terminator, The (1984) 
##                                                                    0.7721519 
##                                              Nikita (La Femme Nikita) (1990) 
##                                                                    0.7721519 
##                                                            Unforgiven (1992) 
##                                                                   -3.2278481 
##                                                    Back to the Future (1985) 
##                                                                   -1.2278481 
##                                                                Patton (1970) 
##                                                                   -1.2278481 
##                                                                 Akira (1988) 
##                                                                    5.0000000 
##                                                    Cyrano de Bergerac (1990) 
##                                                                    0.7721519 
##                                                    Young Frankenstein (1974) 
##                                                                   -1.2278481 
##                                                    This Is Spinal Tap (1984) 
##                                                                    0.7721519 
##                                    Indiana Jones and the Last Crusade (1989) 
##                                                                   -0.2278481 
##                                             Mirror Has Two Faces, The (1996) 
##                                                                    5.0000000 
##                                                    Breaking the Waves (1996) 
##                                                                    0.7721519 
##                                          Star Trek: The Wrath of Khan (1982) 
##                                                                   -2.2278481 
##                                                                  Jaws (1975) 
##                                                                   -1.2278481 
##                                                       Raising Arizona (1987) 
##                                                                    0.7721519 
##                                                                 Kolya (1996) 
##                                                                    0.7721519 
##                          When the Cats Away (Chacun cherche son chat) (1996) 
##                                                                    5.0000000 
##                                                       Full Monty, The (1997) 
##                                                                    0.7721519 
##                                                     Good Will Hunting (1997) 
##                                                                    0.7721519 
##                                                     Leaving Las Vegas (1995) 
##                                                                    0.7721519 
##                                                  English Patient, The (1996) 
##                                                                   -3.2278481 
##                                                                Scream (1996) 
##                                                                   -2.2278481 
##                                                         Air Force One (1997) 
##                                                                   -3.2278481 
##                                                         Fly Away Home (1996) 
##                                                                   -3.2278481 
##                                                        Ice Storm, The (1997) 
##                                                                   -0.2278481 
##                               Midnight in the Garden of Good and Evil (1997) 
##                                                                   -2.2278481 
##                                  3 Ninjas: High Noon At Mega Mountain (1998) 
##                                                                    5.0000000 
##                                             In the Name of the Father (1993) 
##                                                                    0.7721519 
##                                                      Schindler's List (1993) 
##                                                                   -3.2278481 
##                                                    How to Be a Player (1997) 
##                                                                    5.0000000 
##                                                         Boogie Nights (1997) 
##                                                                    0.7721519 
##                                                         Critical Care (1997) 
##                                                                    5.0000000 
##                                                           Spice World (1997) 
##                                                                    5.0000000 
##                                                           Deep Rising (1998) 
##                                                                    5.0000000 
##                                                       Assignment, The (1997) 
##                                                                    5.0000000 
##                                                          Sudden Death (1995) 
##                                                                    5.0000000 
##                                        Ace Ventura: When Nature Calls (1995) 
##                                                                    5.0000000 
##                                                               Jeffrey (1995) 
##                                                                    4.0000000 
##                           Tales From the Crypt Presents: Demon Knight (1995) 
##                                                                    5.0000000 
##                     Adventures of Priscilla, Queen of the Desert, The (1994) 
##                                                                   -1.2278481 
##                                                   Fear of a Black Hat (1993) 
##                                                                    5.0000000 
##                                                             Pinocchio (1940) 
##                                                                    5.0000000 
##                                                            Cinderella (1950) 
##                                                                    5.0000000 
##                                                          Mary Poppins (1964) 
##                                                                   -1.2278481 
##                                William Shakespeare's Romeo and Juliet (1996) 
##                                                                    0.7721519 
##                                       Aladdin and the King of Thieves (1996) 
##                                                                    5.0000000 
##                                          Transformers: The Movie, The (1986) 
##                                                                    3.0000000 
##                                                 To Kill a Mockingbird (1962) 
##                                                                    0.7721519 
##                                                      Harold and Maude (1971) 
##                                                                    0.7721519 
##                                        Day the Earth Stood Still, The (1951) 
##                                                                    5.0000000 
##                                                             Duck Soup (1933) 
##                                                                   -1.2278481 
##                                                              Fantasia (1940) 
##                                                                    0.7721519 
##                                                              Heathers (1989) 
##                                                                    0.7721519 
##                                                      Forbidden Planet (1956) 
##                                                                    0.7721519 
##                                                            Birds, The (1963) 
##                                                                    0.7721519 
##                                                       Burnt Offerings (1976) 
##                                                                    5.0000000 
##                                                   Crossing Guard, The (1995) 
##                                                                    5.0000000 
##                   Like Water For Chocolate (Como agua para chocolate) (1992) 
##                                                                    0.7721519 
##                                             Secret of Roan Inish, The (1994) 
##                                                                    0.7721519 
##                                                  Vanya on 42nd Street (1994) 
##                                                                    5.0000000 
##                                                    Courage Under Fire (1996) 
##                                                                    5.0000000 
##  Dr. Strangelove or: How I Learned to Stop Worrying and Love the Bomb (1963) 
##                                                                    0.7721519 
##                                                         Trainspotting (1996) 
##                                                                    0.7721519 
##                                               Philadelphia Story, The (1940) 
##                                                                    0.7721519 
##                                                               Vertigo (1958) 
##                                                                    0.7721519 
##                                                      Some Like It Hot (1959) 
##                                                                   -1.2278481 
##                                                            Casablanca (1942) 
##                                                                    0.7721519 
##                                                   Maltese Falcon, The (1941) 
##                                                                    0.7721519 
##                                                          Sunset Blvd. (1950) 
##                                                                    0.7721519 
##                                                             Notorious (1946) 
##                                                                    0.7721519 
##                                         Adventures of Robin Hood, The (1938) 
##                                                                    0.7721519 
##                                                          East of Eden (1955) 
##                                                                   -1.2278481 
##                                                         Thin Man, The (1934) 
##                                                                    0.7721519 
##                                                      Bringing Up Baby (1938) 
##                                                                   -0.2278481 
##                                                    African Queen, The (1951) 
##                                                                   -0.2278481 
##                                                 Cat on a Hot Tin Roof (1958) 
##                                                                    0.7721519 
##                                                      Bonnie and Clyde (1967) 
##                                                                   -0.2278481 
##                                                     Dial M for Murder (1954) 
##                                                                    0.7721519 
##                                             Streetcar Named Desire, A (1951) 
##                                                                    0.7721519 
##                                           People vs. Larry Flynt, The (1996) 
##                                                                    0.7721519 
##                                                          My Left Foot (1989) 
##                                                                    0.7721519 
##                                                Magnificent Seven, The (1954) 
##                                                                    5.0000000 
##                                                    Lawrence of Arabia (1962) 
##                                                                    0.7721519 
##                                                       Wings of Desire (1987) 
##                                                                    0.7721519 
##                                                        Third Man, The (1949) 
##                                                                    0.7721519 
##                                                            Annie Hall (1977) 
##                                                                   -3.2278481 
##                                                            Local Hero (1983) 
##                                                                    0.7721519 
##                                                     Miller's Crossing (1990) 
##                                                                   -1.2278481 
##                                                           Down by Law (1986) 
##                                                                    5.0000000 
##                                                                Gandhi (1982) 
##                                                                    0.7721519 
##                                                   Killing Fields, The (1984) 
##                                                                    0.7721519 
##                                  My Life as a Dog (Mitt liv som hund) (1985) 
##                                                                    0.7721519 
##                                            Man Who Would Be King, The (1975) 
##                                                                    0.7721519 
##                                                                 Shine (1996) 
##                                                                    0.7721519 
##                                                             Traveller (1997) 
##                                                                    5.0000000 
##                                                               Ponette (1996) 
##                                                                    5.0000000 
##                                                  My Own Private Idaho (1991) 
##                                                                    5.0000000 
##                                                         Mortal Kombat (1995) 
##                                                                    1.0000000 
##                                                            Pocahontas (1995) 
##                                                                    1.0000000 
##                                                       Miserables, Les (1995) 
##                                                                    5.0000000 
##                                            Die Hard: With a Vengeance (1995) 
##                                                                    5.0000000 
##                                                            Waterworld (1995) 
##                                                                    1.0000000 
##                                                    Heavenly Creatures (1994) 
##                                                                    0.7721519 
##                                         Kid in King Arthur's Court, A (1995) 
##                                                                    1.0000000 
##                                         Stephen King's The Langoliers (1995) 
##                                                                    2.0000000 
##                                                   Tales from the Hood (1995) 
##                                                                    1.0000000 
##                                                 Village of the Damned (1995) 
##                                                                    5.0000000 
##                                                             Coneheads (1993) 
##                                                                    4.0000000 
##                                                       Wild Bunch, The (1969) 
##                                                                   -1.2278481 
##                                                            True Crime (1995) 
##                                                                    5.0000000 
##                                                            Stalingrad (1993) 
##                                                                    5.0000000 
##                                                                 Heavy (1995) 
##                                                                    5.0000000 
##                            Police Story 4: Project S (Chao ji ji hua) (1993) 
##                                                                    4.6666667 
##                                        Daniel Defoe's Robinson Crusoe (1996) 
##                                                                    4.2500000 
##                                                 American in Paris, An (1951) 
##                                                                    5.0000000 
##                                                           Rear Window (1954) 
##                                                                    0.7721519 
##                                                  Meet Me in St. Louis (1944) 
##                                                                   -0.2278481 
##                                                          Lost Horizon (1937) 
##                                                                    0.7721519 
##                                    Blue Angel, The (Blaue Engel, Der) (1930) 
##                                                                    1.0000000 
##                                                          Chamber, The (1996) 
##                                                                    4.0000000 
##                                                 Three Caballeros, The (1945) 
##                                                                    4.0000000 
##                                                       Sophie's Choice (1982) 
##                                                                    0.7721519 
##                                                    Christmas Carol, A (1938) 
##                                                                    0.7721519 
##                                     Microcosmos: Le peuple de l'herbe (1996) 
##                                                                   -0.2278481 
##                                                   Thin Blue Line, The (1988) 
##                                                                    5.0000000 
##                                                      Paris Is Burning (1990) 
##                                                                    4.0000000 
##                                                                   Ran (1985) 
##                                                                    0.7721519 
##                                           Once Upon a Time in America (1984) 
##                                                                    5.0000000 
##                              Seventh Seal, The (Sjunde inseglet, Det) (1957) 
##                                                                    0.7721519 
##                                 Rosencrantz and Guildenstern Are Dead (1990) 
##                                                                    0.7721519 
##                                                             Chinatown (1974) 
##                                                                    0.7721519 
##                                                  Arsenic and Old Lace (1944) 
##                                                                   -1.2278481 
##                                                           Being There (1979) 
##                                                                    0.7721519 
##                                                           Blood Beach (1981) 
##                                                                    3.0000000 
##                                                 Bride of Frankenstein (1935) 
##                                                                    0.7721519 
##                                                            Cat People (1982) 
##                                                                    5.0000000 
##                     Nosferatu (Nosferatu, eine Symphonie des Grauens) (1922) 
##                                                                    0.7721519 
##                                                  Fire on the Mountain (1996) 
##                                                                    4.6666667 
##                                                  Seven Years in Tibet (1997) 
##                                                                   -3.2278481 
##                                                             Dark City (1998) 
##                                                                    2.6666667 
##                                                 Kicking and Screaming (1995) 
##                                                                    5.0000000 
##                                               Basketball Diaries, The (1995) 
##                                                                    5.0000000 
##                                                 Browning Version, The (1994) 
##                                                                    4.0000000 
##                                                        Miami Rhapsody (1995) 
##                                                                    5.0000000 
##                     Wonderful, Horrible Life of Leni Riefenstahl, The (1993) 
##                                                                    0.7721519 
##                                                          Widows' Peak (1994) 
##                                                                    5.0000000 
##                                                   Singin' in the Rain (1952) 
##                                                                   -0.2278481 
##                                                Substance of Fire, The (1996) 
##                                                                    4.8000000 
##                                                In the Bleak Midwinter (1995) 
##                                                                    3.0000000 
##                                                          First Knight (1995) 
##                                                                    1.0000000 
##                                                      Boys on the Side (1995) 
##                                                                    5.0000000 
##                                                     Circle of Friends (1995) 
##                                                                    5.0000000 
##                                                           Shadowlands (1993) 
##                                                                    0.7721519 
##                                                             Threesome (1994) 
##                                                                    5.0000000 
##                                                     Ruling Class, The (1972) 
##                                                                    0.7721519 
##                                                               Amistad (1997) 
##                                                                    5.0000000 
##                                                      Burnt By the Sun (1994) 
##                                                                    0.7721519 
##                                                       Man of the Year (1995) 
##                                                                    1.5000000 
##                                                                 Congo (1995) 
##                                                                    1.0000000 
##                                                                  Kids (1995) 
##                                                                    5.0000000 
##                                                          Mute Witness (1994) 
##                                                                    5.0000000 
##                                                          Three Wishes (1995) 
##                                                                    1.0000000 
##                                                         Little Odessa (1994) 
##                                                                    5.0000000 
##                                                              Crooklyn (1994) 
##                                                                    4.3333333 
##                                                           Bad Company (1995) 
##                                                                    5.0000000 
##                                                             Boys Life (1995) 
##                                                                    5.0000000 
##                                                     Air Up There, The (1994) 
##                                                                    3.5000000 
##                                                       Jimmy Hollywood (1994) 
##                                                                    5.0000000 
##                                                     Menace II Society (1993) 
##                                                                    5.0000000 
##                                                                 Andre (1994) 
##                                                                    5.0000000 
##                                                                 Frisk (1995) 
##                                                                    1.0000000 
##                                                                 Faces (1968) 
##                                                                    4.0000000 
##                                                 Great White Hype, The (1996) 
##                                                                    5.0000000 
##                                                                Alaska (1996) 
##                                                                    2.0000000 
##                                                                  Fled (1996) 
##                                                                    5.0000000 
##                                                     Gay Divorcee, The (1934) 
##                                                                    3.0000000 
##                                                             Ninotchka (1939) 
##                                                                    0.7721519 
##                                                 In the Line of Duty 2 (1987) 
##                                                                    2.0000000 
##                                                  Perfect Candidate, A (1996) 
##                                                                    4.0000000 
##                                  Two or Three Things I Know About Her (1966) 
##                                                                    3.7500000 
##                                                                  Diva (1981) 
##                                                                    0.7721519 
##                                                        Believers, The (1987) 
##                                                                    5.0000000 
##                                                 Whole Wide World, The (1996) 
##                                                                    4.0000000 
##                                                                 Touch (1997) 
##                                                                    5.0000000 
##                                                     Washington Square (1997) 
##                                                                    5.0000000 
##                                               Telling Lies in America (1997) 
##                                                                    5.0000000 
##                                                     Year of the Horse (1997) 
##                                                                    5.0000000 
##                                                     Winter Guest, The (1997) 
##                                                                    5.0000000 
##                                                             Afterglow (1997) 
##                                                                    4.0000000 
##                                                            Half Baked (1998) 
##                                                                    5.0000000 
##                                                      Dangerous Beauty (1998) 
##                                                                    5.0000000 
##                                                        Primary Colors (1998) 
##                                                                    3.0000000 
##                                                        Mercury Rising (1998) 
##                                                                    4.0000000 
##                                            City of Lost Children, The (1995) 
##                                                                    5.0000000 
##                                                 Farewell My Concubine (1993) 
##                                                                    0.7721519 
##                                                 Raise the Red Lantern (1991) 
##                                                                    0.7721519 
##                     Flower of My Secret, The (Flor de mi secreto, La) (1995) 
##                                                                    5.0000000 
##                                                         Paradise Road (1997) 
##                                                                    3.7500000 
##                                                           Brassed Off (1996) 
##                                                                    4.5000000 
##                                                           With Honors (1994) 
##                                                                    1.0000000 
##                                        Big Blue, The (Grand bleu, Le) (1988) 
##                                                                    4.6666667 
##                                                              Unzipped (1995) 
##                                                                    0.7721519 
##                                                         Pushing Hands (1992) 
##                                                                    4.3333333 
##                                                               Orlando (1993) 
##                                                                    0.7721519 
##                                                  Month by the Lake, A (1995) 
##                                                                    3.0000000 
##                                                Little Lord Fauntleroy (1936) 
##                                                                    1.0000000 
##                                                          Hear My Song (1991) 
##                                                                    5.0000000 
##                                                          Mediterraneo (1991) 
##                                                                    4.0000000 
##                                                         Grateful Dead (1995) 
##                                                                    5.0000000 
##                                                                  Fear (1996) 
##                                                                    4.0000000 
##                                                  Rich Man's Wife, The (1996) 
##                                                                    5.0000000 
##                                                        Kiss Me, Guido (1997) 
##                                                                    5.0000000 
##                                                           Clean Slate (1994) 
##                                                                    5.0000000 
##                                                   Waiting for Guffman (1996) 
##                                                                    5.0000000 
##                                                    I Shot Andy Warhol (1996) 
##                                                                    5.0000000 
##                                                  2 Days in the Valley (1996) 
##                                                                    5.0000000 
##                                                         Private Parts (1997) 
##                                                                    5.0000000 
##                                               Tie Me Up! Tie Me Down! (1990) 
##                                                                    5.0000000 
##                                                              Gaslight (1944) 
##                                                                   -1.2278481 
##                                                         Mrs. Dalloway (1997) 
##                                                                    5.0000000 
##                                                                Lassie (1994) 
##                                                                    3.0000000 
##                                                     Little Big League (1994) 
##                                                                    5.0000000 
##                                                            Just Cause (1995) 
##                                                                    5.0000000 
##                                                            Rent-a-Kid (1995) 
##                                                                    5.0000000 
##                                                            Paper, The (1994) 
##                                                                    5.0000000 
##                                                                Malice (1993) 
##                                                                    5.0000000 
##                                              Ghost and Mrs. Muir, The (1947) 
##                                                                    5.0000000 
##                                                        Associate, The (1996) 
##                                                                    3.0000000 
##                                                                Cronos (1992) 
##                                                                    0.7721519 
##                                          Adventures of Pinocchio, The (1996) 
##                                                                    5.0000000 
##                                                Four Days in September (1997) 
##                                                                    5.0000000 
##                                                         Koyaanisqatsi (1983) 
##                                                                    0.7721519 
##                                                                 Balto (1995) 
##                                                                    5.0000000 
##                               Star Maker, The (Uomo delle stelle, L') (1995) 
##                                                                    4.3333333 
##                                                    Living in Oblivion (1995) 
##                                                                    0.7721519 
##                                            Pyromaniac's Love Story, A (1995) 
##                                                                    5.0000000 
##                                                      Oliver & Company (1988) 
##                                                                    5.0000000 
##                                                   Celestial Clockwork (1994) 
##                                                                    2.0000000 
##                                                               Curdled (1996) 
##                                                                    5.0000000 
##                                                          Carried Away (1996) 
##                                                                    1.0000000 
##                                                         It's My Party (1995) 
##                                                                    5.0000000 
##                                                                Sliver (1993) 
##                                                                    5.0000000 
##                                                         Pete's Dragon (1977) 
##                                                                    4.0000000 
##                                                      Hate (Haine, La) (1995) 
##                                                                    5.0000000 
##                                                Flirting With Disaster (1996) 
##                                                                    0.7721519 
##                                    Red Firecracker, Green Firecracker (1994) 
##                                                                    0.7721519 
##                                                  What Happened Was... (1994) 
##                                                                    5.0000000 
##                                        C'est arrive pres de chez vous (1992) 
##                                                                    5.0000000 
##                                                             Firestorm (1998) 
##                                                                    5.0000000 
##                                                        Beyond Rangoon (1995) 
##                                                                    5.0000000 
##                                                         Feast of July (1995) 
##                                                                    5.0000000 
##                                                      Double Happiness (1994) 
##                                                                    4.0000000 
##                                    Mrs. Parker and the Vicious Circle (1994) 
##                                                                    5.0000000 
##                                                              Faithful (1996) 
##                                                                    5.0000000 
##                                                         Twelfth Night (1996) 
##                                                                   -2.2278481 
##                                                           Up in Smoke (1978) 
##                                                                    5.0000000 
##                                               They Made Me a Criminal (1939) 
##                                                                    4.2857143 
##                                                   Farewell to Arms, A (1932) 
##                                                                    5.0000000 
##                                                        Innocents, The (1961) 
##                                                                    4.0000000 
##                                        Heidi Fleiss: Hollywood Madam (1995)  
##                                                                    5.0000000 
##                                                        Jupiter's Wife (1994) 
##                                                                    5.0000000 
##                                                       Beautiful Thing (1996) 
##                                                                    3.5000000 
##                                                         War Room, The (1993) 
##                                                                    5.0000000 
##                                                            Hard Eight (1996) 
##                                                                    1.0000000 
##                                                             My Family (1995) 
##                                                                    4.0000000 
##                                                             Tom & Viv (1994) 
##                                                                    4.3333333 
##                                                             Walkabout (1971) 
##                                                                    4.0000000 
##                                                            Last Dance (1996) 
##                                                                    5.0000000 
##                                                     Original Gangstas (1996) 
##                                                                    3.0000000 
##                                                                 Cyclo (1995) 
##                                                                    3.3333333 
##                                       Fille seule, La (A Single Girl) (1995) 
##                                                                    3.6666667 
##                                                               Stalker (1979) 
##                                                                    5.0000000 
##                                                  Love & Human Remains (1993) 
##                                                                    5.0000000 
##                                                        Sum of Us, The (1994) 
##                                                                    5.0000000 
##                                                            Wild Reeds (1994) 
##                                                                    5.0000000 
##                                                                Caught (1996) 
##                                                                    5.0000000 
##                                                           Major Payne (1994) 
##                                                                    1.0000000 
##                                              Boys of St. Vincent, The (1993) 
##                                                                   -3.2278481 
##                                        Before the Rain (Pred dozhdot) (1994) 
##                                                                    5.0000000 
##                          Strawberry and Chocolate (Fresa y chocolate) (1993) 
##                                                                    5.0000000 
##                                     Savage Nights (Nuits fauves, Les) (1992) 
##                                                                    4.5000000 
##                                                           Purple Noon (1960) 
##                                                                    4.2000000 
##                                                                   Kim (1950) 
##                                                                    4.4000000 
##                                   Marlene Dietrich: Shadow and Light (1996)  
##                                                                    3.2500000 
##                                  Maybe, Maybe Not (Bewegte Mann, Der) (1994) 
##                                                                    5.0000000 
##                                                               Top Hat (1935) 
##                                                                    0.7721519 
##                                                    To Be or Not to Be (1942) 
##                                                                   -0.2278481 
##                                                                  Jade (1995) 
##                                                                    1.0000000 
##                                                         Kiss of Death (1995) 
##                                                                    5.0000000 
##                                                            Mixed Nuts (1994) 
##                                                                    5.0000000 
##                                                        Flesh and Bone (1993) 
##                                                                    5.0000000 
##                            In the Realm of the Senses (Ai no corrida) (1976) 
##                                                                    1.0000000 
##                                                        Goofy Movie, A (1995) 
##                                                                    1.0000000 
##                                              When a Man Loves a Woman (1994) 
##                                                                    5.0000000 
##                                                      King of the Hill (1993) 
##                                                                    5.0000000 
##                                         Under Siege 2: Dark Territory (1995) 
##                                                                    1.0000000 
##                                                      Marked for Death (1990) 
##                                                                    3.0000000 
##                                                Madonna: Truth or Dare (1991) 
##                                                                    5.0000000 
##                                                  Big Bang Theory, The (1994) 
##                                                                    1.0000000 
##                                             Other Voices, Other Rooms (1997) 
##                                                                    1.0000000 
##                                                            Gridlock'd (1997) 
##                                                                    0.7721519 
##                                                                 Blink (1994) 
##                                                                    5.0000000 
##                                                     For Love or Money (1993) 
##                                                                    1.0000000 
##                                                        A Chef in Love (1996) 
##                                                                    3.0000000 
##                                                 Contempt (Mepris, Le) (1963) 
##                                                                    5.0000000 
##                                                        Broken English (1996) 
##                                                                    5.0000000 
##                                                        Pie in the Sky (1995) 
##                                                                    3.0000000 
##                                                         Total Eclipse (1995) 
##                                                                    3.0000000 
##                                               Run of the Country, The (1995) 
##                                                                    5.0000000 
##                                                               Foxfire (1996) 
##                                                                    5.0000000 
##                               Bread and Chocolate (Pane e cioccolata) (1973) 
##                                                                    5.0000000 
##                                                           Bitter Moon (1992) 
##                                                                    5.0000000 
##                                                            Set It Off (1996) 
##                                                                    5.0000000 
##                                                          Gang Related (1997) 
##                                                                    5.0000000 
##                                                            Out to Sea (1997) 
##                                                                    4.0000000 
##                                                        Penny Serenade (1941) 
##                                                                    2.3333333 
##                                                               Stripes (1981) 
##                                                                    5.0000000 
##                                                         Late Bloomers (1996) 
##                                                                    5.0000000 
##                                                          Getaway, The (1994) 
##                                                                    5.0000000 
##                                                             Babyfever (1994) 
##                                                                    5.0000000 
##                                                 Very Natural Thing, A (1974) 
##                                                                    4.5000000 
##                                                    Walk in the Sun, A (1945) 
##                                                                    4.5000000 
##                                                     Waiting to Exhale (1995) 
##                                                                    5.0000000 
##                                                 Pompatus of Love, The (1996) 
##                                                                    5.0000000 
##                                                              Palmetto (1998) 
##                                                                    5.0000000 
##                                                  Horse Whisperer, The (1998) 
##                                                                    5.0000000 
##                                           Journey of August King, The (1995) 
##                                                                    1.0000000 
##                                                Metisse (Cafe au Lait) (1993) 
##                                                                    1.0000000 
##                                                                  Boys (1996) 
##                                                                    5.0000000 
##                                                              Captives (1994) 
##                                                                    5.0000000 
##                                                   Of Love and Shadows (1994) 
##                                                                    4.2000000 
##                                               An Unforgettable Summer (1994) 
##                                                                    2.0000000 
## My Life and Times With Antonin Artaud (En compagnie d'Antonin Artaud) (1993) 
##                                                                   -1.2278481 
##                                              Midnight Dancers (Sibak) (1994) 
##                                                                    5.0000000 
##                                                      Larger Than Life (1996) 
##                                                                    5.0000000 
##                                                            Two Deaths (1995) 
##                                                                    5.0000000 
##                          Day the Sun Turned Cold, The (Tianguo niezi) (1994) 
##                                                                    3.6666667 
##                                                                 1-900 (1994) 
##                                                                    4.0000000 
##                                                        Ed's Next Move (1996) 
##                                                                    3.6666667 
##                           Forbidden Christ, The (Cristo proibito, Il) (1950) 
##                                                                    4.4000000 
##                                                         Stranger, The (1994) 
##                                                                    3.0000000 
##                                                    Cement Garden, The (1993) 
##                                                                    2.0000000 
##                                                     Meet Wally Sparks (1997) 
##                                                                    5.0000000 
##                                                        Rhyme & Reason (1997) 
##                                                                    4.8571429 
##                                           Love and Other Catastrophes (1996) 
##                                                                    4.6666667 
##                                                          Losing Chase (1996) 
##                                                                    5.0000000 
##                                       Roseanna's Grave (For Roseanna) (1997) 
##                                                                    5.0000000 
##                                                Tetsuo II: Body Hammer (1992) 
##                                                                    5.0000000 
##                                                             Stonewall (1995) 
##                                                                    5.0000000 
##                                                                  Anna (1996) 
##                                                                    3.0000000 
##                                                         Picture Bride (1995) 
##                                                                    5.0000000 
##                                              Caro Diario (Dear Diary) (1994) 
##                                                                    5.0000000 
##                                                        Withnail and I (1987) 
##                                                                    5.0000000 
##                                                    Swan Princess, The (1994) 
##                                                                    5.0000000 
##                                                           Coldblooded (1995) 
##                                                                    5.0000000 
##                                                    Joy Luck Club, The (1993) 
##                                                                    4.0000000 
##                                          Gilligan's Island: The Movie (1998) 
##                                                                    5.0000000 
##                                          My Crazy Life (Mi vida loca) (1993) 
##                                                                    5.0000000 
##                                                                Suture (1993) 
##                                                                    5.0000000 
##                                                     Walking Dead, The (1995) 
##                                                                    1.0000000 
##                                                     Grace of My Heart (1996) 
##                                                                    3.0000000 
##                                                              SubUrbia (1997) 
##                                                                    5.0000000 
##                                                         Sliding Doors (1998) 
##                                                                    1.0000000 
##                                                         Shooting Fish (1997) 
##                                                                    4.0000000 
##                                               Steal Big, Steal Little (1995) 
##                                                                    1.5000000 
##                                                         House Party 3 (1994) 
##                                                                    5.0000000 
##                                                         Jason's Lyric (1994) 
##                                                                    3.0000000 
##                                                             8 Seconds (1994) 
##                                                                    2.0000000 
##                                                     Ladybird Ladybird (1994) 
##                                                                    5.0000000 
##                                                               Century (1993) 
##                                                                    4.5000000 
##                                                    My Favorite Season (1993) 
##                                                                    3.8571429 
##                                                       Golden Earrings (1947) 
##                                                                    4.0000000 
##                                                 Foreign Correspondent (1940) 
##                                                                    4.0000000 
##                                                     Lady of Burlesque (1943) 
##                                                                    4.5000000 
##                                                  Angel on My Shoulder (1946) 
##                                                                    4.5000000 
##                                                           Outlaw, The (1943) 
##                                                                    4.0000000 
##                                                        Beat the Devil (1954) 
##                                                                    5.0000000 
##                                                  Love Is All There Is (1996) 
##                                                                    4.5000000 
##                                                 Damsel in Distress, A (1937) 
##                                                                    4.5000000 
##                                                             Sleepover (1995) 
##                                                                    4.5000000 
##                                                     Here Comes Cookie (1935) 
##                                                                    4.5000000 
##                                                Thieves (Voleurs, Les) (1996) 
##                                                                    4.7500000 
##                                                             Boys, Les (1997) 
##                                                                    5.0000000 
##                                                     Margaret's Museum (1995) 
##                                                                    5.0000000 
##                                         Saint of Fort Washington, The (1993) 
##                                                                    5.0000000 
##                                                             Cure, The (1995) 
##                                                                    5.0000000 
##                                        Visitors, The (Visiteurs, Les) (1993) 
##                                                                    5.0000000 
##                                                  Little Princess, The (1939) 
##                                                                    3.0000000 
##                                                    Nina Takes a Lover (1994) 
##                                                                    5.0000000 
##                                                    Bhaji on the Beach (1993) 
##                                                                    5.0000000 
##                                                              Raw Deal (1948) 
##                                                                    5.0000000 
##                                           Gate of Heavenly Peace, The (1995) 
##                                                                    5.0000000 
##                                                   Colonel Chabert, Le (1994) 
##                                                                    5.0000000 
##                                                               Chasers (1994) 
##                                                                    5.0000000 
##                                                               Carpool (1996) 
##                                                                    3.0000000 
##                                                        Grosse Fatigue (1994) 
##                                                                    5.0000000 
##                         Prisoner of the Mountains (Kavkazsky Plennik) (1996) 
##                                                                    5.0000000 
##                                                     Bewegte Mann, Der (1994) 
##                                                                    4.7500000 
##                                           Killer: A Journal of Murder (1995) 
##                                                                    5.0000000 
##                                        Three Lives and Only One Death (1996) 
##                                                                    4.0000000 
##                                            Children of the Revolution (1996) 
##                                                                    4.3333333 
##                                                      Wings of Courage (1995) 
##                                                                    5.0000000 
##                                                     Wedding Gift, The (1994) 
##                                                                    5.0000000 
##                                                 Good Man in Africa, A (1994) 
##                                                                    5.0000000 
##                                                         Kaspar Hauser (1993) 
##                                                                    5.0000000 
##                                           Object of My Affection, The (1998) 
##                                                                    3.0000000 
##                                                               Witness (1985) 
##                                                                    5.0000000 
##                                                           Underground (1995) 
##                                                                    1.0000000 
##                           Far From Home: The Adventures of Yellow Dog (1995) 
##                                                                    4.3333333 
##                    I Don't Want to Talk About It (De eso no se habla) (1993) 
##                                                                    4.2000000 
##                                                             Enfer, L' (1994) 
##                                                                    5.0000000 
##                                                         Aiqing wansui (1994) 
##                                                                    5.0000000 
##                                                                  Cosi (1996) 
##                                                                    5.0000000 
##                                                   Scarlet Letter, The (1926) 
##                                                                    3.0000000 
##                                                                 Johns (1996) 
##                                                                    1.0000000 
##                                                          It Takes Two (1995) 
##                                                                    5.0000000 
##                                            Destiny Turns on the Radio (1995) 
##                                                                    5.0000000 
##                                   Secret Adventures of Tom Thumb, The (1993) 
##                                                                    5.0000000 
##                                         Clean Slate (Coup de Torchon) (1981) 
##                                                                    1.0000000 
##                           Spirits of the Dead (Tre passi nel delirio) (1968) 
##                                                                    4.0000000 
##                                                   Collectionneuse, La (1967) 
##                                                                    5.0000000 
##                                                        Duoluo tianshi (1995) 
##                                                                    3.8000000 
##                                                    Death in Brunswick (1991) 
##                                                                    4.5000000 
##                                                        Romper Stomper (1992) 
##                                                                    5.0000000 
##                                                Someone Else's America (1995) 
##                                                                    5.0000000 
##                                                          Guantanamera (1994) 
##                                                                    4.0000000 
##                                                         Office Killer (1997) 
##                                                                    5.0000000 
##                                                    He Walked by Night (1948) 
##                                                                    3.0000000 
##                                                         Love Serenade (1996) 
##                                                                    3.5714286 
##                                              Reluctant Debutante, The (1958) 
##                                                                    4.4000000 
##                                                    Warriors of Virtue (1997) 
##                                                                    5.0000000 
##                                                      King of New York (1990) 
##                                                                    5.0000000 
##                                                       All Things Fair (1996) 
##                                                                    5.0000000 
##                                                         Ceremonie, La (1995) 
##                                                                    4.3333333 
##                                                                  Hush (1998) 
##                                                                    1.0000000 
##                                                             Wife, The (1995) 
##                                                                    5.0000000 
##                                                     Some Mother's Son (1996) 
##                                                                    4.1666667 
##                            Entertaining Angels: The Dorothy Day Story (1996) 
##                                                                    4.0000000 
##                                                           Little City (1998) 
##                                                                    3.5000000 
##                                              Getting Away With Murder (1996) 
##                                                                    4.2500000 
##                                                           Small Faces (1995) 
##                                                                    4.2500000 
##                                                          New Age, The (1994) 
##                                                                    5.0000000 
##                                                    Further Gesture, A (1996) 
##                                                                    1.0000000 
##                                                                Mirage (1995) 
##                                                                    4.5555556 
##                                                            Mamma Roma (1962) 
##                                                                    4.5714286 
##                                                        Sunchaser, The (1996) 
##                                                                    5.0000000 
##                                                      War at Home, The (1996) 
##                                                                    5.0000000 
##                                                         Sweet Nothing (1995) 
##                                                                    5.0000000 
##                                                          You So Crazy (1994) 
##                                                                    5.0000000 
##                                    Scream of Stone (Schrei aus Stein) (1991) 
##                                                                    5.0000000
# con un total de valoraciones (iniciales y predichas)
rowCounts(recom.ini)
## 239 
## 514
# frente al numero inicial de valoraciones disponibles
rowCounts(r[x])
## 239 
## 158

La representación del resultado la podemos mostrar del siguiente modo:

ggplot(data = recomS, aes(x =item, y = rating)) + 
  geom_col() + coord_flip() + 
  labs(x = "",y="Valoracion",title="películas recomendadas") + 
  theme_bw()

Filtrado colaborativo basado en el usuario (method=“UBCF”)

Para predecir la valoración que un usuario \(u_x\) hará de un ítem cualquiera que todavía no ha valorado, se buscan usuarios con perfiles similares a \(u_x\) y se utilizan las valoraciones de estos otros usuarios sobre cada uno de los items no valorados por \(u_x\).

Seguimos exactamente los mismos pasos que en algoritmo previo. Creamos en primer lugar el modelo de recomendación:

x=239
# Creamos el modelo de recomendación
rec=Recommender(r[-x], method = "UBCF") 
rec
## Recommender of type 'UBCF' for 'realRatingMatrix' 
## learned using 942 users.
# que produce una serie de outputs
names(getModel(rec))
## [1] "description" "data"        "method"      "nn"          "sample"     
## [6] "normalize"   "verbose"

y a continuación podemos predecir directamente las 10 mejores recomendaciónes:

S=10
recom=predict(rec,MovieLense[x],n=S)
recomS=as(recom,"list")
head(recomS)
## $`239`
##  [1] "Titanic (1997)"                  "Kiss the Girls (1997)"          
##  [3] "Rock, The (1996)"                "In & Out (1997)"                
##  [5] "Game, The (1997)"                "Ransom (1996)"                  
##  [7] "Star Trek: First Contact (1996)" "Independence Day (ID4) (1996)"  
##  [9] "Scream 2 (1997)"                 "Time to Kill, A (1996)"

o seleccionar las mejores

recom3=bestN(recom,n=3)
as(recom3,"list")
## $`239`
## [1] "Titanic (1997)"        "Kiss the Girls (1997)" "Rock, The (1996)"

así como obtener todos los indices de recomendación predichos por el algoritmo:

recom=predict(rec,MovieLense[x],type="ratings")
recom.df=as(recom,"data.frame")
head(recom.df)
##   user                                                 item   rating
## 1  239                                     Toy Story (1995) 4.263358
## 2  239                                     GoldenEye (1995) 4.227848
## 3  239                                    Four Rooms (1995) 4.227848
## 4  239                                    Get Shorty (1995) 4.227848
## 5  239                                       Copycat (1995) 4.227848
## 6  239 Shanghai Triad (Yao a yao yao dao waipo qiao) (1995) 4.227848
recomS=recom.df %>% arrange(desc(rating)) %>% head(S)

o la matriz completa de valoraciones que incluyen las valoraciones disponibles y predichas para el usuario u_x

recom.ini=predict(rec,r[x], type="ratingMatrix") 
recom.ini
## 1 x 1664 rating matrix of class 'realRatingMatrix' with 1664 ratings.
as(recom.ini,"list")
## $`239`
##                                                                  Toy Story (1995) 
##                                                                         4.2633576 
##                                                                  GoldenEye (1995) 
##                                                                         4.2278481 
##                                                                 Four Rooms (1995) 
##                                                                         4.2278481 
##                                                                 Get Shorty (1995) 
##                                                                         4.2278481 
##                                                                    Copycat (1995) 
##                                                                         4.2278481 
##                              Shanghai Triad (Yao a yao yao dao waipo qiao) (1995) 
##                                                                         4.2278481 
##                                                             Twelve Monkeys (1995) 
##                                                                         4.2335989 
##                                                                       Babe (1995) 
##                                                                         0.7721519 
##                                                           Dead Man Walking (1995) 
##                                                                         0.7721519 
##                                                                Richard III (1995) 
##                                                                         0.7721519 
##                                                              Seven (Se7en) (1995) 
##                                                                         4.2278481 
##                                                        Usual Suspects, The (1995) 
##                                                                         0.7721519 
##                                                           Mighty Aphrodite (1995) 
##                                                                         4.2663030 
##                                                                Postino, Il (1994) 
##                                                                         0.7721519 
##                                                         Mr. Holland's Opus (1995) 
##                                                                         4.3309653 
##                                                French Twist (Gazon maudit) (1995) 
##                                                                         4.2278481 
##                                                        From Dusk Till Dawn (1996) 
##                                                                         4.2278481 
##                                                         White Balloon, The (1995) 
##                                                                         4.2278481 
##                                                             Antonia's Line (1995) 
##                                                                         4.2278481 
##                                                         Angels and Insects (1995) 
##                                                                         4.2278481 
##                                                     Muppet Treasure Island (1996) 
##                                                                         4.2278481 
##                                                                 Braveheart (1995) 
##                                                                         4.2278481 
##                                                                Taxi Driver (1976) 
##                                                                         4.2278481 
##                                                        Rumble in the Bronx (1995) 
##                                                                         4.2114913 
##                                                              Birdcage, The (1996) 
##                                                                         4.2074215 
##                                                     Brothers McMullen, The (1995) 
##                                                                         4.2278481 
##                                                                   Bad Boys (1995) 
##                                                                         4.2278481 
##                                                                  Apollo 13 (1995) 
##                                                                         4.2278481 
##                                                             Batman Forever (1995) 
##                                                                         4.2278481 
##                                                              Belle de jour (1967) 
##                                                                         4.2278481 
##                                                               Crimson Tide (1995) 
##                                                                         4.2278481 
##                                                                      Crumb (1994) 
##                                                                         4.2278481 
##                                                                  Desperado (1995) 
##                                                                         4.2278481 
##                                                       Doom Generation, The (1995) 
##                                                                         4.2278481 
##                                           Free Willy 2: The Adventure Home (1995) 
##                                                                         4.2278481 
##                                                                   Mad Love (1995) 
##                                                                         4.2278481 
##                                                                      Nadja (1994) 
##                                                                         4.2278481 
##                                                                   Net, The (1995) 
##                                                                         4.2278481 
##                                                               Strange Days (1995) 
##                                                                         0.7721519 
##                           To Wong Foo, Thanks for Everything! Julie Newmar (1995) 
##                                                                         4.2278481 
##                                                              Billy Madison (1995) 
##                                                                         4.2278481 
##                                                                     Clerks (1994) 
##                                                                         0.7721519 
##                                                                 Disclosure (1994) 
##                                                                         4.2278481 
##                                                          Dolores Claiborne (1994) 
##                                                                         4.2278481 
##                                                        Eat Drink Man Woman (1994) 
##                                                                         0.7721519 
##                                                                    Exotica (1994) 
##                                                                        -0.2278481 
##                                                                    Ed Wood (1994) 
##                                                                        -2.2278481 
##                                                                Hoop Dreams (1994) 
##                                                                         4.2278481 
##                                                                       I.Q. (1994) 
##                                                                         4.2278481 
##                                                                  Star Wars (1977) 
##                                                                         0.7721519 
##                                                        Legends of the Fall (1994) 
##                                                                         4.2278481 
##                                                Madness of King George, The (1994) 
##                                                                         4.2278481 
##                                                       Natural Born Killers (1994) 
##                                                                         4.2278481 
##                                                                   Outbreak (1995) 
##                                                                         4.2278481 
##                                                          Professional, The (1994) 
##                                                                         4.2278481 
##                                                               Pulp Fiction (1994) 
##                                                                        -0.2278481 
##                                                                     Priest (1994) 
##                                                                         4.2278481 
##                                                                  Quiz Show (1994) 
##                                                                         0.7721519 
##                                                          Three Colors: Red (1994) 
##                                                                         4.2278481 
##                                                         Three Colors: Blue (1993) 
##                                                                         4.2278481 
##                                                        Three Colors: White (1994) 
##                                                                         4.2278481 
##                                                                   Stargate (1994) 
##                                                                         4.2278481 
##                                                          Santa Clause, The (1994) 
##                                                                         4.2278481 
##                                                  Shawshank Redemption, The (1994) 
##                                                                        -3.2278481 
##                                                What's Eating Gilbert Grape (1993) 
##                                                                         0.7721519 
##                                                    While You Were Sleeping (1995) 
##                                                                         4.2278481 
##                                                 Ace Ventura: Pet Detective (1994) 
##                                                                         4.2278481 
##                                                                  Crow, The (1994) 
##                                                                         4.2278481 
##                                                               Forrest Gump (1994) 
##                                                                        -3.2278481 
##                                                Four Weddings and a Funeral (1994) 
##                                                                         4.2278481 
##                                                             Lion King, The (1994) 
##                                                                         4.2278481 
##                                                                  Mask, The (1994) 
##                                                                         4.2278481 
##                                                                   Maverick (1994) 
##                                                                         4.2278481 
##                                               Faster Pussycat! Kill! Kill! (1965) 
##                                                                         4.2278481 
##                           Brother Minister: The Assassination of Malcolm X (1994) 
##                                                                         4.2278481 
##                                                              Carlito's Way (1993) 
##                                                                         4.2278481 
##                                                                  Firm, The (1993) 
##                                                                         4.2278481 
##                                                                 Free Willy (1993) 
##                                                                         4.2278481 
##                                                              Fugitive, The (1993) 
##                                                                        -1.2278481 
##                                                       Hot Shots! Part Deux (1993) 
##                                                                         4.2278481 
##                                                       Hudsucker Proxy, The (1994) 
##                                                                        -1.2278481 
##                                                              Jurassic Park (1993) 
##                                                                         4.2278481 
##                                                     Much Ado About Nothing (1993) 
##                                                                         4.2278481 
##                                    Robert A. Heinlein's The Puppet Masters (1994) 
##                                                                         4.2278481 
##                                                                   Ref, The (1994) 
##                                                                         4.2278481 
##                                                    Remains of the Day, The (1993) 
##                                                                         4.2278481 
##                                                Searching for Bobby Fischer (1993) 
##                                                                         4.2278481 
##                                                       Sleepless in Seattle (1993) 
##                                                                         4.1829530 
##                                                               Blade Runner (1982) 
##                                                                        -0.2278481 
##                                               So I Married an Axe Murderer (1993) 
##                                                                         4.2278481 
##                                            Nightmare Before Christmas, The (1993) 
##                                                                        -0.2278481 
##                                                               True Romance (1993) 
##                                                                         4.2278481 
##                                                   Welcome to the Dollhouse (1995) 
##                                                                         4.2528116 
##                                                                 Home Alone (1990) 
##                                                                         4.2278481 
##                                                                    Aladdin (1992) 
##                                                                         4.2278481 
##                                                 Terminator 2: Judgment Day (1991) 
##                                                                         0.7721519 
##                                                         Dances with Wolves (1990) 
##                                                                         4.2278481 
##                                                  Silence of the Lambs, The (1991) 
##                                                                         0.7721519 
##                                            Snow White and the Seven Dwarfs (1937) 
##                                                                         4.2278481 
##                                                                      Fargo (1996) 
##                                                                        -1.2278481 
##                                                                Heavy Metal (1981) 
##                                                                         4.2278481 
##                                                            Aristocats, The (1970) 
##                                                                         4.2278481 
##                                                    All Dogs Go to Heaven 2 (1996) 
##                                                                         4.2278481 
##                                                               Theodore Rex (1995) 
##                                                                         4.2278481 
##                                                                 Sgt. Bilko (1996) 
##                                                                         4.2366410 
##                                                                 Diabolique (1996) 
##                                                                         4.1584946 
##                                                              Moll Flanders (1996) 
##                                                                         4.2278481 
##                                              Kids in the Hall: Brain Candy (1996) 
##                                                                         4.2278481 
##                                    Mystery Science Theater 3000: The Movie (1996) 
##                                                                         4.2278481 
##                                                       Operation Dumbo Drop (1995) 
##                                                                         4.2278481 
##                                               Truth About Cats & Dogs, The (1996) 
##                                                                         4.2382213 
##                                                                    Flipper (1996) 
##                                                                         4.2278481 
##                        Horseman on the Roof, The (Hussard sur le toit, Le) (1995) 
##                                                                         4.2278481 
##                            Wallace & Gromit: The Best of Aardman Animation (1996) 
##                                                                        -1.2278481 
##                                   Haunted World of Edward D. Wood Jr., The (1995) 
##                                                                         4.2278481 
##                                                          Cold Comfort Farm (1995) 
##                                                                         0.7721519 
##                                                                  Rock, The (1996) 
##                                                                         4.4096535 
##                                                                    Twister (1996) 
##                                                                         4.3229258 
##                                            Maya Lin: A Strong Clear Vision (1994) 
##                                                                         4.2278481 
##                                                                 Striptease (1996) 
##                                                                         4.1423927 
##                                                     Independence Day (ID4) (1996) 
##                                                                         4.3455759 
##                                                             Cable Guy, The (1996) 
##                                                                         4.1989573 
##                                                           Frighteners, The (1996) 
##                                                                         4.2366410 
##                                                                  Lone Star (1996) 
##                                                                         0.7721519 
##                                                                 Phenomenon (1996) 
##                                                                         4.2366410 
##                                                        Spitfire Grill, The (1996) 
##                                                                         4.2278481 
##                                                             Godfather, The (1972) 
##                                                                         4.1838636 
##                                                                   Supercop (1992) 
##                                                                         4.2278481 
##                                                                      Bound (1996) 
##                                                                         4.2278481 
##                                                                Kansas City (1996) 
##                                                                         4.2278481 
##                                                     Breakfast at Tiffany's (1961) 
##                                                                         4.2278481 
##                                                          Wizard of Oz, The (1939) 
##                                                                         0.7721519 
##                                                         Gone with the Wind (1939) 
##                                                                        -1.2278481 
##                                                               Citizen Kane (1941) 
##                                                                         0.7721519 
##                                                      2001: A Space Odyssey (1968) 
##                                                                         0.7721519 
##                                               Mr. Smith Goes to Washington (1939) 
##                                                                         4.2278481 
##                                                                  Big Night (1996) 
##                                                                         0.7721519 
##                                                       D3: The Mighty Ducks (1996) 
##                                                                         4.2278481 
##                                                              Love Bug, The (1969) 
##                                                                         4.2278481 
##                                     Homeward Bound: The Incredible Journey (1993) 
##                                                                         4.2278481 
##                                               20,000 Leagues Under the Sea (1954) 
##                                                                         4.2278481 
##                                                   Bedknobs and Broomsticks (1971) 
##                                                                         4.2278481 
##                                                        Sound of Music, The (1965) 
##                                                                         4.2278481 
##                                                                   Die Hard (1988) 
##                                                                         4.2278481 
##                                                         Lawnmower Man, The (1992) 
##                                                                         4.2278481 
##                                                           Unhook the Stars (1996) 
##                                                                         4.2278481 
##                                                   Long Kiss Goodnight, The (1996) 
##                                                                         4.2225147 
##                                                Ghost and the Darkness, The (1996) 
##                                                                         4.2278481 
##                                                                       Jude (1996) 
##                                                                         4.2278481 
##                                                                   Swingers (1996) 
##                                                                         0.7721519 
##                                      Willy Wonka and the Chocolate Factory (1971) 
##                                                                         4.1849467 
##                                                                    Sleeper (1973) 
##                                                                        -1.2278481 
##                                                       Fish Called Wanda, A (1988) 
##                                                                         4.2278481 
##                                               Monty Python's Life of Brian (1979) 
##                                                                         4.2278481 
##                                                              Dirty Dancing (1987) 
##                                                                         4.3068634 
##                                                             Reservoir Dogs (1992) 
##                                                                         4.2278481 
##                                                                    Platoon (1986) 
##                                                                         4.2278481 
##                                                        Weekend at Bernie's (1989) 
##                                                                         4.2278481 
##                                                             Basic Instinct (1992) 
##                                                                         4.2278481 
##                                                        Glengarry Glen Ross (1992) 
##                                                                         4.2278481 
##                                                                    Top Gun (1986) 
##                                                                         4.2278481 
##                                                             On Golden Pond (1981) 
##                                                                         0.7721519 
##                                            Return of the Pink Panther, The (1974) 
##                                                                         4.2278481 
##                                                                 Abyss, The (1989) 
##                                                                         4.2278481 
##                                                           Jean de Florette (1986) 
##                                                                         0.7721519 
##                                    Manon of the Spring (Manon des sources) (1986) 
##                                                                         4.2278481 
##                                                           Private Benjamin (1980) 
##                                                                         4.2278481 
##                                            Monty Python and the Holy Grail (1974) 
##                                                                        -0.2278481 
##                                                        Wrong Trousers, The (1993) 
##                                                                         4.2278481 
##                                                            Cinema Paradiso (1988) 
##                                                                         4.2278481 
##                                                               Delicatessen (1991) 
##                                                                         0.7721519 
##                                                   Empire Strikes Back, The (1980) 
##                                                                        -0.2278481 
##                                                        Princess Bride, The (1987) 
##                                                                         4.2278481 
##                                                    Raiders of the Lost Ark (1981) 
##                                                                        -0.2278481 
##                                                                     Brazil (1985) 
##                                                                         0.7721519 
##                                                                     Aliens (1986) 
##                                                                         4.2278481 
##                                            Good, The Bad and The Ugly, The (1966) 
##                                                                         4.2278481 
##                                                               12 Angry Men (1957) 
##                                                                         4.2278481 
##                                                        Clockwork Orange, A (1971) 
##                                                                         0.7721519 
##                                                             Apocalypse Now (1979) 
##                                                                         0.7721519 
##                                                         Return of the Jedi (1983) 
##                                                                        -1.2278481 
##                                                                 GoodFellas (1990) 
##                                                                         4.2278481 
##                                                                      Alien (1979) 
##                                                                         0.7721519 
##                                                           Army of Darkness (1993) 
##                                                                         4.2278481 
##                                                                     Psycho (1960) 
##                                                                        -0.2278481 
##                                                        Blues Brothers, The (1980) 
##                                                                        -3.2278481 
##                                                    Godfather: Part II, The (1974) 
##                                                                         0.7721519 
##                                                          Full Metal Jacket (1987) 
##                                                                         4.2278481 
##                                                           Grand Day Out, A (1992) 
##                                                                         4.2278481 
##                                                                    Henry V (1989) 
##                                                                        -3.2278481 
##                                                                    Amadeus (1984) 
##                                                                         4.2278481 
##                                                                Raging Bull (1980) 
##                                                                         4.2278481 
##                                                           Right Stuff, The (1983) 
##                                                                         4.2278481 
##                                                                 Sting, The (1973) 
##                                                                         0.7721519 
##                                                            Terminator, The (1984) 
##                                                                         0.7721519 
##                                                         Dead Poets Society (1989) 
##                                                                         4.2278481 
##                                                              Graduate, The (1967) 
##                                                                         4.2655600 
##                                                   Nikita (La Femme Nikita) (1990) 
##                                                                         0.7721519 
##                                              Bridge on the River Kwai, The (1957) 
##                                                                         4.2278481 
##                                                               Shining, The (1980) 
##                                                                         4.2278481 
##                                                               Evil Dead II (1987) 
##                                                                         4.2278481 
##                                                              Groundhog Day (1993) 
##                                                                         4.1765761 
##                                                                 Unforgiven (1992) 
##                                                                        -3.2278481 
##                                                         Back to the Future (1985) 
##                                                                        -1.2278481 
##                                                                     Patton (1970) 
##                                                                        -1.2278481 
##                                                                      Akira (1988) 
##                                                                         4.2278481 
##                                                         Cyrano de Bergerac (1990) 
##                                                                         0.7721519 
##                                                         Young Frankenstein (1974) 
##                                                                        -1.2278481 
##                                                         This Is Spinal Tap (1984) 
##                                                                         0.7721519 
##                                         Indiana Jones and the Last Crusade (1989) 
##                                                                        -0.2278481 
##                                                                    M*A*S*H (1970) 
##                                                                         4.2278481 
##                                         Unbearable Lightness of Being, The (1988) 
##                                                                         4.2278481 
##                                                        Room with a View, A (1986) 
##                                                                         4.2278481 
##                                                      Pink Floyd - The Wall (1982) 
##                                                                         4.2278481 
##                                                            Field of Dreams (1989) 
##                                                                         4.2278481 
##                                                    When Harry Met Sally... (1989) 
##                                                                         4.2242565 
##                                                      Bram Stoker's Dracula (1992) 
##                                                                         4.2278481 
##                                                                  Cape Fear (1991) 
##                                                                         4.2278481 
##                                                 Nightmare on Elm Street, A (1984) 
##                                                                         4.2278481 
##                                                  Mirror Has Two Faces, The (1996) 
##                                                                         4.2910791 
##                                                         Breaking the Waves (1996) 
##                                                                         0.7721519 
##                                                   Star Trek: First Contact (1996) 
##                                                                         4.3565726 
##                                                                Sling Blade (1996) 
##                                                                         4.2278481 
##                                                                   Ridicule (1996) 
##                                                                         4.2278481 
##                                                             101 Dalmatians (1996) 
##                                                                         4.2278481 
##                                                                 Die Hard 2 (1990) 
##                                                                         4.2278481 
##                                     Star Trek VI: The Undiscovered Country (1991) 
##                                                                         4.2278481 
##                                               Star Trek: The Wrath of Khan (1982) 
##                                                                        -2.2278481 
##                                        Star Trek III: The Search for Spock (1984) 
##                                                                         4.2278481 
##                                              Star Trek IV: The Voyage Home (1986) 
##                                                                         4.2278481 
##                                                             Batman Returns (1992) 
##                                                                         4.2278481 
##                                                                 Young Guns (1988) 
##                                                                         4.2278481 
##                                                                Under Siege (1992) 
##                                                                         4.2278481 
##                                                                       Jaws (1975) 
##                                                                        -1.2278481 
##                                                              Mars Attacks! (1996) 
##                                                                         4.1961088 
##                                                               Citizen Ruth (1996) 
##                                                                         4.2278481 
##                                                              Jerry Maguire (1996) 
##                                                                         4.2694527 
##                                                            Raising Arizona (1987) 
##                                                                         0.7721519 
##                                                                   Sneakers (1992) 
##                                                                         4.2278481 
##                                            Beavis and Butt-head Do America (1996) 
##                                                                         4.1631230 
##                                                  Last of the Mohicans, The (1992) 
##                                                                         4.2278481 
##                                                                      Kolya (1996) 
##                                                                         0.7721519 
##                                                              Jungle2Jungle (1997) 
##                                                                         4.0956681 
##                                                     Smilla's Sense of Snow (1997) 
##                                                                         4.2278481 
##                                                           Devil's Own, The (1997) 
##                                                                         4.1255248 
##                                                                Chasing Amy (1997) 
##                                                                         4.2278481 
##                                               Turbo: A Power Rangers Movie (1997) 
##                                                                         4.2278481 
##                                                        Grosse Pointe Blank (1997) 
##                                                                         4.2278481 
##                                Austin Powers: International Man of Mystery (1997) 
##                                                                         4.2278481 
##                                                         Fifth Element, The (1997) 
##                                                                         4.2278481 
##                                                            Shall We Dance? (1996) 
##                                                                         4.2278481 
##                                             Lost World: Jurassic Park, The (1997) 
##                                                                         4.1736373 
##                                                           Pillow Book, The (1995) 
##                                                                         4.2278481 
##                                                             Batman & Robin (1997) 
##                                                                         4.1736373 
##                                                   My Best Friend's Wedding (1997) 
##                                                                         4.2939165 
##                               When the Cats Away (Chacun cherche son chat) (1996) 
##                                                                         4.2278481 
##                                                               Men in Black (1997) 
##                                                                         4.2915942 
##                                                                    Contact (1997) 
##                                                                         4.2160150 
##                                                       George of the Jungle (1997) 
##                                                                         4.0611292 
##                                                              Event Horizon (1997) 
##                                                                         4.2233804 
##                                                                    Air Bud (1997) 
##                                                                         4.2090738 
##                                                      In the Company of Men (1997) 
##                                                                         4.2278481 
##                                                                      Steel (1997) 
##                                                                         4.2492647 
##                                                                      Mimic (1997) 
##                                                                         4.1165146 
##                                                  Hunt for Red October, The (1990) 
##                                                                         4.2278481 
##                                                         Kull the Conqueror (1997) 
##                                                                         4.1323339 
##                                                                           unknown 
##                                                                         4.2503773 
##                                                            Full Monty, The (1997) 
##                                                                         0.7721519 
##                                                                    Gattaca (1997) 
##                                                                         4.3023843 
##                                                          Starship Troopers (1997) 
##                                                                         4.3336835 
##                                                          Good Will Hunting (1997) 
##                                                                         0.7721519 
##                                                                       Heat (1995) 
##                                                                         4.1660351 
##                                                                    Sabrina (1995) 
##                                                                         4.2125068 
##                                                      Sense and Sensibility (1995) 
##                                                                         4.2973838 
##                                                          Leaving Las Vegas (1995) 
##                                                                         0.7721519 
##                                                                Restoration (1995) 
##                                                                         4.2278481 
##                                                               Bed of Roses (1996) 
##                                                                         4.2127054 
##                                   Once Upon a Time... When We Were Colored (1995) 
##                                                                         4.2278481 
##                                                      Up Close and Personal (1996) 
##                                                                         4.2411015 
##                                                            River Wild, The (1994) 
##                                                                         4.1986574 
##                                                            Time to Kill, A (1996) 
##                                                                         4.3398205 
##                                                                       Emma (1996) 
##                                                                         4.2389401 
##                                                                    Tin Cup (1996) 
##                                                                         4.2225656 
##                                                             Secrets & Lies (1996) 
##                                                                         4.2562442 
##                                                       English Patient, The (1996) 
##                                                                        -3.2278481 
##                                                              Marvin's Room (1996) 
##                                                                         4.2278481 
##                                                                     Scream (1996) 
##                                                                        -2.2278481 
##                                                                      Evita (1996) 
##                                                                         4.1262885 
##                                                           Fierce Creatures (1997) 
##                                                                         4.1761539 
##                                                             Absolute Power (1997) 
##                                                                         4.1694466 
##                                                                   Rosewood (1997) 
##                                                                         4.1421443 
##                                                              Donnie Brasco (1997) 
##                                                                         4.2278481 
##                                                                  Liar Liar (1997) 
##                                                                         4.2119926 
##                                                                  Breakdown (1997) 
##                                                                         4.2278481 
##                                                               Promesse, La (1996) 
##                                                                         4.2278481 
##                                                                Ulee's Gold (1997) 
##                                                                         4.2278481 
##                                                                   Face/Off (1997) 
##                                                                         4.2385597 
##                                                                    Hoodlum (1997) 
##                                                                         4.2139428 
##                                                              Air Force One (1997) 
##                                                                        -3.2278481 
##                                                                   In & Out (1997) 
##                                                                         4.4014956 
##                                                          L.A. Confidential (1997) 
##                                                                         4.3169068 
##                                                              Fly Away Home (1996) 
##                                                                        -3.2278481 
##                                                             Ice Storm, The (1997) 
##                                                                        -0.2278481 
##                                       Mrs. Brown (Her Majesty, Mrs. Brown) (1997) 
##                                                                         4.2741705 
##                                                      Devil's Advocate, The (1997) 
##                                                                         4.1806665 
##                                                    FairyTale: A True Story (1997) 
##                                                                         4.1355629 
##                                                                   Deceiver (1997) 
##                                                                         4.2819082 
##                                                             Rainmaker, The (1997) 
##                                                                         4.2810828 
##                                                     Wings of the Dove, The (1997) 
##                                                                         4.2278481 
##                                    Midnight in the Garden of Good and Evil (1997) 
##                                                                        -2.2278481 
##                                                                    Titanic (1997) 
##                                                                         4.5256157 
##                                       3 Ninjas: High Noon At Mega Mountain (1998) 
##                                                                         4.2278481 
##                                                                  Apt Pupil (1998) 
##                                                                         4.2219476 
##                                                         As Good As It Gets (1997) 
##                                                                         4.2469180 
##                                                  In the Name of the Father (1993) 
##                                                                         0.7721519 
##                                                           Schindler's List (1993) 
##                                                                        -3.2278481 
##                                                   Everyone Says I Love You (1996) 
##                                                                         4.1433977 
##                       Paradise Lost: The Child Murders at Robin Hood Hills (1996) 
##                                                                         4.2278481 
##                                                                     Mother (1996) 
##                                                                         4.1249305 
##                                                             Murder at 1600 (1997) 
##                                                                         4.0975162 
##                                                               Dante's Peak (1997) 
##                                                                         4.0193049 
##                                                               Lost Highway (1997) 
##                                                                         4.2278481 
##                                                                      Crash (1996) 
##                                                                         4.2278481 
##                                                                  G.I. Jane (1997) 
##                                                                         4.0809538 
##                                                                   Cop Land (1997) 
##                                                                         4.1304569 
##                                                          Conspiracy Theory (1997) 
##                                                                         4.2211004 
##                                                         Desperate Measures (1998) 
##                                                                         4.2469838 
##                                                                        187 (1997) 
##                                                                         4.2794774 
##                                                                  Edge, The (1997) 
##                                                                         4.2888772 
##                                                             Kiss the Girls (1997) 
##                                                                         4.4408771 
##                                                                  Game, The (1997) 
##                                                                         4.3965929 
##                                                                     U Turn (1997) 
##                                                                         4.1610190 
##                                                         How to Be a Player (1997) 
##                                                                         4.2381740 
##                                                                Playing God (1997) 
##                                                                         4.0570257 
##                                                          House of Yes, The (1997) 
##                                                                         4.2278481 
##                                                                       Bean (1997) 
##                                                                         4.0446437 
##                                                                   Mad City (1997) 
##                                                                         4.2063572 
##                                                              Boogie Nights (1997) 
##                                                                         0.7721519 
##                                                              Critical Care (1997) 
##                                                                         4.2560358 
##                                               Man Who Knew Too Little, The (1997) 
##                                                                         4.1479860 
##                                                        Alien: Resurrection (1997) 
##                                                                         4.2450426 
##                                                               Apostle, The (1997) 
##                                                                         4.2834686 
##                                                       Deconstructing Harry (1997) 
##                                                                         4.2278481 
##                                                               Jackie Brown (1997) 
##                                                                         4.2281437 
##                                                                Wag the Dog (1997) 
##                                                                         4.2940425 
##                                                                  Hard Rain (1998) 
##                                                                         4.2411418 
##                                                                     Fallen (1998) 
##                                                                         4.3142373 
##                                                           Prophecy II, The (1998) 
##                                                                         4.2046329 
##                                                                Spice World (1997) 
##                                                                         4.2278481 
##                                                                Deep Rising (1998) 
##                                                                         4.2278481 
##                                                        Wedding Singer, The (1998) 
##                                                                         4.2649755 
##                                                                     Sphere (1998) 
##                                                                         4.1279300 
##                                                                Client, The (1994) 
##                                                                         4.2278481 
##                                            One Flew Over the Cuckoo's Nest (1975) 
##                                                                         4.2278481 
##                                                                      Spawn (1997) 
##                                                                         4.0133432 
##                                                            Assignment, The (1997) 
##                                                                         4.2560358 
##                                                                 Wonderland (1997) 
##                                                                         4.2278481 
##                                                                  Incognito (1997) 
##                                                                         4.2516413 
##                                                        Blues Brothers 2000 (1998) 
##                                                                         4.2278481 
##                                                               Sudden Death (1995) 
##                                                                         4.2492568 
##                                             Ace Ventura: When Nature Calls (1995) 
##                                                                         4.2278481 
##                                                                     Powder (1995) 
##                                                                         4.2278481 
##                                                            Dangerous Minds (1995) 
##                                                                         4.2278481 
##                                                                   Clueless (1995) 
##                                                                         4.2278481 
##                                                                   Bio-Dome (1996) 
##                                                                         4.2278481 
##                                                                Black Sheep (1996) 
##                                                                         4.2278481 
##                                                                Mary Reilly (1996) 
##                                                                         4.2278481 
##                                             Bridges of Madison County, The (1995) 
##                                                                         4.2655600 
##                                                                    Jeffrey (1995) 
##                                                                         4.2278481 
##                                                                Judge Dredd (1995) 
##                                                                         4.2278481 
##                                    Mighty Morphin Power Rangers: The Movie (1995) 
##                                                                         4.2278481 
##                                                                  Showgirls (1995) 
##                                                                         4.2278481 
##                                                                 Houseguest (1994) 
##                                                                         4.2278481 
##                                                               Heavyweights (1994) 
##                                                                         4.2278481 
##                                                     Miracle on 34th Street (1994) 
##                                                                         4.2278481 
##                                Tales From the Crypt Presents: Demon Knight (1995) 
##                                                                         4.2278481 
##                                                     Star Trek: Generations (1994) 
##                                                                         4.2278481 
##                                                           Muriel's Wedding (1994) 
##                                                                         4.2242565 
##                          Adventures of Priscilla, Queen of the Desert, The (1994) 
##                                                                        -1.2278481 
##                                                           Flintstones, The (1994) 
##                                                                         4.2278481 
##                                         Naked Gun 33 1/3: The Final Insult (1994) 
##                                                                         4.2278481 
##                                                                  True Lies (1994) 
##                                                                         4.2278481 
##                                                       Addams Family Values (1993) 
##                                                                         4.2278481 
##                                                      Age of Innocence, The (1993) 
##                                                                         4.2242565 
##                                                      Beverly Hills Cop III (1994) 
##                                                                         4.2278481 
##                                                               Black Beauty (1994) 
##                                                                         4.2278481 
##                                                        Fear of a Black Hat (1993) 
##                                                                         4.2278481 
##                                                           Last Action Hero (1993) 
##                                                                         4.2278481 
##                                                    Man Without a Face, The (1993) 
##                                                                         4.2278481 
##                                                             Mrs. Doubtfire (1993) 
##                                                                         4.2278481 
##                                                          Radioland Murders (1994) 
##                                                                         4.2278481 
##                                                  Robin Hood: Men in Tights (1993) 
##                                                                         4.2278481 
##                                                                 Serial Mom (1994) 
##                                                                         4.2278481 
##                                                          Striking Distance (1993) 
##                                                                         4.2278481 
##                                                          Super Mario Bros. (1993) 
##                                                                         4.2278481 
##                                                      Three Musketeers, The (1993) 
##                                                                         4.2278481 
##                                                        Little Rascals, The (1994) 
##                                                                         4.2278481 
##                                                     Brady Bunch Movie, The (1995) 
##                                                                         4.2278481 
##                                                                      Ghost (1990) 
##                                                                         4.3068634 
##                                                                     Batman (1989) 
##                                                                         4.2278481 
##                                                                  Pinocchio (1940) 
##                                                                         4.2278481 
##                                                        Mission: Impossible (1996) 
##                                                                         4.3046937 
##                                                                    Thinner (1996) 
##                                                                         4.2278481 
##                                                                   Spy Hard (1996) 
##                                                                         4.2278481 
##                                                             Close Shave, A (1995) 
##                                                                         4.2278481 
##                                                                       Jack (1996) 
##                                                                         4.1997980 
##                                                                    Kingpin (1996) 
##                                                                         4.2278481 
##                                                       Nutty Professor, The (1996) 
##                                                                         4.2370558 
##                                                       Very Brady Sequel, A (1996) 
##                                                                         4.1485535 
##                           Tales from the Crypt Presents: Bordello of Blood (1996) 
##                                                                         4.2278481 
##                                                           My Favorite Year (1982) 
##                                                                         4.2278481 
##                                                   Apple Dumpling Gang, The (1975) 
##                                                                         4.2278481 
##                                                                 Old Yeller (1957) 
##                                                                         4.2278481 
##                                                           Parent Trap, The (1961) 
##                                                                         4.2278481 
##                                                                 Cinderella (1950) 
##                                                                         4.2278481 
##                                                               Mary Poppins (1964) 
##                                                                        -1.2278481 
##                                                        Alice in Wonderland (1951) 
##                                                                         4.2278481 
##                                     William Shakespeare's Romeo and Juliet (1996) 
##                                                                         0.7721519 
##                                            Aladdin and the King of Thieves (1996) 
##                                                                         4.2278481 
##                                                 E.T. the Extra-Terrestrial (1982) 
##                                                                         4.2278481 
##                                        Children of the Corn: The Gathering (1996) 
##                                                                         4.1736373 
##                                                                Bob Roberts (1992) 
##                                                                         4.2278481 
##                                               Transformers: The Movie, The (1986) 
##                                                                         4.2278481 
##                                                      To Kill a Mockingbird (1962) 
##                                                                         0.7721519 
##                                                           Harold and Maude (1971) 
##                                                                         0.7721519 
##                                             Day the Earth Stood Still, The (1951) 
##                                                                         4.2278481 
##                                                                  Duck Soup (1933) 
##                                                                        -1.2278481 
##                                                                 Highlander (1986) 
##                                                                         4.2278481 
##                                                                   Fantasia (1940) 
##                                                                         0.7721519 
##                                                                   Heathers (1989) 
##                                                                         0.7721519 
##                                                           Forbidden Planet (1956) 
##                                                                         0.7721519 
##                                         Butch Cassidy and the Sundance Kid (1969) 
##                                                                         4.2278481 
##                                            American Werewolf in London, An (1981) 
##                                                                         4.2278481 
##                                           Amityville 1992: It's About Time (1992) 
##                                                                         4.2278481 
##                                                             Amityville 3-D (1983) 
##                                                                         4.2278481 
##                                               Amityville: A New Generation (1993) 
##                                                                         4.2278481 
##                                              Amityville II: The Possession (1982) 
##                                                                         4.2278481 
##                                                     Amityville Horror, The (1979) 
##                                                                         4.2278481 
##                                                      Amityville Curse, The (1990) 
##                                                                         4.2278481 
##                                                                 Birds, The (1963) 
##                                                                         0.7721519 
##                                                                  Blob, The (1958) 
##                                                                         4.2278481 
##                                                         Body Snatcher, The (1945) 
##                                                                         4.2278481 
##                                                            Burnt Offerings (1976) 
##                                                                         4.2278481 
##                                                                     Carrie (1976) 
##                                                                         4.2278481 
##                                                                  Omen, The (1976) 
##                                                                         4.2278481 
##                                              Star Trek: The Motion Picture (1979) 
##                                                                         4.2278481 
##                                            Star Trek V: The Final Frontier (1989) 
##                                                                         4.2278481 
##                                                                     Grease (1978) 
##                                                                         4.1829530 
##                                                                     Jaws 2 (1978) 
##                                                                         4.2278481 
##                                                                   Jaws 3-D (1983) 
##                                                                         4.2278481 
##                                                    Bastard Out of Carolina (1996) 
##                                                                         4.2278481 
##                                                 Jackie Chan's First Strike (1996) 
##                                                                         4.2009797 
##                                                        Beverly Hills Ninja (1997) 
##                                                                         4.2278481 
##                                                   Free Willy 3: The Rescue (1997) 
##                                                                         4.2278481 
##                                                                      Nixon (1995) 
##                                                                         4.2278481 
##                                                   Cry, the Beloved Country (1995) 
##                                                                         4.2278481 
##                                                        Crossing Guard, The (1995) 
##                                                                         4.2278481 
##                                                                      Smoke (1995) 
##                                                                         4.2278481 
##                        Like Water For Chocolate (Como agua para chocolate) (1992) 
##                                                                         0.7721519 
##                                                  Secret of Roan Inish, The (1994) 
##                                                                         0.7721519 
##                                                       Vanya on 42nd Street (1994) 
##                                                                         4.2278481 
##                                                           Jungle Book, The (1994) 
##                                                                         4.2278481 
##                                                              Red Rock West (1992) 
##                                                                         4.2278481 
##                                                              Bronx Tale, A (1993) 
##                                                                         4.2278481 
##                                                                       Rudy (1993) 
##                                                                         4.2278481 
##                                                                 Short Cuts (1993) 
##                                                                         4.2278481 
##                                                                  Tombstone (1993) 
##                                                                         4.2278481 
##                                                         Courage Under Fire (1996) 
##                                                                         4.3079341 
##                                                                Dragonheart (1996) 
##                                                                         4.2366410 
##                                                  James and the Giant Peach (1996) 
##                                                                         4.2249996 
##       Dr. Strangelove or: How I Learned to Stop Worrying and Love the Bomb (1963) 
##                                                                         0.7721519 
##                                                              Trainspotting (1996) 
##                                                                         0.7721519 
##                                                      First Wives Club, The (1996) 
##                                                                         4.2868884 
##                                                                    Matilda (1996) 
##                                                                         4.1765761 
##                                                    Philadelphia Story, The (1940) 
##                                                                         0.7721519 
##                                                                    Vertigo (1958) 
##                                                                         0.7721519 
##                                                         North by Northwest (1959) 
##                                                                         4.2514055 
##                                                             Apartment, The (1960) 
##                                                                         4.2278481 
##                                                           Some Like It Hot (1959) 
##                                                                        -1.2278481 
##                                                                 Casablanca (1942) 
##                                                                         0.7721519 
##                                                        Maltese Falcon, The (1941) 
##                                                                         0.7721519 
##                                                               My Fair Lady (1964) 
##                                                                         4.2278481 
##                                                                    Sabrina (1954) 
##                                                                         4.2278481 
##                                                              Roman Holiday (1953) 
##                                                                         4.2278481 
##                                                               Sunset Blvd. (1950) 
##                                                                         0.7721519 
##                                                                  Notorious (1946) 
##                                                                         0.7721519 
##                                                           To Catch a Thief (1955) 
##                                                                         4.2278481 
##                                              Adventures of Robin Hood, The (1938) 
##                                                                         0.7721519 
##                                                               East of Eden (1955) 
##                                                                        -1.2278481 
##                                                              Thin Man, The (1934) 
##                                                                         0.7721519 
##                                                            His Girl Friday (1940) 
##                                                                         4.2278481 
##                                                Around the World in 80 Days (1956) 
##                                                                         4.2278481 
##                                                      It's a Wonderful Life (1946) 
##                                                                         4.2278481 
##                                                           Bringing Up Baby (1938) 
##                                                                        -0.2278481 
##                                                         African Queen, The (1951) 
##                                                                        -0.2278481 
##                                                      Cat on a Hot Tin Roof (1958) 
##                                                                         0.7721519 
##                                                                      Dumbo (1941) 
##                                                                         4.2278481 
##                                                                    Bananas (1971) 
##                                                                         4.2278481 
##                                                             Candidate, The (1972) 
##                                                                         4.2278481 
##                                                           Bonnie and Clyde (1967) 
##                                                                        -0.2278481 
##                                                          Dial M for Murder (1954) 
##                                                                         0.7721519 
##                                                      Rebel Without a Cause (1955) 
##                                                                         4.2278481 
##                                                  Streetcar Named Desire, A (1951) 
##                                                                         0.7721519 
##                                                People vs. Larry Flynt, The (1996) 
##                                                                         0.7721519 
##                                                               My Left Foot (1989) 
##                                                                         0.7721519 
##                                                     Magnificent Seven, The (1954) 
##                                                                         4.2278481 
##                                                         Lawrence of Arabia (1962) 
##                                                                         0.7721519 
##                                                            Wings of Desire (1987) 
##                                                                         0.7721519 
##                                                             Third Man, The (1949) 
##                                                                         0.7721519 
##                                                                 Annie Hall (1977) 
##                                                                        -3.2278481 
##                                                                  Boot, Das (1981) 
##                                                                         4.2833761 
##                                                                 Local Hero (1983) 
##                                                                         0.7721519 
##                                                                  Manhattan (1979) 
##                                                                         4.2278481 
##                                                          Miller's Crossing (1990) 
##                                                                        -1.2278481 
##                                          Treasure of the Sierra Madre, The (1948) 
##                                                                         4.2278481 
##                                                          Great Escape, The (1963) 
##                                                                         4.2278481 
##                                                           Deer Hunter, The (1978) 
##                                                                         4.2278481 
##                                                                Down by Law (1986) 
##                                                                         4.2278481 
##                                                             Cool Hand Luke (1967) 
##                                                                         4.2278481 
##                                                        Great Dictator, The (1940) 
##                                                                         4.2278481 
##                                                             Big Sleep, The (1946) 
##                                                                         4.2278481 
##                                                                    Ben-Hur (1959) 
##                                                                         4.2278481 
##                                                                     Gandhi (1982) 
##                                                                         0.7721519 
##                                                        Killing Fields, The (1984) 
##                                                                         0.7721519 
##                                       My Life as a Dog (Mitt liv som hund) (1985) 
##                                                                         0.7721519 
##                                                 Man Who Would Be King, The (1975) 
##                                                                         0.7721519 
##                                                                      Shine (1996) 
##                                                                         0.7721519 
##                                                 Kama Sutra: A Tale of Love (1996) 
##                                                                         4.2278481 
##                                                           Daytrippers, The (1996) 
##                                                                         4.2278481 
##                                                                  Traveller (1997) 
##                                                                         4.2278481 
##                                                           Addicted to Love (1997) 
##                                                                         4.2278481 
##                                                                    Ponette (1996) 
##                                                                         4.2278481 
##                                                       My Own Private Idaho (1991) 
##                                                                         4.2278481 
##                                                                  Anastasia (1997) 
##                                                                         4.2596741 
##                                                                 Mouse Hunt (1997) 
##                                                                         4.2278481 
##                                                                Money Train (1995) 
##                                                                         4.2278481 
##                                                              Mortal Kombat (1995) 
##                                                                         4.2278481 
##                                                                 Pocahontas (1995) 
##                                                                         4.2278481 
##                                                            Miserables, Les (1995) 
##                                                                         4.2278481 
##                                    Things to Do in Denver when You're Dead (1995) 
##                                                                         4.2278481 
##                                                        Vampire in Brooklyn (1995) 
##                                                                         4.2278481 
##                                                               Broken Arrow (1996) 
##                                                                         4.1905558 
##                                             Young Poisoner's Handbook, The (1995) 
##                                                                         4.2278481 
##                                                 NeverEnding Story III, The (1994) 
##                                                                         4.2278481 
##                                                                    Rob Roy (1995) 
##                                                                         4.2278481 
##                                                 Die Hard: With a Vengeance (1995) 
##                                                                         4.2278481 
##                                                          Lord of Illusions (1995) 
##                                                                         4.2278481 
##                                                                    Species (1995) 
##                                                                         4.2278481 
##                                                      Walk in the Clouds, A (1995) 
##                                                                         4.2278481 
##                                                                 Waterworld (1995) 
##                                                                         4.2278481 
##                                                         White Man's Burden (1995) 
##                                                                         4.2278481 
##                                                                  Wild Bill (1995) 
##                                                                         4.2278481 
##                                                     Farinelli: il castrato (1994) 
##                                                                         4.2278481 
##                                                         Heavenly Creatures (1994) 
##                                                                         0.7721519 
##                                                 Interview with the Vampire (1994) 
##                                                                         4.2278481 
##                                              Kid in King Arthur's Court, A (1995) 
##                                                                         4.2278481 
##                                                Mary Shelley's Frankenstein (1994) 
##                                                                         4.2278481 
##                                                    Quick and the Dead, The (1995) 
##                                                                         4.2278481 
##                                              Stephen King's The Langoliers (1995) 
##                                                                         4.2278481 
##                                                        Tales from the Hood (1995) 
##                                                                         4.2278481 
##                                                      Village of the Damned (1995) 
##                                                                         4.2278481 
##                                                   Clear and Present Danger (1994) 
##                                                                         4.2278481 
##                                                 Wes Craven's New Nightmare (1994) 
##                                                                         4.2278481 
##                                                                      Speed (1994) 
##                                                                         4.2278481 
##                                                                       Wolf (1994) 
##                                                                         4.2278481 
##                                                                 Wyatt Earp (1994) 
##                                                                         4.2278481 
##                                                           Another Stakeout (1993) 
##                                                                         4.2278481 
##                                                                 Blown Away (1994) 
##                                                                         4.2278481 
##                                                             Body Snatchers (1993) 
##                                                                         4.2278481 
##                                                              Boxing Helena (1993) 
##                                                                         4.2278481 
##                               City Slickers II: The Legend of Curly's Gold (1994) 
##                                                                         4.2278481 
##                                                                Cliffhanger (1993) 
##                                                                         4.2278481 
##                                                                  Coneheads (1993) 
##                                                                         4.2278481 
##                                                             Demolition Man (1993) 
##                                                                         4.2278481 
##                                                             Fatal Instinct (1993) 
##                                                                         4.2278481 
##               Englishman Who Went Up a Hill, But Came Down a Mountain, The (1995) 
##                                                                         4.2278481 
##                                                                 Kalifornia (1993) 
##                                                                         4.2278481 
##                                                                 Piano, The (1993) 
##                                                                         4.2278481 
##                                                          Romeo Is Bleeding (1993) 
##                                                                         4.2278481 
##                                                         Secret Garden, The (1993) 
##                                                                         4.2278481 
##                                                                 Son in Law (1993) 
##                                                                         4.2278481 
##                                                          Terminal Velocity (1994) 
##                                                                         4.2278481 
##                                                       Hour of the Pig, The (1993) 
##                                                                         4.2278481 
##                                                       Beauty and the Beast (1991) 
##                                                                         4.2278481 
##                                                            Wild Bunch, The (1969) 
##                                                                        -1.2278481 
##                                                      Hellraiser: Bloodline (1996) 
##                                                                         4.2278481 
##                                                                Primal Fear (1996) 
##                                                                         4.2143308 
##                                                                 True Crime (1995) 
##                                                                         4.2278481 
##                                                                 Stalingrad (1993) 
##                                                                         4.2278481 
##                                                                      Heavy (1995) 
##                                                                         4.2278481 
##                                                                   Fan, The (1996) 
##                                                                         4.2278481 
##                                               Hunchback of Notre Dame, The (1996) 
##                                                                         4.2278481 
##                                                                     Eraser (1996) 
##                                                                         4.2193414 
##                                                           Big Squeeze, The (1996) 
##                                                                         4.2278481 
##                                 Police Story 4: Project S (Chao ji ji hua) (1993) 
##                                                                         4.2278481 
##                                             Daniel Defoe's Robinson Crusoe (1996) 
##                                                                         4.2278481 
##                                                    For Whom the Bell Tolls (1943) 
##                                                                         4.2278481 
##                                                      American in Paris, An (1951) 
##                                                                         4.2278481 
##                                                                Rear Window (1954) 
##                                                                         0.7721519 
##                                                      It Happened One Night (1934) 
##                                                                         4.2514055 
##                                                       Meet Me in St. Louis (1944) 
##                                                                        -0.2278481 
##                                                              All About Eve (1950) 
##                                                                         4.2278481 
##                                                                    Rebecca (1940) 
##                                                                         4.2278481 
##                                                                 Spellbound (1945) 
##                                                                         4.2278481 
##                                                        Father of the Bride (1950) 
##                                                                         4.2278481 
##                                                                       Gigi (1958) 
##                                                                         4.2278481 
##                                                                      Laura (1944) 
##                                                                         4.2278481 
##                                                               Lost Horizon (1937) 
##                                                                         0.7721519 
##                                                             My Man Godfrey (1936) 
##                                                                         4.2278481 
##                                                                      Giant (1956) 
##                                                                         4.2278481 
##                                                              39 Steps, The (1935) 
##                                                                         4.2278481 
##                                                   Night of the Living Dead (1968) 
##                                                                         4.2278481 
##                                         Blue Angel, The (Blaue Engel, Der) (1930) 
##                                                                         4.2278481 
##                                                                     Picnic (1955) 
##                                                                         4.2278481 
##                                                           Extreme Measures (1996) 
##                                                                         4.2278481 
##                                                               Chamber, The (1996) 
##                                                                         4.2278481 
##                                   Davy Crockett, King of the Wild Frontier (1955) 
##                                                                         4.2278481 
##                                                      Swiss Family Robinson (1960) 
##                                                                         4.2278481 
##                                                     Angels in the Outfield (1994) 
##                                                                         4.2278481 
##                                                      Three Caballeros, The (1945) 
##                                                                         4.2278481 
##                                                    Sword in the Stone, The (1963) 
##                                                                         4.2278481 
##                                                        So Dear to My Heart (1949) 
##                                                                         4.2278481 
##                                              Robin Hood: Prince of Thieves (1991) 
##                                                                         4.2278481 
##                                                                   Sleepers (1996) 
##                                                                         4.2492568 
##                                                            Victor/Victoria (1982) 
##                                                                         4.2278481 
##                                                            Great Race, The (1965) 
##                                                                         4.2278481 
##                                                           Crying Game, The (1992) 
##                                                                         4.2278481 
##                                                            Sophie's Choice (1982) 
##                                                                         0.7721519 
##                                                         Christmas Carol, A (1938) 
##                                                                         0.7721519 
##                                          Microcosmos: Le peuple de l'herbe (1996) 
##                                                                        -0.2278481 
##                                                                   Fog, The (1980) 
##                                                                         4.2278481 
##                                                       Escape from New York (1981) 
##                                                                         4.2278481 
##                                                               Howling, The (1981) 
##                                                                         4.2278481 
##                 Return of Martin Guerre, The (Retour de Martin Guerre, Le) (1982) 
##                                                                         4.2278481 
##                                          Tin Drum, The (Blechtrommel, Die) (1979) 
##                                                                         4.2278481 
##                                   Cook the Thief His Wife & Her Lover, The (1989) 
##                                                                         4.2278481 
##                                                             Paths of Glory (1957) 
##                                                                         4.2278481 
##                                                              Grifters, The (1990) 
##                                                                         4.2278481 
##                                                               The Innocent (1994) 
##                                                                         4.2655600 
##                                                        Thin Blue Line, The (1988) 
##                                                                         4.2278481 
##                                                           Paris Is Burning (1990) 
##                                                                         4.2278481 
##                                               Once Upon a Time in the West (1969) 
##                                                                         4.2278481 
##                                                                        Ran (1985) 
##                                                                         0.7721519 
##                                                             Quiet Man, The (1952) 
##                                                                         4.2278481 
##                                                Once Upon a Time in America (1984) 
##                                                                         4.2278481 
##                                   Seventh Seal, The (Sjunde inseglet, Det) (1957) 
##                                                                         0.7721519 
##                                                                      Glory (1989) 
##                                                                         4.2278481 
##                                      Rosencrantz and Guildenstern Are Dead (1990) 
##                                                                         0.7721519 
##                                                              Touch of Evil (1958) 
##                                                                         4.2278481 
##                                                                  Chinatown (1974) 
##                                                                         0.7721519 
##                                                                Stand by Me (1986) 
##                                                                         4.2278481 
##                                                                          M (1931) 
##                                                                         4.2278481 
##                                                  Manchurian Candidate, The (1962) 
##                                                                         4.2278481 
##                                                         Pump Up the Volume (1990) 
##                                                                         4.2278481 
##                                                       Arsenic and Old Lace (1944) 
##                                                                        -1.2278481 
##                                                       Fried Green Tomatoes (1991) 
##                                                                         4.2278481 
##                                                                  High Noon (1952) 
##                                                                         4.2278481 
##                                                          Somewhere in Time (1980) 
##                                                                         4.2278481 
##                                                                Being There (1979) 
##                                                                         0.7721519 
##                                                               Paris, Texas (1984) 
##                                                                         4.2278481 
##                                                                    Alien 3 (1992) 
##                                                                         4.2278481 
##                                  Blood For Dracula (Andy Warhol's Dracula) (1974) 
##                                                                         4.2278481 
##                                                                Audrey Rose (1977) 
##                                                                         4.2278481 
##                                                                Blood Beach (1981) 
##                                                                         4.2278481 
##                                                                 Body Parts (1991) 
##                                                                         4.2278481 
##                                                      Bride of Frankenstein (1935) 
##                                                                         0.7721519 
##                                                                   Candyman (1992) 
##                                                                         4.2278481 
##                                                                  Cape Fear (1962) 
##                                                                         4.2278481 
##                                                                 Cat People (1982) 
##                                                                         4.2278481 
##                          Nosferatu (Nosferatu, eine Symphonie des Grauens) (1922) 
##                                                                         0.7721519 
##                                                              Crucible, The (1996) 
##                                                                         4.2278481 
##                                                       Fire on the Mountain (1996) 
##                                                                         4.2278481 
##                                                                    Volcano (1997) 
##                                                                         4.0927173 
##                                                        Conan the Barbarian (1981) 
##                                                                         4.2278481 
##                                                                 Wishmaster (1997) 
##                                                                         4.1256920 
##                                            I Know What You Did Last Summer (1997) 
##                                                                         4.2348620 
##                                                                 Rocket Man (1997) 
##                                                                         4.1244317 
##                                                        In the Line of Fire (1993) 
##                                                                         4.2278481 
##                                                         Executive Decision (1996) 
##                                                                         4.2734469 
##                                                           Perfect World, A (1993) 
##                                                                         4.2278481 
##                                                              McHale's Navy (1997) 
##                                                                         4.1528380 
##                                                         Leave It to Beaver (1997) 
##                                                                         4.2492647 
##                                                                Jackal, The (1997) 
##                                                                         4.2949661 
##                                                       Seven Years in Tibet (1997) 
##                                                                        -3.2278481 
##                                                                  Dark City (1998) 
##                                                                         4.2278481 
##                                                    American President, The (1995) 
##                                                                         4.2242565 
##                                                                     Casino (1995) 
##                                                                         4.2278481 
##                                                                 Persuasion (1995) 
##                                                                         4.2278481 
##                                                      Kicking and Screaming (1995) 
##                                                                         4.2278481 
##                                                                  City Hall (1996) 
##                                                                         4.2278481 
##                                                    Basketball Diaries, The (1995) 
##                                                                         4.2278481 
##                                                      Browning Version, The (1994) 
##                                                                         4.2278481 
##                                                               Little Women (1994) 
##                                                                         4.2278481 
##                                                             Miami Rhapsody (1995) 
##                                                                         4.2278481 
##                          Wonderful, Horrible Life of Leni Riefenstahl, The (1993) 
##                                                                         0.7721519 
##                                                                  Barcelona (1994) 
##                                                                         4.2278481 
##                                                               Widows' Peak (1994) 
##                                                                         4.2278481 
##                                                  House of the Spirits, The (1993) 
##                                                                         4.2278481 
##                                                        Singin' in the Rain (1952) 
##                                                                        -0.2278481 
##                                                                   Bad Moon (1996) 
##                                                                         4.2278481 
##                                                            Enchanted April (1991) 
##                                                                         4.2278481 
##                                                   Sex, Lies, and Videotape (1989) 
##                                                                         4.2278481 
##                                                          Strictly Ballroom (1992) 
##                                                                         4.2278481 
##                                                         Better Off Dead... (1985) 
##                                                                         4.2278481 
##                                                     Substance of Fire, The (1996) 
##                                                                         4.2278481 
##                                                                    Tin Men (1987) 
##                                                                         4.2278481 
##                                                                    Othello (1995) 
##                                                                         4.2278481 
##                                                                 Carrington (1995) 
##                                                                         4.2278481 
##                                                                 To Die For (1995) 
##                                                                         4.2278481 
##                                                      Home for the Holidays (1995) 
##                                                                         4.2278481 
##                                                                 Juror, The (1996) 
##                                                                         4.2490582 
##                                                     In the Bleak Midwinter (1995) 
##                                                                         4.2278481 
##                                                             Canadian Bacon (1994) 
##                                                                         4.2278481 
##                                                               First Knight (1995) 
##                                                                         4.2278481 
##                                                                   Mallrats (1995) 
##                                                                         4.2278481 
##                                                                Nine Months (1995) 
##                                                                         4.2278481 
##                                                           Boys on the Side (1995) 
##                                                                         4.2278481 
##                                                          Circle of Friends (1995) 
##                                                                         4.2242565 
##                                                               Exit to Eden (1994) 
##                                                                         4.2278481 
##                                                                      Fluke (1995) 
##                                                                         4.2278481 
##                                                           Immortal Beloved (1994) 
##                                                                         4.2278481 
##                                                                     Junior (1994) 
##                                                                         4.2278481 
##                                                                       Nell (1994) 
##                                                                         4.2278481 
##                                            Queen Margot (Reine Margot, La) (1994) 
##                                                                         4.2278481 
##                                                           Corrina, Corrina (1994) 
##                                                                         4.2278481 
##                                                                       Dave (1993) 
##                                                                         4.1829530 
##                                                                    Go Fish (1994) 
##                                                                         4.2278481 
##                                                            Made in America (1993) 
##                                                                         4.2278481 
##                                                               Philadelphia (1993) 
##                                                                         4.2278481 
##                                                                Shadowlands (1993) 
##                                                                         0.7721519 
##                                                                     Sirens (1994) 
##                                                                         4.2278481 
##                                                                  Threesome (1994) 
##                                                                         4.2278481 
##                                                               Pretty Woman (1990) 
##                                                                         4.1829530 
##                                                                  Jane Eyre (1996) 
##                                                                         4.2516413 
##                                                           Last Supper, The (1995) 
##                                                                         4.2278481 
##                                                                     Ransom (1996) 
##                                                                         4.3665000 
##                                                  Crow: City of Angels, The (1996) 
##                                                                         4.2366410 
##                                                            Michael Collins (1996) 
##                                                                         4.1992534 
##                                                          Ruling Class, The (1972) 
##                                                                         0.7721519 
##                                                                Real Genius (1985) 
##                                                                         4.2278481 
##                                                               Benny & Joon (1993) 
##                                                                         4.2278481 
##                                                                 Saint, The (1997) 
##                                                                         4.1934804 
##                                                            MatchMaker, The (1997) 
##                                                                         4.2346192 
##                                                                    Amistad (1997) 
##                                                                         4.1629984 
##                                                        Tomorrow Never Dies (1997) 
##                                                                         4.2754506 
##                                                   Replacement Killers, The (1998) 
##                                                                         4.2261553 
##                                                           Burnt By the Sun (1994) 
##                                                                         0.7721519 
##                                                                 Red Corner (1997) 
##                                                                         4.2346192 
##                                                                    Jumanji (1995) 
##                                                                         4.2278481 
##                                                Father of the Bride Part II (1995) 
##                                                                         4.3004520 
##                                                     Across the Sea of Time (1995) 
##                                                                         4.2278481 
##                                         Lawnmower Man 2: Beyond Cyberspace (1996) 
##                                                                         4.2278481 
##                                                                  Fair Game (1995) 
##                                                                         4.2278481 
##                                                                  Screamers (1995) 
##                                                                         4.2278481 
##                                                               Nick of Time (1995) 
##                                                                         4.2278481 
##                                                            Beautiful Girls (1996) 
##                                                                         4.2278481 
##                                                              Happy Gilmore (1996) 
##                                                                         4.2127054 
##                                                               If Lucy Fell (1996) 
##                                                                         4.2278481 
##                                                                  Boomerang (1992) 
##                                                                         4.2278481 
##                                                            Man of the Year (1995) 
##                                                                         4.2278481 
##                                                             Addiction, The (1995) 
##                                                                         4.2278481 
##                                                                     Casper (1995) 
##                                                                         4.2278481 
##                                                                      Congo (1995) 
##                                                                         4.2278481 
##                                                      Devil in a Blue Dress (1995) 
##                                                                         4.2278481 
##                                                            Johnny Mnemonic (1995) 
##                                                                         4.2278481 
##                                                                       Kids (1995) 
##                                                                         4.2278481 
##                                                               Mute Witness (1994) 
##                                                                         4.2278481 
##                                                              Prophecy, The (1995) 
##                                                                         4.2278481 
##                                                    Something to Talk About (1995) 
##                                                                         4.2242565 
##                                                               Three Wishes (1995) 
##                                                                         4.2278481 
##                                                               Castle Freak (1995) 
##                                                                         4.2278481 
##                                                           Don Juan DeMarco (1995) 
##                                                                         4.3068634 
##                                                                  Drop Zone (1994) 
##                                                                         4.2278481 
##                                                              Dumb & Dumber (1994) 
##                                                                         4.2278481 
##                                                                French Kiss (1995) 
##                                                                         4.3068634 
##                                                              Little Odessa (1994) 
##                                                                         4.2278481 
##                                                                 Milk Money (1994) 
##                                                                         4.2278481 
##                                                              Beyond Bedlam (1993) 
##                                                                         4.2278481 
##                                                                   Only You (1994) 
##                                                                         4.2278481 
##                                                          Perez Family, The (1995) 
##                                                                         4.2278481 
##                                                                  Roommates (1995) 
##                                                                         4.2278481 
##                                                              Relative Fear (1994) 
##                                                                         4.2278481 
##                                                       Swimming with Sharks (1995) 
##                                                                         4.2278481 
##                                                                  Tommy Boy (1995) 
##                                                                         4.2278481 
##                                                     Baby-Sitters Club, The (1995) 
##                                                                         4.2278481 
##                                                      Bullets Over Broadway (1994) 
##                                                                         4.2278481 
##                                                                   Crooklyn (1994) 
##                                                                         4.2278481 
##                                                     It Could Happen to You (1994) 
##                                                                         4.2278481 
##                                                                Richie Rich (1994) 
##                                                                         4.2278481 
##                                                                 Speechless (1994) 
##                                                                         4.2278481 
##                                                                    Timecop (1994) 
##                                                                         4.2278481 
##                                                                Bad Company (1995) 
##                                                                         4.2278481 
##                                                                  Boys Life (1995) 
##                                                                         4.2278481 
##                                                    In the Mouth of Madness (1995) 
##                                                                         4.2278481 
##                                                          Air Up There, The (1994) 
##                                                                         4.2278481 
##                                                                Hard Target (1993) 
##                                                                         4.2278481 
##                                                             Heaven & Earth (1993) 
##                                                                         4.2278481 
##                                                            Jimmy Hollywood (1994) 
##                                                                         4.2278481 
##                                                   Manhattan Murder Mystery (1993) 
##                                                                         4.2278481 
##                                                          Menace II Society (1993) 
##                                                                         4.2278481 
##                                                             Poetic Justice (1993) 
##                                                                         4.2278481 
##                                                               Program, The (1993) 
##                                                                         4.2278481 
##                                                                 Rising Sun (1993) 
##                                                                         4.2278481 
##                                                                Shadow, The (1994) 
##                                                                         4.2278481 
##                                   Thirty-Two Short Films About Glenn Gould (1993) 
##                                                                         4.2278481 
##                                                                      Andre (1994) 
##                                                                         4.2278481 
##                                                      Celluloid Closet, The (1995) 
##                                                                         4.1721602 
##                                                     Great Day in Harlem, A (1994) 
##                                                                         4.2278481 
##                                                               One Fine Day (1996) 
##                                                                         4.2619656 
##                                            Candyman: Farewell to the Flesh (1995) 
##                                                                         4.2278481 
##                                                                      Frisk (1995) 
##                                                                         4.2278481 
##                                                                     Girl 6 (1996) 
##                                                                         4.1736373 
##                                                                      Eddie (1996) 
##                                                                         4.2278481 
##                                                                  Space Jam (1996) 
##                                                                         4.1428072 
##                                                          Mrs. Winterbourne (1996) 
##                                                                         4.2278481 
##                                                                      Faces (1968) 
##                                                                         4.2278481 
##                                                           Mulholland Falls (1996) 
##                                                                         4.2278481 
##                                                      Great White Hype, The (1996) 
##                                                                         4.1836961 
##                                                               Arrival, The (1996) 
##                                                                         4.2421779 
##                                                               Phantom, The (1996) 
##                                                                         4.2127054 
##                                                                   Daylight (1996) 
##                                                                         4.1989573 
##                                                                     Alaska (1996) 
##                                                                         4.2278481 
##                                                                       Fled (1996) 
##                                                                         4.2278481 
##                                                                   Power 98 (1995) 
##                                                                         4.2278481 
##                                                           Escape from L.A. (1996) 
##                                                                         4.1137980 
##                                                                      Bogus (1996) 
##                                                                         4.2278481 
##                                                                Bulletproof (1996) 
##                                                                         4.2097726 
##                                      Halloween: The Curse of Michael Myers (1995) 
##                                                                         4.2278481 
##                                                          Gay Divorcee, The (1934) 
##                                                                         4.2278481 
##                                                                  Ninotchka (1939) 
##                                                                         0.7721519 
##                                                              Meet John Doe (1941) 
##                                                                         4.2278481 
##                                                      In the Line of Duty 2 (1987) 
##                                                                         4.2278481 
##                                                                  Loch Ness (1995) 
##                                                                         4.2278481 
##                                                          Last Man Standing (1996) 
##                                                                         4.2833761 
##                                                           Glimmer Man, The (1996) 
##                                                                         4.2276495 
##                                                                  Pollyanna (1960) 
##                                                                         4.2278481 
##                                                            Shaggy Dog, The (1959) 
##                                                                         4.2278481 
##                                                                    Freeway (1996) 
##                                                                         4.2278481 
##                                                         That Thing You Do! (1996) 
##                                                                         4.2127054 
##                                            To Gillian on Her 37th Birthday (1996) 
##                                                                         4.2278481 
##                                                        Looking for Richard (1996) 
##                                                                         4.2278481 
##                                                           Murder, My Sweet (1944) 
##                                                                         4.2278481 
##                                                            Days of Thunder (1990) 
##                                                                         4.2278481 
##                                                       Perfect Candidate, A (1996) 
##                                                                         4.2278481 
##                                       Two or Three Things I Know About Her (1966) 
##                                                                         4.2278481 
##                                                          Bloody Child, The (1996) 
##                                                                         4.2278481 
##                                                                  Braindead (1992) 
##                                                                         4.2278481 
##                                                                  Bad Taste (1987) 
##                                                                         4.2278481 
##                                                                       Diva (1981) 
##                                                                         0.7721519 
##                                                             Night on Earth (1991) 
##                                                                         4.2278481 
##                                                          Paris Was a Woman (1995) 
##                                                                         4.2278481 
##                                                      Amityville: Dollhouse (1996) 
##                                                                         4.2278481 
##                                                           April Fool's Day (1986) 
##                                                                         4.2278481 
##                                                             Believers, The (1987) 
##                                                                         4.2278481 
##                                                        Nosferatu a Venezia (1986) 
##                                                                         4.2278481 
##                                                         Jingle All the Way (1996) 
##                                                                         4.2278481 
##              Garden of Finzi-Contini, The (Giardino dei Finzi-Contini, Il) (1970) 
##                                                                         4.2278481 
##                                                        My Fellow Americans (1996) 
##                                                                         4.2362627 
##                                                                    Michael (1996) 
##                                                                         4.2278481 
##                                                      Whole Wide World, The (1996) 
##                                                                         4.2278481 
##                                                           Hearts and Minds (1996) 
##                                                                         4.2278481 
##                                                              Fools Rush In (1997) 
##                                                                         4.2278481 
##                                                                      Touch (1997) 
##                                                                         4.2278481 
##                                                             Vegas Vacation (1997) 
##                                                                         4.1684524 
##                                                                 Love Jones (1997) 
##                                                                         4.1866519 
##                                                            Picture Perfect (1997) 
##                                                                         4.2278481 
##                                                               Career Girls (1997) 
##                                                                         4.2492647 
##                                                            She's So Lovely (1997) 
##                                                                         4.2103674 
##                                                                Money Talks (1997) 
##                                                                         4.1979473 
##                                                             Excess Baggage (1997) 
##                                                                         4.1952409 
##                                                             That Darn Cat! (1997) 
##                                                                         4.1765761 
##                                                            Peacemaker, The (1997) 
##                                                                         4.2169480 
##                                                                  Soul Food (1997) 
##                                                                         4.3390338 
##                                                          Washington Square (1997) 
##                                                                         4.2278481 
##                                                    Telling Lies in America (1997) 
##                                                                         4.2278481 
##                                                          Year of the Horse (1997) 
##                                                                         4.2278481 
##                                                                   Phantoms (1998) 
##                                                                         4.2278481 
##                                                      Life Less Ordinary, A (1997) 
##                                                                         4.2278481 
##                                                                Eve's Bayou (1997) 
##                                                                         4.2794774 
##                                                            One Night Stand (1997) 
##                                                                         4.2439512 
##                                                          Tango Lesson, The (1997) 
##                                                                         4.2833144 
##                                                Mortal Kombat: Annihilation (1997) 
##                                                                         4.0493878 
##                                                                       Bent (1997) 
##                                                                         4.2278481 
##                                                                    Flubber (1997) 
##                                                                         4.2068049 
##                                                       For Richer or Poorer (1997) 
##                                                                         4.2492568 
##                                                               Home Alone 3 (1997) 
##                                                                         4.2278481 
##                                                                   Scream 2 (1997) 
##                                                                         4.3422090 
##                                                       Sweet Hereafter, The (1997) 
##                                                                         4.3200192 
##                                                               Time Tracers (1995) 
##                                                                         4.2278481 
##                                                               Postman, The (1997) 
##                                                                         4.2346192 
##                                                          Winter Guest, The (1997) 
##                                                                         4.2278481 
##                                                                     Kundun (1997) 
##                                                                         4.2278481 
##                                                                  Mr. Magoo (1997) 
##                                                                         4.2219476 
##                                                          Big Lebowski, The (1998) 
##                                                                         4.2278481 
##                                                                  Afterglow (1997) 
##                                                                         4.2103674 
##                                           Ma vie en rose (My Life in Pink) (1997) 
##                                                                         4.2278481 
##                                                         Great Expectations (1998) 
##                                                                         4.2492568 
##                                                            Oscar & Lucinda (1997) 
##                                                                         4.2278481 
##                                                                     Vermin (1998) 
##                                                                         4.2278481 
##                                                                 Half Baked (1998) 
##                                                                         4.1968705 
##                                                           Dangerous Beauty (1998) 
##                                                                         4.2278481 
##                                                               Nil By Mouth (1997) 
##                                                                         4.2278481 
##                                                                   Twilight (1998) 
##                                                                         4.2278481 
##                                                             U.S. Marshalls (1998) 
##                                                                         4.2278481 
##                                              Love and Death on Long Island (1997) 
##                                                                         4.2278481 
##                                                                Wild Things (1998) 
##                                                                         4.2278481 
##                                                             Primary Colors (1998) 
##                                                                         4.2278481 
##                                                              Lost in Space (1998) 
##                                                                         4.2278481 
##                                                             Mercury Rising (1998) 
##                                                                         4.2278481 
##                                                             City of Angels (1998) 
##                                                                         4.2278481 
##                                                 City of Lost Children, The (1995) 
##                                                                         4.2278481 
##                                                                   Two Bits (1995) 
##                                                                         4.2278481 
##                                                      Farewell My Concubine (1993) 
##                                                                         0.7721519 
##                                                                   Dead Man (1995) 
##                                                                         4.2278481 
##                                                      Raise the Red Lantern (1991) 
##                                                                         0.7721519 
##                                                               White Squall (1996) 
##                                                                         4.2888202 
##                                                              Unforgettable (1996) 
##                                                                         4.2492568 
##                                                             Down Periscope (1996) 
##                                                                         4.1280867 
##                          Flower of My Secret, The (Flor de mi secreto, La) (1995) 
##                                                                         4.2278481 
##                                                                 Craft, The (1996) 
##                                                                         4.1761539 
##                                                            Harriet the Spy (1996) 
##                                                                         4.2278481 
##                                                             Chain Reaction (1996) 
##                                                                         4.2127054 
##                                                  Island of Dr. Moreau, The (1996) 
##                                                                         4.1323339 
##                                                                  First Kid (1996) 
##                                                                         4.2492568 
##                                                               Funeral, The (1996) 
##                                                                         4.2278481 
##                                                       Preacher's Wife, The (1996) 
##                                                                         4.2358855 
##                                                              Paradise Road (1997) 
##                                                                         4.2278481 
##                                                                Brassed Off (1996) 
##                                                                         4.2278481 
##                                                          Thousand Acres, A (1997) 
##                                                                         4.2871690 
##                                                        Smile Like Yours, A (1997) 
##                                                                         4.2022835 
##                                                        Murder in the First (1995) 
##                                                                         4.2278481 
##                                                                   Airheads (1994) 
##                                                                         4.2278481 
##                                                                With Honors (1994) 
##                                                                         4.2278481 
##                                              What's Love Got to Do with It (1993) 
##                                                                         4.2278481 
##                                                                Killing Zoe (1994) 
##                                                                         4.2278481 
##                                                            Renaissance Man (1994) 
##                                                                         4.2278481 
##                                                                    Charade (1963) 
##                                                                         4.2278481 
##                                                     Fox and the Hound, The (1981) 
##                                                                         4.2278481 
##                                             Big Blue, The (Grand bleu, Le) (1988) 
##                                                                         4.2278481 
##                                                                 Booty Call (1997) 
##                                                                         4.1968705 
##                                              How to Make an American Quilt (1995) 
##                                                                         4.2278481 
##                                                                    Georgia (1995) 
##                                                                         4.2278481 
##                                                Indian in the Cupboard, The (1995) 
##                                                                         4.2278481 
##                                                           Blue in the Face (1995) 
##                                                                         4.2278481 
##                                                            Unstrung Heroes (1995) 
##                                                                         4.2278481 
##                                                                   Unzipped (1995) 
##                                                                         0.7721519 
##                                                             Before Sunrise (1995) 
##                                                                         4.2278481 
##                                                              Nobody's Fool (1994) 
##                                                                         4.2278481 
##                                                              Pushing Hands (1992) 
##                                                                         4.2278481 
##                                                           To Live (Huozhe) (1994) 
##                                                                         4.2278481 
##                                                         Dazed and Confused (1993) 
##                                                                         4.2278481 
##                                                                      Naked (1993) 
##                                                                         4.2278481 
##                                                                    Orlando (1993) 
##                                                                         0.7721519 
##                                                           Ruby in Paradise (1993) 
##                                                                         4.2278481 
##                                           Some Folks Call It a Sling Blade (1993) 
##                                                                         4.2278481 
##                                                       Month by the Lake, A (1995) 
##                                                                         4.2278481 
##                                                                 Funny Face (1957) 
##                                                                         4.2278481 
##                                                     Affair to Remember, An (1957) 
##                                                                         4.2278481 
##                                                     Little Lord Fauntleroy (1936) 
##                                                                         4.2278481 
##                                                     Inspector General, The (1949) 
##                                                                         4.2278481 
##                                       Winnie the Pooh and the Blustery Day (1968) 
##                                                                         4.2278481 
##                                                               Hear My Song (1991) 
##                                                                         4.2278481 
##                                                               Mediterraneo (1991) 
##                                                                         4.2278481 
##                                                               Passion Fish (1992) 
##                                                                         4.2278481 
##                                                              Grateful Dead (1995) 
##                                                                         4.2278481 
##                                                             Eye for an Eye (1996) 
##                                                                         4.2492568 
##                                                                       Fear (1996) 
##                                                                         4.1793587 
##                                                                       Solo (1996) 
##                                                                         4.2278481 
##                                                            Substitute, The (1996) 
##                                                                         4.2127054 
##                                                         Heaven's Prisoners (1996) 
##                                                                         4.2278481 
##                                                        Trigger Effect, The (1996) 
##                                                                         4.2278481 
##                                                               Mother Night (1996) 
##                                                                         4.2278481 
##                                                           Dangerous Ground (1997) 
##                                                                         4.2278481 
##                                                               Maximum Risk (1996) 
##                                                                         4.2136885 
##                                                       Rich Man's Wife, The (1996) 
##                                                                         4.2278481 
##                                                          Shadow Conspiracy (1997) 
##                                                                         4.1512115 
##                                                               Blood & Wine (1997) 
##                                                                         4.2278481 
##                                                                 Turbulence (1997) 
##                                                                         4.2278481 
##                                                                 Underworld (1997) 
##                                                                         4.2278481 
##                                              Beautician and the Beast, The (1997) 
##                                                                         4.2219476 
##                                                           Cats Don't Dance (1997) 
##                                                                         4.2022835 
##                                                              Anna Karenina (1997) 
##                                                                         4.2492647 
##                                                              Keys to Tulsa (1997) 
##                                                                         4.2278481 
##                                                           Head Above Water (1996) 
##                                                                         4.2278481 
##                                                                   Hercules (1997) 
##                                                                         4.2149408 
##                                         Last Time I Committed Suicide, The (1997) 
##                                                                         4.2278481 
##                                                             Kiss Me, Guido (1997) 
##                                                                         4.2278481 
##                                                             Big Green, The (1995) 
##                                                                         4.2278481 
##                                                    Stuart Saves His Family (1995) 
##                                                                         4.2278481 
##                                                                  Cabin Boy (1994) 
##                                                                         4.2278481 
##                                                                Clean Slate (1994) 
##                                                                         4.2278481 
##                                                             Lightning Jack (1994) 
##                                                                         4.2278481 
##                                                               Stupids, The (1996) 
##                                                                         4.2278481 
##                                                                  Pest, The (1997) 
##                                                                         4.2278481 
##                                               Geronimo: An American Legend (1993) 
##                                                                         4.2278481 
##                Double vie de Veronique, La (Double Life of Veronique, The) (1991) 
##                                                                         4.2278481 
##                         Until the End of the World (Bis ans Ende der Welt) (1991) 
##                                                                         4.2278481 
##                                                        Waiting for Guffman (1996) 
##                                                                         4.2278481 
##                                                         I Shot Andy Warhol (1996) 
##                                                                         4.2278481 
##                                                            Stealing Beauty (1996) 
##                                                                         4.2278481 
##                                                                   Basquiat (1996) 
##                                                                         4.2278481 
##                                                       2 Days in the Valley (1996) 
##                                                                         4.0783524 
##                                                              Private Parts (1997) 
##                                                                         4.2278481 
##                                                                   Anaconda (1997) 
##                                                                         4.2278481 
##                                     Romy and Michele's High School Reunion (1997) 
##                                                                         4.2278481 
##                                                                     Shiloh (1997) 
##                                                                         4.2278481 
##                                                                    Con Air (1997) 
##                                                                         4.2770127 
##                                                               Trees Lounge (1996) 
##                                                                         4.2278481 
##                                                    Tie Me Up! Tie Me Down! (1990) 
##                                                                         4.2278481 
##                                         Die xue shuang xiong (Killer, The) (1989) 
##                                                                         4.2278481 
##                                                                   Gaslight (1944) 
##                                                                        -1.2278481 
##                                                                      8 1/2 (1963) 
##                                                                         4.2278481 
##                                               Fast, Cheap & Out of Control (1997) 
##                                                                         4.2278481 
##                                                               Fathers' Day (1997) 
##                                                                         4.2149408 
##                                                              Mrs. Dalloway (1997) 
##                                                                         4.2278481 
##                                                            Fire Down Below (1997) 
##                                                                         4.2302864 
##                                                       Lay of the Land, The (1997) 
##                                                                         4.2278481 
##                                                               Shooter, The (1995) 
##                                                                         4.2278481 
##                                                           Grumpier Old Men (1995) 
##                                                                         4.2509617 
##                                                                  Jury Duty (1995) 
##                                                                         4.2278481 
##                                                   Beverly Hillbillies, The (1993) 
##                                                                         4.2278481 
##                                                                     Lassie (1994) 
##                                                                         4.2278481 
##                                                          Little Big League (1994) 
##                                                                         4.2278481 
##                                   Homeward Bound II: Lost in San Francisco (1996) 
##                                                                         4.2278481 
##                                                                 Quest, The (1996) 
##                                                                         4.2278481 
##                                                              Cool Runnings (1993) 
##                                                                         4.2278481 
##                                                             Drop Dead Fred (1991) 
##                                                                         4.2278481 
##                                                                   Grease 2 (1982) 
##                                                                         4.2278481 
##                                                                 Switchback (1997) 
##                                                                         4.2278481 
##                                                                     Hamlet (1996) 
##                                                                         4.2278481 
##                                                              Two if by Sea (1996) 
##                                                                         4.2127054 
##                                                               Forget Paris (1995) 
##                                                                         4.2278481 
##                                                                 Just Cause (1995) 
##                                                                         4.2278481 
##                                                                 Rent-a-Kid (1995) 
##                                                                         4.2278481 
##                                                                 Paper, The (1994) 
##                                                                         4.2278481 
##                                                                   Fearless (1993) 
##                                                                         4.2278481 
##                                                                     Malice (1993) 
##                                                                         4.2278481 
##                                                               Multiplicity (1996) 
##                                                                         4.0957577 
##                                                              She's the One (1996) 
##                                                                         4.1579499 
##                                                               House Arrest (1996) 
##                                                                         4.2278481 
##                                                   Ghost and Mrs. Muir, The (1947) 
##                                                                         4.2278481 
##                                                             Associate, The (1996) 
##                                                                         4.2562442 
##                                                Dracula: Dead and Loving It (1995) 
##                                                                         4.1989573 
##                                                               Now and Then (1995) 
##                                                                         4.2278481 
##                                                                  Mr. Wrong (1996) 
##                                                                         4.2149408 
##                                                    Simple Twist of Fate, A (1994) 
##                                                                         4.2278481 
##                                                                     Cronos (1992) 
##                                                                         0.7721519 
##                                                            Pallbearer, The (1996) 
##                                                                         4.2278481 
##                                                                   War, The (1994) 
##                                                                         4.2278481 
##   Don't Be a Menace to South Central While Drinking Your Juice in the Hood (1996) 
##                                                                         4.2278481 
##                                               Adventures of Pinocchio, The (1996) 
##                                                                         4.2514055 
##                                                          Evening Star, The (1996) 
##                                                                         4.2492568 
##                                                     Four Days in September (1997) 
##                                                                         4.2278481 
##                                                         Little Princess, A (1995) 
##                                                                         4.2888202 
##                                                                  Crossfire (1947) 
##                                                                         4.2278481 
##                                                              Koyaanisqatsi (1983) 
##                                                                         0.7721519 
##                                                                      Balto (1995) 
##                                                                         4.2278481 
##                                                              Bottle Rocket (1996) 
##                                                                         4.2278481 
##                                    Star Maker, The (Uomo delle stelle, L') (1995) 
##                                                                         4.2278481 
##                                                                    Amateur (1994) 
##                                                                         4.2278481 
##                                                         Living in Oblivion (1995) 
##                                                                         0.7721519 
##                                                                 Party Girl (1995) 
##                                                                         4.2278481 
##                                                 Pyromaniac's Love Story, A (1995) 
##                                                                         4.2278481 
##                                                              Shallow Grave (1994) 
##                                                                         4.2278481 
##                                                              Reality Bites (1994) 
##                                                                         4.2278481 
##                                                    Man of No Importance, A (1994) 
##                                                                         4.2278481 
##                                                            Pagemaster, The (1994) 
##                                                                         4.2278481 
##                                                             Love and a .45 (1994) 
##                                                                         4.2278481 
##                                                           Oliver & Company (1988) 
##                                                                         4.2278481 
##                                                            Joe's Apartment (1996) 
##                                                                         4.2278481 
##                                                        Celestial Clockwork (1994) 
##                                                                         4.2278481 
##                                                                    Curdled (1996) 
##                                                                         4.2278481 
##                                                         Female Perversions (1996) 
##                                                                         4.2278481 
##                                                           Albino Alligator (1996) 
##                                                                         4.2278481 
##                                                      Anne Frank Remembered (1995) 
##                                                                         4.2278481 
##                                                               Carried Away (1996) 
##                                                                         4.2278481 
##                                                              It's My Party (1995) 
##                                                                         4.2278481 
##                                                               Bloodsport 2 (1995) 
##                                                                         4.2278481 
##                                                                Double Team (1997) 
##                                                                         4.2278481 
##                                                    Speed 2: Cruise Control (1997) 
##                                                                         4.2278481 
##                                                                     Sliver (1993) 
##                                                                         4.2278481 
##                                                              Pete's Dragon (1977) 
##                                                                         4.2278481 
##                                                                   Dear God (1996) 
##                                                                         4.2278481 
##                                                            Live Nude Girls (1995) 
##                                                                         4.2714761 
##                                         Thin Line Between Love and Hate, A (1996) 
##                                                                         4.2278481 
##                                                           High School High (1996) 
##                                                                         4.2366410 
##                                                               Commandments (1997) 
##                                                                         4.2278481 
##                                                           Hate (Haine, La) (1995) 
##                                                                         4.2278481 
##                                                     Flirting With Disaster (1996) 
##                                                                         0.7721519 
##                                         Red Firecracker, Green Firecracker (1994) 
##                                                                         0.7721519 
##                                                       What Happened Was... (1994) 
##                                                                         4.2278481 
##                                                  Six Degrees of Separation (1993) 
##                                                                         4.2278481 
##                                                                   Two Much (1996) 
##                                                                         4.2278481 
##                                                                      Trust (1990) 
##                                                                         4.2278481 
##                                             C'est arrive pres de chez vous (1992) 
##                                                                         4.2278481 
##                                                                  Firestorm (1998) 
##                                                                         4.2278481 
##                                                           Newton Boys, The (1998) 
##                                                                         4.2278481 
##                                                             Beyond Rangoon (1995) 
##                                                                         4.2278481 
##                                                              Feast of July (1995) 
##                                                                         4.2278481 
##                                                       Death and the Maiden (1994) 
##                                                                         4.2278481 
##                                                                  Tank Girl (1995) 
##                                                                         4.2278481 
##                                                           Double Happiness (1994) 
##                                                                         4.2278481 
##                                                                       Cobb (1994) 
##                                                                         4.2278481 
##                                         Mrs. Parker and the Vicious Circle (1994) 
##                                                                         4.2278481 
##                                                                   Faithful (1996) 
##                                                                         4.2278481 
##                                                              Twelfth Night (1996) 
##                                                                        -2.2278481 
##                                                         Mark of Zorro, The (1940) 
##                                                                         4.2278481 
##                                                          Surviving Picasso (1996) 
##                                                                         4.2278481 
##                                                                Up in Smoke (1978) 
##                                                                         4.2278481 
##                                                     Some Kind of Wonderful (1987) 
##                                                                         4.2278481 
##                                                          I'm Not Rappaport (1996) 
##                                                                         4.2278481 
##                 Umbrellas of Cherbourg, The (Parapluies de Cherbourg, Les) (1964) 
##                                                                         4.2278481 
##                                                    They Made Me a Criminal (1939) 
##                                                                         4.2278481 
##                                                 Last Time I Saw Paris, The (1954) 
##                                                                         4.2278481 
##                                                        Farewell to Arms, A (1932) 
##                                                                         4.2278481 
##                                                             Innocents, The (1961) 
##                                                                         4.2278481 
##                                                   Old Man and the Sea, The (1958) 
##                                                                         4.2278481 
##                                                           Truman Show, The (1998) 
##                                                                         4.2346192 
##                                             Heidi Fleiss: Hollywood Madam (1995)  
##                                                                         4.2278481 
##                                                          Chungking Express (1994) 
##                                                                         4.2278481 
##                                                             Jupiter's Wife (1994) 
##                                                                         4.2278481 
##                                                                       Safe (1995) 
##                                                                         4.2278481 
##                                                          Feeling Minnesota (1996) 
##                                                                         4.2278481 
##                                                   Escape to Witch Mountain (1975) 
##                                                                         4.2278481 
##                                                             Get on the Bus (1996) 
##                                                                         4.2278481 
##                                                                 Doors, The (1991) 
##                                                                         4.2278481 
##                                                      Ghosts of Mississippi (1996) 
##                                                                         4.2278481 
##                                                            Beautiful Thing (1996) 
##                                                                         4.2516413 
##                                                                   Best Men (1997) 
##                                                                         4.2278481 
##                                                                    Hackers (1995) 
##                                                                         4.2278481 
##                                                     Road to Wellville, The (1994) 
##                                                                         4.2278481 
##                                                              War Room, The (1993) 
##                                                                         4.2278481 
##                                                         When We Were Kings (1996) 
##                                                                         4.2278481 
##                                                                 Hard Eight (1996) 
##                                                                         4.2278481 
##                                                            Quiet Room, The (1996) 
##                                                                         4.2278481 
##                                                                 Blue Chips (1994) 
##                                                                         4.2278481 
##                                                              Calendar Girl (1993) 
##                                                                         4.2278481 
##                                                                  My Family (1995) 
##                                                                         4.2278481 
##                                                                  Tom & Viv (1994) 
##                                                                         4.2278481 
##                                                                  Walkabout (1971) 
##                                                                         4.2278481 
##                                                                 Last Dance (1996) 
##                                                                         4.2278481 
##                                                          Original Gangstas (1996) 
##                                                                         4.2278481 
##                                                            In Love and War (1996) 
##                                                                         4.2516413 
##                                                                   Backbeat (1993) 
##                                                                         4.2278481 
##                                                                 Alphaville (1965) 
##                                                                         4.2278481 
##                            Rendezvous in Paris (Rendez-vous de Paris, Les) (1995) 
##                                                                         4.2278481 
##                                                                      Cyclo (1995) 
##                                                                         4.2278481 
##                                                                 Relic, The (1997) 
##                                                                         4.2278481 
##                                            Fille seule, La (A Single Girl) (1995) 
##                                                                         4.2278481 
##                                                                    Stalker (1979) 
##                                                                         4.2278481 
##                                                  Love! Valour! Compassion! (1997) 
##                                                                         4.2931373 
##                                                               Palookaville (1996) 
##                                                                         4.2278481 
##                                                                 Phat Beach (1996) 
##                                                                         4.2278481 
##                                                    Portrait of a Lady, The (1996) 
##                                                                         4.2278481 
##                                                           Zeus and Roxanne (1997) 
##                                                                         4.2278481 
##                                                                  Big Bully (1996) 
##                                                                         4.1475592 
##                                                       Love & Human Remains (1993) 
##                                                                         4.2278481 
##                                                             Sum of Us, The (1994) 
##                                                                         4.2278481 
##                                                              Little Buddha (1993) 
##                                                                         4.2278481 
##                                                                      Fresh (1994) 
##                                                                         4.2278481 
##                                                        Spanking the Monkey (1994) 
##                                                                         4.2278481 
##                                                                 Wild Reeds (1994) 
##                                                                         4.2278481 
##                                                                 Women, The (1939) 
##                                                                         4.2278481 
##                                                                      Bliss (1997) 
##                                                                         4.2278481 
##                                                                     Caught (1996) 
##                                                                         4.2278481 
##                                                                  Hugo Pool (1997) 
##                                                                         4.2833144 
##                                                        Welcome To Sarajevo (1997) 
##                                                                         4.2833144 
##                                                          Dunston Checks In (1996) 
##                                                                         4.2278481 
##                                                                Major Payne (1994) 
##                                                                         4.2278481 
##                                                           Man of the House (1995) 
##                                                                         4.2278481 
##                                                             I Love Trouble (1994) 
##                                                                         4.2278481 
##                                                    Low Down Dirty Shame, A (1994) 
##                                                                         4.2278481 
##                                                        Cops and Robbersons (1994) 
##                                                                         4.2278481 
##                                                            Cowboy Way, The (1994) 
##                                                                         4.2278481 
##                                                      Endless Summer 2, The (1994) 
##                                                                         4.2278481 
##                                                            In the Army Now (1994) 
##                                                                         4.2278481 
##                                                               Inkwell, The (1994) 
##                                                                         4.2278481 
##                                                        Switchblade Sisters (1975) 
##                                                                         4.2278481 
##                                                              Young Guns II (1990) 
##                                                                         4.2278481 
##                                                                Prefontaine (1997) 
##                                                                         4.2278481 
##                                                           That Old Feeling (1997) 
##                                                                         4.2562442 
##                                                   Letter From Death Row, A (1998) 
##                                                                         4.2278481 
##                                                   Boys of St. Vincent, The (1993) 
##                                                                        -3.2278481 
##                                             Before the Rain (Pred dozhdot) (1994) 
##                                                                         4.2278481 
##                                                         Once Were Warriors (1994) 
##                                                                         4.2278481 
##                               Strawberry and Chocolate (Fresa y chocolate) (1993) 
##                                                                         4.2278481 
##                                          Savage Nights (Nuits fauves, Les) (1992) 
##                                                                         4.2278481 
##                                                            Family Thing, A (1996) 
##                                                                         4.2278481 
##                                                                Purple Noon (1960) 
##                                                                         4.2278481 
##                                        Cemetery Man (Dellamorte Dellamore) (1994) 
##                                                                         4.2278481 
##                                                                        Kim (1950) 
##                                                                         4.2278481 
##                                        Marlene Dietrich: Shadow and Light (1996)  
##                                                                         4.2278481 
##                                       Maybe, Maybe Not (Bewegte Mann, Der) (1994) 
##                                                                         4.2278481 
##                                                                    Top Hat (1935) 
##                                                                         0.7721519 
##                                                         To Be or Not to Be (1942) 
##                                                                        -0.2278481 
##                                                          Secret Agent, The (1996) 
##                                                                         4.2278481 
##                                                              Amos & Andrew (1993) 
##                                                                         4.2278481 
##                                                                       Jade (1995) 
##                                                                         4.2278481 
##                                                              Kiss of Death (1995) 
##                                                                         4.2278481 
##                                                                 Mixed Nuts (1994) 
##                                                                         4.2278481 
##                                                                 Virtuosity (1995) 
##                                                                         4.2278481 
##                                                                   Blue Sky (1994) 
##                                                                         4.2278481 
##                                                             Flesh and Bone (1993) 
##                                                                         4.2278481 
##                                                              Guilty as Sin (1993) 
##                                                                         4.2278481 
##                                 In the Realm of the Senses (Ai no corrida) (1976) 
##                                                                         4.2278481 
##                                                                  Barb Wire (1996) 
##                                                                         4.2278481 
##                                                                     Kissed (1996) 
##                                                                         4.2278481 
##                                                                  Assassins (1995) 
##                                                                         4.2278481 
##                                                                     Friday (1995) 
##                                                                         4.2278481 
##                                                             Goofy Movie, A (1995) 
##                                                                         4.2278481 
##                                                            Higher Learning (1995) 
##                                                                         4.2278481 
##                                                   When a Man Loves a Woman (1994) 
##                                                                         4.2278481 
##                                                             Judgment Night (1993) 
##                                                                         4.2278481 
##                                                           King of the Hill (1993) 
##                                                                         4.2278481 
##                                                                 Scout, The (1994) 
##                                                                         4.2278481 
##                                                                      Angus (1995) 
##                                                                         4.2278481 
##                                                   Night Falls on Manhattan (1997) 
##                                                                         4.2278481 
##                                                  Awfully Big Adventure, An (1995) 
##                                                                         4.2278481 
##                                              Under Siege 2: Dark Territory (1995) 
##                                                                         4.2278481 
##                                                              Poison Ivy II (1995) 
##                                                                         4.2278481 
##                                              Ready to Wear (Pret-A-Porter) (1994) 
##                                                                         4.2278481 
##                                                           Marked for Death (1990) 
##                                                                         4.2278481 
##                                                     Madonna: Truth or Dare (1991) 
##                                                                         4.2278481 
##                                                            Nenette et Boni (1996) 
##                                                                         4.2278481 
##                                                      Chairman of the Board (1998) 
##                                                                         4.2346192 
##                                                       Big Bang Theory, The (1994) 
##                                                                         4.2278481 
##                                                  Other Voices, Other Rooms (1997) 
##                                                                         4.2278481 
##                                                                    Twisted (1996) 
##                                                                         4.2278481 
##                                                                 Full Speed (1996) 
##                                                                         4.2278481 
##                                                           Cutthroat Island (1995) 
##                                                                         4.2278481 
##                                        Ghost in the Shell (Kokaku kidotai) (1995) 
##                                                                         4.2278481 
##                                                                   Van, The (1996) 
##                                                                         4.2278481 
## Old Lady Who Walked in the Sea, The (Vieille qui marchait dans la mer, La) (1991) 
##                                                                         4.2278481 
##                                                                Night Flier (1997) 
##                                                                         4.2278481 
##                                                                      Metro (1997) 
##                                                                         4.2278481 
##                                                                 Gridlock'd (1997) 
##                                                                         0.7721519 
##                                                                Bushwhacked (1995) 
##                                                                         4.2278481 
##                                                                  Bad Girls (1994) 
##                                                                         4.2278481 
##                                                                      Blink (1994) 
##                                                                         4.2278481 
##                                                          For Love or Money (1993) 
##                                                                         4.2278481 
##                                        Best of the Best 3: No Turning Back (1995) 
##                                                                         4.2278481 
##                                                             A Chef in Love (1996) 
##                                                                         4.2278481 
##                                                      Contempt (Mepris, Le) (1963) 
##                                                                         4.2278481 
##                                                        Tie That Binds, The (1995) 
##                                                                         4.2278481 
##                                                               Gone Fishin' (1997) 
##                                                                         4.2278481 
##                                                             Broken English (1996) 
##                                                                         4.2278481 
##                                                    Designated Mourner, The (1997) 
##                                                                         4.2278481 
##                                                            Trial and Error (1997) 
##                                                                         4.2278481 
##                                                             Pie in the Sky (1995) 
##                                                                         4.1416496 
##                                                              Total Eclipse (1995) 
##                                                                         4.2278481 
##                                                    Run of the Country, The (1995) 
##                                                                         4.2278481 
##                                                        Walking and Talking (1996) 
##                                                                         4.2278481 
##                                                                    Foxfire (1996) 
##                                                                         4.2278481 
##                                                            Nothing to Lose (1994) 
##                                                                         4.2278481 
##                                                                  Star Maps (1997) 
##                                                                         4.2492647 
##                                    Bread and Chocolate (Pane e cioccolata) (1973) 
##                                                                         4.2278481 
##                                                                   Clockers (1995) 
##                                                                         4.2278481 
##                                                                Bitter Moon (1992) 
##                                                                         4.2278481 
##                                                      Love in the Afternoon (1957) 
##                                                                         4.2278481 
##                                                            Life with Mikey (1993) 
##                                                                         4.2278481 
##                                                                      North (1994) 
##                                                                         4.2278481 
##                                                          Talking About Sex (1994) 
##                                                                         4.2278481 
##                                                             Color of Night (1994) 
##                                                                         4.2278481 
##                                                                  Robocop 3 (1993) 
##                                                                         4.2278481 
##                                                 Killer (Bulletproof Heart) (1994) 
##                                                                         4.2278481 
##                                                                Sunset Park (1996) 
##                                                                         4.2278481 
##                                                                 Set It Off (1996) 
##                                                                         4.2562442 
##                                                                     Selena (1997) 
##                                                                         4.2278481 
##                                                               Wild America (1997) 
##                                                                         4.2278481 
##                                                               Gang Related (1997) 
##                                                                         4.1555670 
##                                                                 Manny & Lo (1996) 
##                                                                         4.2278481 
##                                                            Grass Harp, The (1995) 
##                                                                         4.2278481 
##                                                                 Out to Sea (1997) 
##                                                                         4.2278481 
##                                                           Before and After (1996) 
##                                                                         4.2127054 
##                                                           Princess Caraboo (1994) 
##                                                                         4.2278481 
##                                                            Shall We Dance? (1937) 
##                                                                         4.2278481 
##                                                                         Ed (1996) 
##                                                                         4.2278481 
##                                                            Denise Calls Up (1995) 
##                                                                         4.2278481 
##                                                             Jack and Sarah (1995) 
##                                                                         4.2278481 
##                                                               Country Life (1994) 
##                                                                         4.2278481 
##                                                               Celtic Pride (1996) 
##                                                                         4.2278481 
##                                                             Simple Wish, A (1997) 
##                                                                         4.2278481 
##                                                                   Star Kid (1997) 
##                                                                         4.2278481 
##                                                  Ayn Rand: A Sense of Life (1997) 
##                                                                         4.2278481 
##                                                         Kicked in the Head (1997) 
##                                                                         4.2278481 
##                                                              Indian Summer (1996) 
##                                                                         4.2492647 
##                                                                Love Affair (1994) 
##                                                                         4.2278481 
##                                                            Band Wagon, The (1953) 
##                                                                         4.2278481 
##                                                             Penny Serenade (1941) 
##                                                                         4.2278481 
##                                                         'Til There Was You (1997) 
##                                                                         4.2278481 
##                                                                    Stripes (1981) 
##                                                                         4.2278481 
##                                                              Late Bloomers (1996) 
##                                                                         4.2278481 
##                                                               Getaway, The (1994) 
##                                                                         4.2278481 
##                                                               New York Cop (1996) 
##                                                                         4.2278481 
##                                             National Lampoon's Senior Trip (1995) 
##                                                                         4.2278481 
##                                                             Delta of Venus (1994) 
##                                                                         4.2278481 
##                                     Carmen Miranda: Bananas Is My Business (1994) 
##                                                                         4.2278481 
##                                                                  Babyfever (1994) 
##                                                                         4.2278481 
##                                                      Very Natural Thing, A (1974) 
##                                                                         4.2278481 
##                                                         Walk in the Sun, A (1945) 
##                                                                         4.2278481 
##                                                          Waiting to Exhale (1995) 
##                                                                         4.2278481 
##                                                      Pompatus of Love, The (1996) 
##                                                                         4.1836961 
##                                                                   Palmetto (1998) 
##                                                                         4.2278481 
##                                                         Surviving the Game (1994) 
##                                                                         4.2278481 
##                                                      Inventing the Abbotts (1997) 
##                                                                         4.2278481 
##                                                       Horse Whisperer, The (1998) 
##                                                                         4.2278481 
##                                                Journey of August King, The (1995) 
##                                                                         4.2278481 
##                                                                    Catwalk (1995) 
##                                                                         4.2278481 
##                                                            Neon Bible, The (1995) 
##                                                                         4.2278481 
##                                                                     Homage (1995) 
##                                                                         4.2278481 
##                                                                Open Season (1996) 
##                                                                         4.2278481 
##                                                     Metisse (Cafe au Lait) (1993) 
##                                                                         4.1836961 
##                                           Wooden Man's Bride, The (Wu Kui) (1994) 
##                                                                         4.2278481 
##                                                                     Loaded (1994) 
##                                                                         4.2278481 
##                                                                     August (1996) 
##                                                                         4.2278481 
##                                                                       Boys (1996) 
##                                                                         4.2278481 
##                                                                   Captives (1994) 
##                                                                         4.2278481 
##                                                        Of Love and Shadows (1994) 
##                                                                         4.2278481 
##                                                              Low Life, The (1994) 
##                                                                         4.2278481 
##                                                    An Unforgettable Summer (1994) 
##                                                                         4.2278481 
##                   Last Klezmer: Leopold Kozlowski, His Life and Music, The (1995) 
##                                                                         4.2278481 
##      My Life and Times With Antonin Artaud (En compagnie d'Antonin Artaud) (1993) 
##                                                                        -1.2278481 
##                                                   Midnight Dancers (Sibak) (1994) 
##                                                                         4.2278481 
##                                                           Somebody to Love (1994) 
##                                                                         4.2278481 
##                                                           American Buffalo (1996) 
##                                                                         4.2278481 
##                                                                     Kazaam (1996) 
##                                                                         4.2278481 
##                                                           Larger Than Life (1996) 
##                                                                         4.2278481 
##                                                                 Two Deaths (1995) 
##                                                                         4.2278481 
##                                                       Stefano Quantestorie (1993) 
##                                                                         4.2278481 
##                                                           Crude Oasis, The (1995) 
##                                                                         4.2278481 
##                                                                   Hedd Wyn (1992) 
##                                                                         4.2278481 
##                                                 Convent, The (Convento, O) (1995) 
##                                                                         4.2278481 
##                                                                 Lotto Land (1995) 
##                                                                         4.2278481 
##                                                      Story of Xinghua, The (1993) 
##                                                                         4.2278481 
##                               Day the Sun Turned Cold, The (Tianguo niezi) (1994) 
##                                                                         4.2278481 
##                                                                      Dingo (1992) 
##                                                                         4.2278481 
##                                 Ballad of Narayama, The (Narayama Bushiko) (1958) 
##                                                                         4.2278481 
##                                                        Every Other Weekend (1990) 
##                                                                         4.2278481 
##                                                            Mille bolle blu (1993) 
##                                                                         4.2278481 
##                                                         Crows and Sparrows (1949) 
##                                                                         4.2278481 
##                                                               Lover's Knot (1996) 
##                                                                         4.2278481 
##                                      Shadow of Angels (Schatten der Engel) (1976) 
##                                                                         4.2278481 
##                                                                      1-900 (1994) 
##                                                                         4.2278481 
##                                                              Venice/Venice (1992) 
##                                                                         4.2278481 
##                                                                   Infinity (1996) 
##                                                                         4.1654428 
##                                                             Ed's Next Move (1996) 
##                                                                         4.2278481 
##                                                             For the Moment (1994) 
##                                                                         4.2516413 
##                                                            The Deadly Cure (1996) 
##                                                                         4.2278481 
##                                                             Boys in Venice (1996) 
##                                                                         4.2278481 
##                                           Sexual Life of the Belgians, The (1994) 
##                                                                         4.2278481 
##                                              Search for One-eye Jimmy, The (1996) 
##                                                                         4.2278481 
##                                                            American Strays (1996) 
##                                                                         4.2278481 
##                                                           Leopard Son, The (1996) 
##                                                                         4.2278481 
##                                                               Bird of Prey (1996) 
##                                                                         4.2278481 
##                                                           Johnny 100 Pesos (1993) 
##                                                                         4.2278481 
##                                         JLG/JLG - autoportrait de decembre (1994) 
##                                                                         4.2278481 
##                                                                      Faust (1994) 
##                                                                         4.2278481 
##                                                            Mina Tannenbaum (1994) 
##                                                                         4.2278481 
##                                Forbidden Christ, The (Cristo proibito, Il) (1950) 
##                                                                         4.2278481 
##                                           I Can't Sleep (J'ai pas sommeil) (1994) 
##                                                                         4.2278481 
##                                                               Machine, The (1994) 
##                                                                         4.2278481 
##                                                              Stranger, The (1994) 
##                                                                         4.2278481 
##                                                               Good Morning (1971) 
##                                                                         4.2278481 
##                                                      Falling in Love Again (1980) 
##                                                                         4.2278481 
##                                                         Cement Garden, The (1993) 
##                                                                         4.2278481 
##                                                          Meet Wally Sparks (1997) 
##                                                                         4.1761539 
##                                                              Hotel de Love (1996) 
##                                                                         4.2278481 
##                                                             Rhyme & Reason (1997) 
##                                                                         4.2278481 
##                                                Love and Other Catastrophes (1996) 
##                                                                         4.2278481 
##                                                                Hollow Reed (1996) 
##                                                                         4.2278481 
##                                                               Losing Chase (1996) 
##                                                                         4.2278481 
##                                                                Bonheur, Le (1965) 
##                                                                         4.2278481 
##                                    Second Jungle Book: Mowgli & Baloo, The (1997) 
##                                                                         4.2278481 
##                                                                    Squeeze (1996) 
##                                                                         4.2278481 
##                                            Roseanna's Grave (For Roseanna) (1997) 
##                                                                         4.2278481 
##                                                     Tetsuo II: Body Hammer (1992) 
##                                                                         4.2278481 
##                                                                       Fall (1997) 
##                                                                         4.2278481 
##                                                                     Gabbeh (1996) 
##                                                                         4.2278481 
##                                                                      Mondo (1996) 
##                                                                         4.2278481 
##                                                        Innocent Sleep, The (1995) 
##                                                                         4.2278481 
##                                                            For Ever Mozart (1996) 
##                                                                         4.2278481 
##                                                               Locusts, The (1997) 
##                                                                         4.2278481 
##                                                                       Stag (1997) 
##                                                                         4.2278481 
##                                                         Swept from the Sea (1997) 
##                                                                         4.2278481 
##                                                          Hurricane Streets (1998) 
##                                                                         4.2278481 
##                                                                  Stonewall (1995) 
##                                                                         4.2278481 
##                                                           Of Human Bondage (1934) 
##                                                                         4.2278481 
##                                                                       Anna (1996) 
##                                                                         4.2278481 
##                                                      Stranger in the House (1997) 
##                                                                         4.2278481 
##                                                              Picture Bride (1995) 
##                                                                         4.2278481 
##                                                               M. Butterfly (1993) 
##                                                                         4.2278481 
##                                                          Ciao, Professore! (1993) 
##                                                                         4.2278481 
##                                                   Caro Diario (Dear Diary) (1994) 
##                                                                         4.2278481 
##                                                             Withnail and I (1987) 
##                                                                         4.2278481 
##                                                               Boy's Life 2 (1997) 
##                                                                         4.2278481 
##                                                      When Night Is Falling (1995) 
##                                                                         4.2655600 
##                                                            Specialist, The (1994) 
##                                                                         4.2278481 
##                                                                      Gordy (1995) 
##                                                                         4.2278481 
##                                                         Swan Princess, The (1994) 
##                                                                         4.2278481 
##                                                                     Harlem (1993) 
##                                                                         4.2278481 
##                                                                 Barbarella (1968) 
##                                                                         4.2278481 
##                     Land Before Time III: The Time of the Great Giving (1995) (V) 
##                                                                         4.2278481 
##                                                             Street Fighter (1994) 
##                                                                         4.2278481 
##                                                                Coldblooded (1995) 
##                                                                         4.2278481 
##                                                       Next Karate Kid, The (1994) 
##                                                                         4.2278481 
##                                                                  No Escape (1994) 
##                                                                         4.2278481 
##                                                               Turning, The (1992) 
##                                                                         4.2278481 
##                                                         Joy Luck Club, The (1993) 
##                                                                         4.2278481 
##                                               Highlander III: The Sorcerer (1994) 
##                                                                         4.2278481 
##                                               Gilligan's Island: The Movie (1998) 
##                                                                         4.2278481 
##                                               My Crazy Life (Mi vida loca) (1993) 
##                                                                         4.2278481 
##                                                                     Suture (1993) 
##                                                                         4.2278481 
##                                                          Walking Dead, The (1995) 
##                                                                         4.2278481 
##                                                        I Like It Like That (1994) 
##                                                                         4.2278481 
##                                                           I'll Do Anything (1994) 
##                                                                         4.2278481 
##                                                          Grace of My Heart (1996) 
##                                                                         4.2278481 
##                                                                     Drunks (1995) 
##                                                                         4.2278481 
##                                                                   SubUrbia (1997) 
##                                                                         4.2278481 
##                                                              Sliding Doors (1998) 
##                                                                         4.2278481 
##                                                           Ill Gotten Gains (1997) 
##                                                                         4.2278481 
##                                                               Legal Deceit (1997) 
##                                                                         4.2278481 
##                                                                Mighty, The (1998) 
##                                                                         4.2278481 
##                                                               Men of Means (1998) 
##                                                                         4.2278481 
##                                                              Shooting Fish (1997) 
##                                                                         4.2278481 
##                                                    Steal Big, Steal Little (1995) 
##                                                                         4.2278481 
##                                                                  Mr. Jones (1993) 
##                                                                         4.2278481 
##                                                              House Party 3 (1994) 
##                                                                         4.2278481 
##                                                                    Panther (1995) 
##                                                                         4.2278481 
##                                                              Jason's Lyric (1994) 
##                                                                         4.2278481 
##                                                              Above the Rim (1994) 
##                                                                         4.2278481 
##                                                    Moonlight and Valentino (1995) 
##                                                                         4.2278481 
##                                                        Scarlet Letter, The (1995) 
##                                                                         4.2278481 
##                                                                  8 Seconds (1994) 
##                                                                         4.2278481 
##                                                             That Darn Cat! (1965) 
##                                                                         4.2278481 
##                                                          Ladybird Ladybird (1994) 
##                                                                         4.2278481 
##                                                              Bye Bye, Love (1995) 
##                                                                         4.2278481 
##                                                                    Century (1993) 
##                                                                         4.2278481 
##                                                         My Favorite Season (1993) 
##                                                                         4.2278481 
##                                                            Pather Panchali (1955) 
##                                                                         4.2278481 
##                                                            Golden Earrings (1947) 
##                                                                         4.2278481 
##                                                      Foreign Correspondent (1940) 
##                                                                         4.2278481 
##                                                          Lady of Burlesque (1943) 
##                                                                         4.2278481 
##                                                       Angel on My Shoulder (1946) 
##                                                                         4.2278481 
##                                                       Angel and the Badman (1947) 
##                                                                         4.2278481 
##                                                                Outlaw, The (1943) 
##                                                                         4.2278481 
##                                                             Beat the Devil (1954) 
##                                                                         4.2278481 
##                                                       Love Is All There Is (1996) 
##                                                                         4.2278481 
##                                                      Damsel in Distress, A (1937) 
##                                                                         4.2278481 
##                                                           Madame Butterfly (1995) 
##                                                                         4.2278481 
##                                                                  Sleepover (1995) 
##                                                                         4.2278481 
##                                                          Here Comes Cookie (1935) 
##                                                                         4.2278481 
##                                                     Thieves (Voleurs, Les) (1996) 
##                                                                         4.2278481 
##                                                                  Boys, Les (1997) 
##                                                                         4.2278481 
##                                               Stars Fell on Henrietta, The (1995) 
##                                                                         4.2278481 
##                                                Last Summer in the Hamptons (1995) 
##                                                                         4.2278481 
##                                                          Margaret's Museum (1995) 
##                                                                         4.2278481 
##                                              Saint of Fort Washington, The (1993) 
##                                                                         4.2278481 
##                                                                  Cure, The (1995) 
##                                                                         4.2278481 
##                                                               Tom and Huck (1995) 
##                                                                         4.2278481 
##                                                           Gumby: The Movie (1995) 
##                                                                         4.2278481 
##                                                                   Hideaway (1995) 
##                                                                         4.2278481 
##                                             Visitors, The (Visiteurs, Les) (1993) 
##                                                                         4.2278481 
##                                                       Little Princess, The (1939) 
##                                                                         4.2278481 
##                                                         Nina Takes a Lover (1994) 
##                                                                         4.2278481 
##                                                         Bhaji on the Beach (1993) 
##                                                                         4.2278481 
##                                                                   Raw Deal (1948) 
##                                                                         4.2278481 
##                                                                 Nightwatch (1997) 
##                                                                         4.2278481 
##                                                            Dead Presidents (1995) 
##                                                                         4.2278481 
##                                                                   Reckless (1995) 
##                                                                         4.2278481 
##                                                         Herbie Rides Again (1974) 
##                                                                         4.2278481 
##                                                                     S.F.W. (1994) 
##                                                                         4.2278481 
##                                                Gate of Heavenly Peace, The (1995) 
##                                                                         4.2278481 
##                                                  Man in the Iron Mask, The (1998) 
##                                                                         4.2278481 
##                                                            Jerky Boys, The (1994) 
##                                                                         4.2278481 
##                                                        Colonel Chabert, Le (1994) 
##                                                                         4.2278481 
##                                                       Girl in the Cadillac (1995) 
##                                                                         4.2278481 
##                                                Even Cowgirls Get the Blues (1993) 
##                                                                         4.2278481 
##                                                                   Germinal (1993) 
##                                                                         4.2278481 
##                                                                    Chasers (1994) 
##                                                                         4.2278481 
##                                                                     Fausto (1993) 
##                                                                         4.2278481 
##                                                           Tough and Deadly (1995) 
##                                                                         4.2278481 
##                                                            Window to Paris (1994) 
##                                                                         4.2278481 
##                                                           Modern Affair, A (1995) 
##                                                                         4.2278481 
##                                                                 Mostro, Il (1994) 
##                                                                         4.2278481 
##                                                                      Flirt (1995) 
##                                                                         4.2278481 
##                                                                    Carpool (1996) 
##                                                                         4.2278481 
##                                              Line King: Al Hirschfeld, The (1996) 
##                                                                         4.2278481 
##                                                             Farmer & Chase (1995) 
##                                                                         4.2278481 
##                                                             Grosse Fatigue (1994) 
##                                                                         4.2278481 
##                                                         Santa with Muscles (1996) 
##                                                                         4.2278481 
##                              Prisoner of the Mountains (Kavkazsky Plennik) (1996) 
##                                                                         4.2278481 
##                                                          Naked in New York (1994) 
##                                                                         4.2278481 
##                                  Gold Diggers: The Secret of Bear Mountain (1995) 
##                                                                         4.2278481 
##                                                          Bewegte Mann, Der (1994) 
##                                                                         4.2278481 
##                                                Killer: A Journal of Murder (1995) 
##                                                                         4.2278481 
##                                                    Nelly & Monsieur Arnaud (1995) 
##                                                                         4.2278481 
##                                             Three Lives and Only One Death (1996) 
##                                                                         4.2278481 
##                                                            Babysitter, The (1995) 
##                                                                         4.2278481 
##                                                      Getting Even with Dad (1994) 
##                                                                         4.2278481 
##                                                               Mad Dog Time (1996) 
##                                                                         4.2278481 
##                                                 Children of the Revolution (1996) 
##                                                                         4.2278481 
##                                            World of Apu, The (Apur Sansar) (1959) 
##                                                                         4.2278481 
##                                                                     Sprung (1997) 
##                                                                         4.2278481 
##                                                      Dream With the Fishes (1997) 
##                                                                         4.2278481 
##                                                           Wings of Courage (1995) 
##                                                                         4.2278481 
##                                                          Wedding Gift, The (1994) 
##                                                                         4.2278481 
##                                                               Race the Sun (1996) 
##                                                                         4.2278481 
##                                                              Losing Isaiah (1995) 
##                                                                         4.2278481 
##                                                           New Jersey Drive (1995) 
##                                                                         4.2278481 
##                                                                  Fear, The (1995) 
##                                                                         4.2278481 
##                                                              Mr. Wonderful (1993) 
##                                                                         4.2278481 
##                                                              Trial by Jury (1994) 
##                                                                         4.2278481 
##                                                      Good Man in Africa, A (1994) 
##                                                                         4.2278481 
##                                                              Kaspar Hauser (1993) 
##                                                                         4.2278481 
##                                                Object of My Affection, The (1998) 
##                                                                         4.2278481 
##                                                                    Witness (1985) 
##                                                                         4.2278481 
##                                                                  Senseless (1998) 
##                                                                         4.2381740 
##                                                                    Nowhere (1997) 
##                                                                         4.2278481 
##                                                                Underground (1995) 
##                                                                         4.2278481 
##                                                         Jefferson in Paris (1995) 
##                                                                         4.2278481 
##                                Far From Home: The Adventures of Yellow Dog (1995) 
##                                                                         4.2278481 
##                                                            Foreign Student (1994) 
##                                                                         4.2278481 
##                         I Don't Want to Talk About It (De eso no se habla) (1993) 
##                                                                         4.2278481 
##                                                                  Twin Town (1997) 
##                                                                         4.2278481 
##                                                                  Enfer, L' (1994) 
##                                                                         4.2278481 
##                                                              Aiqing wansui (1994) 
##                                                                         4.2278481 
##                                                                       Cosi (1996) 
##                                                                         4.2278481 
##                                                                All Over Me (1997) 
##                                                                         4.2278481 
##                                                                Being Human (1993) 
##                                                                         4.2278481 
##                                               Amazing Panda Adventure, The (1995) 
##                                                                         4.2278481 
##                                                 Beans of Egypt, Maine, The (1994) 
##                                                                         4.2278481 
##                                                        Scarlet Letter, The (1926) 
##                                                                         4.2278481 
##                                                                      Johns (1996) 
##                                                                         4.2278481 
##                                                               It Takes Two (1995) 
##                                                                         4.2278481 
##                                                          Frankie Starlight (1995) 
##                                                                         4.2278481 
##                                                           Shadows (Cienie) (1988) 
##                                                                         4.2278481 
##                                                                  Show, The (1995) 
##                                                                         4.2278481 
##                                                              The Courtyard (1995) 
##                                                                         4.2278481 
##                                                                  Dream Man (1995) 
##                                                                         4.2278481 
##                                                 Destiny Turns on the Radio (1995) 
##                                                                         4.2278481 
##                                                          Glass Shield, The (1994) 
##                                                                         4.2278481 
##                                                                Hunted, The (1995) 
##                                                                         4.2278481 
##                                                            Underneath, The (1995) 
##                                                                         4.2278481 
##                                                               Safe Passage (1994) 
##                                                                         4.2278481 
##                                        Secret Adventures of Tom Thumb, The (1993) 
##                                                                         4.2278481 
##                                                              Condition Red (1995) 
##                                                                         4.2278481 
##                                                                Yankee Zulu (1994) 
##                                                                         4.2278481 
##                                                                  Aparajito (1956) 
##                                                                         4.2278481 
##                                                         Hostile Intentions (1994) 
##                                                                         4.2278481 
##                                              Clean Slate (Coup de Torchon) (1981) 
##                                                                         4.2278481 
##                                        Tigrero: A Film That Was Never Made (1994) 
##                                                                         4.2278481 
##                                      Eye of Vichy, The (Oeil de Vichy, L') (1993) 
##                                                                         4.2278481 
##                                            Promise, The (Versprechen, Das) (1994) 
##                                                                         4.2278481 
##                                                       To Cross the Rubicon (1991) 
##                                                                         4.2278481 
##                                                                      Daens (1992) 
##                                                                         4.2278481 
##                                                   Man from Down Under, The (1943) 
##                                                                         4.2278481 
##                                                                    Careful (1992) 
##                                                                         4.2278481 
##                                                      Vermont Is For Lovers (1992) 
##                                                                         4.2278481 
##                                          Vie est belle, La (Life is Rosey) (1987) 
##                                                                         4.2278481 
##                                                            Quartier Mozart (1992) 
##                                                                         4.2278481 
##                                         Touki Bouki (Journey of the Hyena) (1973) 
##                                                                         4.2278481 
##                                                    Wend Kuuni (God's Gift) (1982) 
##                                                                         4.2278481 
##                                Spirits of the Dead (Tre passi nel delirio) (1968) 
##                                                                         4.2278481 
##                                                             Pharaoh's Army (1995) 
##                                                                         4.2278481 
##                                     I, Worst of All (Yo, la peor de todas) (1990) 
##                                                                         4.2278481 
##                                                    Hungarian Fairy Tale, A (1987) 
##                                                                         4.2278481 
##                                Death in the Garden (Mort en ce jardin, La) (1956) 
##                                                                         4.2278481 
##                                                        Collectionneuse, La (1967) 
##                                                                         4.2278481 
##                                                                Baton Rouge (1988) 
##                                                                         4.2278481 
##                                                                   Liebelei (1933) 
##                                                                         4.2278481 
##                                                     Woman in Question, The (1950) 
##                                                                         4.2278481 
##                                                                      T-Men (1947) 
##                                                                         4.2278481 
##                                              Invitation, The (Zaproszenie) (1986) 
##                                                                         4.2278481 
##                                                    Symphonie pastorale, La (1946) 
##                                                                         4.2278481 
##                                                             American Dream (1990) 
##                                                                         4.2278481 
##                                                             Lashou shentan (1992) 
##                                                                         4.2278481 
##                                                     Terror in a Texas Town (1958) 
##                                                                         4.2278481 
##                                                              Salut cousin! (1996) 
##                                                                         4.2278481 
##                                                                Schizopolis (1996) 
##                                                                         4.2278481 
##                                                            To Have, or Not (1995) 
##                                                                         4.2278481 
##                                                             Duoluo tianshi (1995) 
##                                                                         4.2278481 
##                                                            Magic Hour, The (1998) 
##                                                                         4.2278481 
##                                                         Death in Brunswick (1991) 
##                                                                         4.2278481 
##                                                                    Everest (1998) 
##                                                                         4.2278481 
##                                                                   Shopping (1994) 
##                                                                         4.2278481 
##                                                          Nemesis 2: Nebula (1995) 
##                                                                         4.2278481 
##                                                             Romper Stomper (1992) 
##                                                                         4.2278481 
##                                                           City of Industry (1997) 
##                                                                         4.2278481 
##                                                     Someone Else's America (1995) 
##                                                                         4.2278481 
##                                                               Guantanamera (1994) 
##                                                                         4.2278481 
##                                                              Office Killer (1997) 
##                                                                         4.2278481 
##                                                      Price Above Rubies, A (1998) 
##                                                                         4.2278481 
##                                                                     Angela (1995) 
##                                                                         4.2278481 
##                                                         He Walked by Night (1948) 
##                                                                         4.2278481 
##                                                              Love Serenade (1996) 
##                                                                         4.2278481 
##                                                                      Buddy (1997) 
##                                                                         4.2278481 
##                                                                    B*A*P*S (1997) 
##                                                                         4.2278481 
##                                                Truth or Consequences, N.M. (1997) 
##                                                                         4.2278481 
##                                                         Intimate Relations (1996) 
##                                                                         4.2278481 
##                                                           Leading Man, The (1996) 
##                                                                         4.2278481 
##                                                                 Tokyo Fist (1995) 
##                                                                         4.2278481 
##                                                   Reluctant Debutante, The (1958) 
##                                                                         4.2278481 
##                                                         Warriors of Virtue (1997) 
##                                                                         4.2278481 
##                                                               Desert Winds (1995) 
##                                                                         4.2278481 
##                                                           King of New York (1990) 
##                                                                         4.2278481 
##                                                            All Things Fair (1996) 
##                                                                         4.2278481 
##                                                             Sixth Man, The (1997) 
##                                                                         4.2278481 
##                                                             Butterfly Kiss (1995) 
##                                                                         4.2278481 
##                                                              Paris, France (1993) 
##                                                                         4.2278481 
##                                                              Ceremonie, La (1995) 
##                                                                         4.2278481 
##                                                                       Hush (1998) 
##                                                                         4.2278481 
##                                        Nobody Loves Me (Keiner liebt mich) (1994) 
##                                                                         4.2278481 
##                                                                  Wife, The (1995) 
##                                                                         4.2278481 
##                                                                   Lamerica (1994) 
##                                                                         4.2278481 
##                                                                  Nico Icon (1995) 
##                                                                         4.2278481 
##                                Silence of the Palace, The (Saimt el Qusur) (1994) 
##                                                                         4.2278481 
##                                                             Slingshot, The (1993) 
##                                                                         4.2278481 
##                                       Land and Freedom (Tierra y libertad) (1995) 
##                                                                         4.2278481 
##                                                A koldum klaka (Cold Fever) (1994) 
##                                                                         4.2278481 
##                                   Etz Hadomim Tafus (Under the Domin Tree) (1994) 
##                                                                         4.2278481 
##                                                               Two Friends (1986)  
##                                                                         4.2278481 
##                                                        Brothers in Trouble (1995) 
##                                                                         4.2278481 
##                                                                 Girls Town (1996) 
##                                                                         4.2278481 
##                                                                Normal Life (1996) 
##                                                                         4.2278481 
##                                               Bitter Sugar (Azucar Amargo) (1996) 
##                                                                         4.2278481 
##                                                            Eighth Day, The (1996) 
##                                                                         4.2278481 
##                                                                   Dadetown (1995) 
##                                                                         4.2278481 
##                                                          Some Mother's Son (1996) 
##                                                                         4.2278481 
##                                                                 Angel Baby (1995) 
##                                                                         4.2278481 
##                                                           Sudden Manhattan (1996) 
##                                                                         4.2278481 
##                                                           Butcher Boy, The (1998) 
##                                                                         4.2278481 
##                                                              Men With Guns (1997) 
##                                                                         4.2278481 
##                                                                    Hana-bi (1997) 
##                                                                         4.2278481 
##                                                           Niagara, Niagara (1997) 
##                                                                         4.2278481 
##                                                               Big One, The (1997) 
##                                                                         4.2278481 
##                                                      Spanish Prisoner, The (1997) 
##                                                                         4.2278481 
##                                                  Temptress Moon (Feng Yue) (1996) 
##                                                                         4.2278481 
##                                 Entertaining Angels: The Dorothy Day Story (1996) 
##                                                                         4.2278481 
##                                                                 Favor, The (1994) 
##                                                                         4.2278481 
##                                                                Little City (1998) 
##                                                                         4.2278481 
##                                                                     Target (1995) 
##                                                                         4.2278481 
##                                                   Getting Away With Murder (1996) 
##                                                                         4.2278481 
##                                                                Small Faces (1995) 
##                                                                         4.2278481 
##                                                               New Age, The (1994) 
##                                                                         4.2278481 
##                                                                Rough Magic (1995) 
##                                                                         4.2278481 
##                                                           Nothing Personal (1995) 
##                                                                         4.2278481 
##                                                    8 Heads in a Duffel Bag (1997) 
##                                                                         4.2278481 
##                                                          Brother's Kiss, A (1997) 
##                                                                         4.2278481 
##                                                                       Ripe (1996) 
##                                                                         4.2278481 
##                                                             Next Step, The (1995) 
##                                                                         4.2278481 
##                                                         Wedding Bell Blues (1996) 
##                                                                         4.2278481 
##                                                          MURDER and murder (1996) 
##                                                                         4.2278481 
##                                                                    Tainted (1998) 
##                                                                         4.2278481 
##                                                         Further Gesture, A (1996) 
##                                                                         4.2278481 
##                                                                       Kika (1993) 
##                                                                         4.2278481 
##                                                                     Mirage (1995) 
##                                                                         4.2278481 
##                                                                 Mamma Roma (1962) 
##                                                                         4.2278481 
##                                                             Sunchaser, The (1996) 
##                                                                         4.2278481 
##                                                           War at Home, The (1996) 
##                                                                         4.2278481 
##                                                              Sweet Nothing (1995) 
##                                                                         4.2278481 
##                                                                 Mat' i syn (1997) 
##                                                                         4.2278481 
##                                                                  B. Monkey (1998) 
##                                                                         4.2278481 
##                                                               You So Crazy (1994) 
##                                                                         4.2278481 
##                                         Scream of Stone (Schrei aus Stein) (1991) 
##                                                                         4.2278481
# con un total de valoraciones (iniciales y predichas)
rowCounts(recom.ini)
##  239 
## 1664
# frente al numero inicial de valoraciones disponibles
rowCounts(r[x]) 
## 239 
## 158

La representación del resultado la podemos mostrar del siguiente modo:

ggplot(data = recomS, aes(x =item, y = rating)) + 
  geom_col() + coord_flip() + 
  labs(x = "",y="Valoracion",title="películas recomendadas") + 
  theme_bw()

Evaluación de sistemas de recomendación con recommenderlab

Una de las ventajas de la librería recommenderlabes que permite construir sistemas de recomendación y lo que es más interesante, testarlos. A continuación abordamos la evaluación de algoritmos de recomendación. recommenderlab implementa varios metodos de evaluación estándar para sistemas de recomendación. Para hacer esta evaluación, se particionan los datos en dos trozos: entrenamiento y testeo

En el ejemplo siguiente se dividen los datos en una muestra de entrenamiento para estimar el modelo de recomendación (90%) y una muestra de testeo para comparar los modelos ajustados y testarlos. En el conjunto de testeo utilizaremos m items para el algoritmo de recomendación y el resto se utilizaran para calcular el error. m ha de ser menor o igual al minimo de valoraciones que han realizado los usuarios.

m=min(rowCounts(r));m
## [1] 19

Especificamos el metodo de evaluación de los modelos de recomendación

e=evaluationScheme(r,method="split", train=0.9,given=m, goodRating=5); e
## Evaluation scheme with 19 items given
## Method: 'split' with 1 run(s).
## Training set proportion: 0.900
## Good ratings: >=5.000000
## Data set: 943 x 1664 rating matrix of class 'realRatingMatrix' with 99392 ratings.

los metodos posibles para particionar los datos (entrenamiento/testado) son method="split", "cross-validation", "bootstrap"

Construimos dos sistemas de recomendación: user-based e item-based, utilizando la muestra de entrenamiento

r1 <- Recommender(getData(e, "train"), "UBCF") 
r2 <- Recommender(getData(e, "train"), "IBCF") 
r1;r2
## Recommender of type 'UBCF' for 'realRatingMatrix' 
## learned using 848 users.
## Recommender of type 'IBCF' for 'realRatingMatrix' 
## learned using 848 users.

y se calculan las predicciones de las valoraciones para la parte conocida (m) de los datos de testeo (10%) que hemos dejado fuera de la muestra de entrenamiento, es decir, para los items (películas) que estan valorados.

p1 <- predict(r1, getData(e, "known"), type="ratings") 
p2 <- predict(r2, getData(e, "known"), type="ratings") 
p1;p2
## 95 x 1664 rating matrix of class 'realRatingMatrix' with 156275 ratings.
## 95 x 1664 rating matrix of class 'realRatingMatrix' with 7810 ratings.

Finalmente se calculan las métricas de error promediadas por usuario y después promediadas sobre todas las recomendaciónes

error <- rbind(
  UBCF = calcPredictionAccuracy(p1, getData(e, "unknown")),
  IBCF = calcPredictionAccuracy(p2, getData(e, "unknown")))
error
##          RMSE      MSE       MAE
## UBCF 1.026416 1.053530 0.8250678
## IBCF 1.409556 1.986847 0.9567568

La función devuelve MSA=Mean average error, MSE=means squared error, RMSE=root means squared error En este ejemplo user-based tiene un error inferior y es preferible.

EJERCICIOS

  1. Con la base de datos MoviLense, modificar los parámetros utilizados en el sistema basado en contenido y valorar las modificaciones en el resultado
  2. Con la base de datos MoviLense, reconvertir a binarios los datos utilizando la valoracion 4 como frontera y lanzar algún algoritmo de recomendación apropiado para obtener las 10 recomendaciónes del usuario u_x
  3. Repetir el analisis de recomendación con la bd Jester5K(recommenderlab)
# AYUDA: para reconvertir a datos binarios
binarize(r, minRating=4)
## 943 x 1664 rating matrix of class 'binaryRatingMatrix' with 55024 ratings.
# AYUDA: BD Jester5k
data(Jester5k) 
r=Jester5k;r
## 5000 x 100 rating matrix of class 'realRatingMatrix' with 362106 ratings.
# The data set contains a sample of 5000 users from the anonymous ratings data 
# from the Jester Online Joke Recommender System collected between April 1999 
# and May 2003.
r=sample(Jester5k,50)
getRatingMatrix(r)
## 50 x 100 sparse Matrix of class "dgCMatrix"
##                                                                         
## u24911  .    -8.79  8.01  .     5.29  1.84  2.91  4.51  .    -3.64  3.11
## u19448 -6.31 -5.24 -0.63  4.32  6.36  0.15 -0.39 -6.21 -4.51 -9.56 -4.32
## u20529  .     .     .     .    -1.12  .    -3.30 -1.07  .     .     .   
## u2781  -9.42 -9.61 -0.29 -9.61 -9.81  7.28  6.89 -5.53 -9.42 -7.86 -7.86
## u19031  3.35 -1.31 -4.85 -2.77 -4.42  5.05  2.82 -4.47 -3.01  2.96 -2.33
## u828    4.51 -7.28  3.06 -4.37  2.23  0.19  0.49  2.09 -4.37 -3.45  1.94
## u1109   .     .     .     .    -9.03  .     7.14  6.89  .     .     0.83
## u10459  .     .     .     .     3.11 -1.65  2.62 -4.47  .     .     .   
## u13086  1.70  1.60 -7.86 -5.73 -4.85  7.72  0.53 -3.06  8.35 -3.45  2.52
## u20897 -2.57  6.31 -5.39  8.45 -6.41  5.44  4.95 -1.94  4.27  5.39 -6.70
## u2864  -1.41 -2.96  0.63  1.70  6.12 -4.27 -3.54 -8.25 -1.60 -5.10 -3.06
## u18057  8.11  9.03  4.76  2.43 -7.33  9.27  6.99 -1.80 -9.90 -9.85 -8.74
## u16322  .     .     .     .    -2.18  .     6.80 -0.58  .     .     .   
## u12555  6.84  7.33  6.02  8.74 -4.17  6.50  2.67 -1.60  7.77  5.19  8.45
## u17019 -3.83  1.50  2.14 -4.03 -1.12  4.08  1.41 -1.21 -3.98 -4.47 -4.08
## u11009  .     .     .     .    -8.88  2.43 -8.93  1.46  .     0.00  .   
## u6564   3.30 -4.32 -7.28 -7.52 -0.34  3.30  2.14 -9.37 -2.52  8.69  3.11
## u14537  .     .     .     .     5.92  .     2.86  3.06  .     .    -0.34
## u4686   3.93  2.28  3.59 -6.75  2.62 -7.09  7.57  4.32 -8.25  1.07 -6.02
## u22472 -2.91  1.60  7.23  0.24  0.49  1.75 -0.34 -1.55 -0.44 -5.83  3.74
## u15163  2.67 -4.81  1.70 -3.30 -8.35 -2.91 -9.90  1.21  1.36  1.36  0.05
## u20564  .     1.60 -3.64  .     3.93  2.67  1.65 -3.69 -8.20 -5.83 -3.16
## u9513   3.30  2.28  3.45  3.93 -3.74  2.86  2.91  1.55  0.97  3.11  3.40
## u3548   .    -7.43  0.19  .     1.99 -1.80  3.74  3.25  .     0.24  2.96
## u8958   .    -3.59  .     .     1.17 -2.38 -5.00 -8.40  .     0.53  6.65
## u9436  -0.15 -3.83  0.78 -2.28  1.07  3.20  1.36 -1.94  1.12 -0.15  5.44
## u6404   8.98  8.59  8.74  8.59  4.95  8.98 -5.15 -0.63  8.64  8.74  8.98
## u731    2.38  3.35  8.35  7.62 -8.20  6.46 -8.30  7.28  2.14  0.10  7.52
## u8743   .     .     .     .     3.64  .     6.41  1.26  .    -0.92  4.51
## u814    3.06 -9.37  1.50  2.52  5.49  7.57  1.70 -4.66 -6.84  4.22  3.06
## u7866   .     .     .     .     5.49  .    -0.73  4.90  .     .     .   
## u18397 -3.01  3.88  0.68 -1.75  6.26  1.60  3.06  7.14 -4.85  3.88  3.54
## u19751 -8.64  6.94 -8.79 -1.02 -1.21 -0.83  0.58 -9.22 -9.95 -2.14  7.91
## u13407  3.88  3.11  7.91  4.13  1.07  4.13  2.09  0.58  5.49  3.54  5.83
## u12978 -9.90 -5.87  7.82  7.09  2.91  5.68  4.85  7.33  .     5.05 -1.50
## u19038  8.40  1.60 -2.62 -6.31  1.17  3.30  0.53 -1.07 -7.38  2.33  6.21
## u24436  .    -4.32  .     .    -8.20 -3.74 -5.73  4.56  .    -5.19 -2.96
## u19765 -1.46 -9.47  2.96  1.21 -4.51  0.34  0.63  1.21  1.75  0.83  1.17
## u12259  8.54  8.01  7.14  8.88  5.68  8.88  8.35  7.33 -3.74  9.13  8.30
## u15320  0.05 -4.32 -6.80 -8.11 -1.60 -0.73 -2.52 -3.40 -7.09  1.89 -2.38
## u14934 -7.04  2.28 -4.08  .    -0.39  0.29 -7.48 -1.94 -4.08 -9.71  6.70
## u969    .    -1.55  .     .    -3.01  .     6.26 -2.82  .    -5.83  .   
## u13795 -0.34  6.55 -0.34 -2.04 -0.58 -5.78 -0.05 -5.83 -4.81 -0.44 -0.15
## u3752   7.67  7.28 -0.29 -6.31  6.89 -3.40 -8.06  4.56 -0.29 -0.29  3.01
## u14729  .     .     .     .    -9.76  8.16 -9.66 -9.71  .     .     .   
## u1841   .     .     .     .    -9.61  .     7.48  4.47  .     .     7.14
## u687    .    -2.18  .     .     5.10  .     5.44  0.29  .     6.60  6.80
## u18902 -3.35 -0.44  3.35 -4.51  1.02 -1.50  2.43  3.88 -0.05  8.50  6.02
## u11109 -4.76 -0.53  7.96  4.66 -2.57  4.13  8.06  1.31 -6.70  1.26  0.39
## u11283 -0.97  2.23 -8.69  0.34  .    -3.11 -3.20 -5.19 -9.66  .     0.05
##                                                                         
## u24911  5.78  2.43  7.72 -3.74 -8.98 -3.35  6.21  2.82 -7.82  7.52  5.39
## u19448 -0.19  0.78 -1.07 -0.19  0.83 -6.36  2.33  1.41 -1.50 -1.26  1.41
## u20529 -2.43 -1.21  .     2.52  1.21 -3.88  3.45  3.20 -2.91 -2.82  .   
## u2781  -0.29 -9.42  0.10 -9.42 -9.42 -9.81  5.34 -9.61 -0.49  9.22 -9.61
## u19031 -0.53 -4.51 -1.55  0.68 -4.32 -4.37 -4.32  3.50 -2.72 -0.58  1.50
## u828    0.73 -4.51  0.19 -7.09  2.23 -1.94 -7.62 -7.14 -3.50  4.37 -6.60
## u1109   .    -8.59  .     6.36  0.83  0.63  0.87  5.19 -0.78  7.86  .   
## u10459 -5.87 -8.54 -0.44  2.14 -6.36  1.17  2.38 -0.24 -1.94  1.26 -0.87
## u13086 -8.25 -8.74  1.46 -6.21 -0.53 -3.20 -5.44  0.44  5.15 -0.68 -1.50
## u20897 -9.08  5.05  5.78 -7.62 -5.92  6.75 -0.05 -3.54 -6.31  5.97  5.97
## u2864   2.48 -6.70 -5.83 -6.02 -6.17 -5.68 -1.55  0.29 -5.92 -4.27 -2.72
## u18057 -8.83  5.63  5.34  2.43 -9.27  2.96 -5.39  5.87 -0.53  8.25 -6.07
## u16322  .     1.41  .     2.04  5.53 -0.49 -5.87  0.00 -4.90 -0.58  .   
## u12555  5.87  2.91  7.09 -4.03  2.28  0.92  1.94  2.09 -4.76  5.97  6.65
## u17019  7.67 -6.94  1.94 -4.90 -3.69 -3.64 -3.35  1.94 -3.16  5.19  8.11
## u11009  2.72 -6.17  8.30 -6.17  3.40  6.26  2.23 -0.97  1.60 -9.22 -8.25
## u6564  -1.02  6.21  4.47 -4.37  3.74  2.09 -5.05 -5.19 -5.19  2.04 -4.17
## u14537  .    -1.12  .    -7.57  1.89 -4.32  4.95  0.53  3.35  7.23  .   
## u4686   0.63  5.92 -9.27  6.02 -5.92  2.52  4.42 -2.77 -4.22 -4.90 -4.90
## u22472  4.47 -6.02 -0.15 -3.98 -7.72  2.77 -1.31  5.63  1.89  0.58  0.15
## u15163  2.09 -5.24  0.05 -3.93 -9.76 -4.37 -5.19 -2.43  1.21  3.16  1.65
## u20564 -4.08 -3.35  0.05 -0.29  2.04 -4.17 -1.84  3.35  3.88  0.49 -1.70
## u9513  -2.57  1.99  3.54  2.91 -1.31 -0.83  2.62  0.05  0.83  3.01  1.84
## u3548  -0.19 -0.92 -0.58  2.72 -4.37  2.43 -3.93 -0.58 -1.50  2.82 -0.73
## u8958   2.28 -7.86  1.17 -7.86 -7.86  7.09 -8.83  3.88 -0.97  5.78 -0.19
## u9436   0.73 -1.94 -1.70 -0.63 -1.65  0.63 -1.65 -2.62 -2.62  0.10 -2.96
## u6404  -9.56 -5.92 -5.53 -5.00 -0.49 -9.22 -3.64  3.98  3.30  0.83 -9.76
## u731    8.98 -4.08  3.11  3.20 -8.79  6.55 -9.66 -9.47  0.49  4.13 -0.49
## u8743   1.89  1.65  4.22 -0.87 -2.52  1.26 -0.05  5.00  5.05  4.56  2.09
## u814    7.14 -5.34 -1.17 -0.19 -7.91  1.75 -6.94  1.41 -4.85  9.08  3.98
## u7866   .    -0.15  .     3.50 -1.26 -0.58  6.12  5.78  6.65  7.38  4.22
## u18397 -3.40 -5.29 -7.67  3.16  0.10  5.68  1.17  1.07 -1.12 -2.38 -7.86
## u19751 -9.66 -9.08 -8.98 -5.39 -8.35 -0.92 -6.80 -8.01 -8.01  1.60 -6.07
## u13407 -0.83 -2.48  2.82  1.75  1.46  3.16 -5.73  5.10  2.82  4.13  5.15
## u12978  2.72 -9.85  8.35 -9.85 -7.91  3.16 -0.83 -4.17 -0.63  9.32  6.36
## u19038  4.08  6.12 -4.71  4.17 -6.36  1.55 -3.64  5.05  3.50  4.90  2.38
## u24436 -4.17 -0.58  5.44 -5.39 -8.35  4.56  1.02 -3.93  1.99  4.81  1.36
## u19765  2.91 -5.78  3.50 -5.83 -5.68 -2.33  1.75  2.33  3.88  3.59  2.52
## u12259  8.83  7.72  7.14  8.11  8.35  7.67  7.04  7.09  7.57  8.93  8.11
## u15320  2.04 -4.71  0.34 -4.56 -6.41 -0.92 -3.74 -2.96 -4.76 -1.12 -1.02
## u14934  5.97  1.70  4.37 -6.60 -0.10 -6.36 -5.49  1.31 -4.42  3.35  3.98
## u969    .    -3.11  .     1.26 -8.64  2.38 -3.59  0.53 -4.08  .     .   
## u13795 -0.24  0.68 -0.10 -8.01 -6.94 -0.53  3.06 -0.24  3.40  6.55 -3.50
## u3752  -8.25 -8.25 -0.29  4.76 -9.42 -0.29  6.12 -7.09 -6.70  6.12  3.20
## u14729  .    -9.90  .    -9.37 -9.85 -8.74 -9.61 -9.47 -9.66 -9.90  9.17
## u1841   8.01 -4.08  6.94 -4.61 -9.22  1.31  2.52  5.29  8.20  7.91  .   
## u687    .     5.05  2.72 -1.65 -5.63  2.09 -0.29 -0.49 -1.17  5.05  .   
## u18902  0.24 -9.51 -2.18 -9.47 -7.48 -0.39  1.84 -3.69  8.54  2.86  5.73
## u11109  7.18  2.04  8.64 -9.08 -8.01 -0.10 -0.24  7.18  1.17 -0.58 -0.83
## u11283 -4.17 -4.76  0.83 -3.40  .     4.03 -9.90 -1.02  2.14 -3.69 -5.83
##                                                                         
## u24911  3.35  .    -8.25  7.91  7.48 -0.24  5.97  .    -9.03 -0.15  .   
## u19448 -9.76 -3.45 -4.08 -2.82  1.99  0.78 -0.15 -5.97  4.08 -2.77 -4.47
## u20529  .     .     .    -3.59 -0.73  2.96 -4.61  .     1.75  0.73  .   
## u2781  -7.86 -9.61 -9.61  0.68  9.22  9.03  2.62  2.62 -9.61  4.37 -9.61
## u19031  2.52 -2.77 -1.02  0.29  3.88 -1.17 -3.64 -1.21 -4.13  9.17  6.07
## u828    1.99 -0.58 -0.78 -5.44  6.99  2.38  7.23 -3.79  7.43 -8.74  5.78
## u1109   7.38  .     .     5.87  6.55  5.87  5.63  .     7.48  6.12  .   
## u10459  .     .     .     0.58  1.41  3.64  4.61  .    -5.39  3.45  .   
## u13086  2.09 -6.31 -3.74 -0.49 -3.83 -8.11 -4.76  0.97 -9.37  5.15 -5.68
## u20897  5.05 -0.63  3.83  5.97 -6.12  6.94  5.97  5.05  7.48 -1.26 -7.52
## u2864   0.97 -1.55 -6.99 -5.39  2.48 -5.92  1.50 -7.72 -3.88  0.73  0.19
## u18057  6.89 -9.90 -0.24 -0.39  8.54  1.41  8.06 -0.44  6.41  9.17 -9.85
## u16322  .     .     .    -1.17  0.68 -5.53  2.38  .     1.02 -1.94  .   
## u12555  6.41 -3.11  7.43  8.20 -0.19  5.34  8.25  5.78  4.17  5.78  6.84
## u17019  1.99 -4.03  2.82 -3.83  6.07 -2.77  3.74 -3.50  2.96 -5.10 -3.40
## u11009  8.30  .    -9.27 -9.17  0.15  8.25  3.30 -8.83 -0.49  6.80  .   
## u6564   2.77 -9.13 -0.49 -9.61  4.37 -0.92 -7.57 -4.22  2.43  4.13  3.54
## u14537  .     .     .     2.33  7.91  8.01  3.11  .     7.43  2.91  .   
## u4686  -7.23 -8.40 -7.57 -5.10  6.36  0.83  6.26 -4.37 -0.34  6.21  3.30
## u22472 -6.70  0.58 -8.01 -0.19 -0.44  3.16  3.25  0.97  1.36  4.85 -7.04
## u15163  0.29 -0.29 -3.01  0.44  1.26  3.40  0.19 -2.28 -4.37  4.22 -1.02
## u20564  1.31 -1.02 -2.18 -1.17 -1.41  .     6.70  .     4.51  6.46  .   
## u9513   2.52  2.57  1.84  4.03  6.55  6.89  2.67  3.25 -1.07  5.97  0.15
## u3548  -6.41  .    -3.88  1.36  0.19  2.77  3.16 -0.15  2.62  3.59  .   
## u8958   7.72  .     0.53  3.45 -1.60  4.71 -9.76  .     2.52 -9.08  .   
## u9436   0.49 -3.93 -1.21  0.29  1.80 -0.15  0.63 -1.60 -0.10  1.12 -1.50
## u6404   8.98  8.11 -9.56 -0.68  8.83  8.25 -0.29  9.03  8.50  8.64 -9.66
## u731    6.36 -3.45  3.69  4.42  8.64  4.56 -0.15  7.62  6.21 -0.58  7.67
## u8743   .     .     4.32  2.96 -1.17  4.56  4.22  .     4.76  4.03  .   
## u814   -2.86  0.44  5.58  1.60  1.50 -0.29  6.70 -3.06  7.14  3.20 -4.76
## u7866   .     .     .     .     7.09  7.09  1.94  .     .     8.11  .   
## u18397 -2.91 -7.38 -3.35 -3.74  7.09 -3.59  3.30 -3.64  6.21  7.28  5.34
## u19751 -0.34 -8.74  1.07 -8.88  6.60 -8.25  5.34 -8.79  5.87  5.87  8.16
## u13407  1.60  3.30  2.82 -1.60  3.16  4.13  3.01  6.99  7.57  5.15  4.32
## u12978  4.27  .     2.43  3.20  5.15  1.80  2.82 -2.96  6.75  7.67 -7.14
## u19038  6.75 -8.20 -5.68  2.38  6.84  1.80  7.33 -6.02  8.30  1.41  3.79
## u24436 -4.22  .    -3.40  3.88  3.16  3.20  1.80  .     4.81  4.76  .   
## u19765 -1.07 -2.67  0.68  2.96  0.87  6.02  2.82 -1.26  2.48  2.62  1.21
## u12259  8.20  9.08  9.13  6.36  7.43  9.32  8.83  7.77  7.23  6.65  7.23
## u15320 -4.71 -5.19 -0.83  1.26  4.76 -4.08  4.08 -6.12  1.65  2.14 -9.32
## u14934  6.26  .     4.66  5.68  7.62  4.95  3.45 -4.08  4.37  1.80  .   
## u969    .     .     .     .     0.92  .     1.75  .     3.20  5.34  .   
## u13795 -0.29 -3.59  3.74  5.87  3.59  0.15  2.82  3.69  5.83  4.71 -1.17
## u3752  -7.86 -0.29  5.73 -0.29  4.56  9.03  8.83 -0.29 -6.50  6.31 -0.29
## u14729  8.98  .     .    -9.71 -9.90 -9.71 -8.59  .    -8.35 -8.64  .   
## u1841   .     .     .     6.94  8.54  9.27  8.35  .     8.59  7.48  .   
## u687    .     .     .     5.53  6.94  4.85  8.30  .     6.55  4.85  3.74
## u18902  6.84 -0.49  0.83 -1.02 -0.49  6.02  9.13 -3.35 -7.72  8.93 -2.72
## u11109  4.81  1.80 -6.70  8.59  8.06  2.38  5.87  4.56  8.06  8.35  1.70
## u11283 -3.40  .    -7.62  0.53  1.36  1.70 -3.64  0.87  2.04  2.33 -2.72
##                                                                         
## u24911 -2.43  4.27  0.68  .     8.69 -2.38 -2.14  5.78  3.54  .     .   
## u19448 -0.19 -0.63 -0.19 -4.47 -1.94 -6.12 -4.42 -5.00 -0.29  0.34 -2.77
## u20529  .     2.28  3.30  .     1.60 -4.32  .     .    -0.73  .     .   
## u2781  -9.42 -9.42  2.82 -0.29 -0.29 -5.53 -7.86  8.83 -7.86 -0.29 -9.61
## u19031 -1.84  0.00 -0.92 -7.57 -0.73 -0.73  2.18  4.76 -2.18 -4.47 -5.00
## u828    5.49  0.87  6.75 -7.23  5.97  0.97  6.12 -8.88 -7.82 -8.30 -9.08
## u1109   .     7.67  6.94  .     .     .     6.41  .     .     .     .   
## u10459  .     4.03  6.36  .    -5.00  .    -8.93  .     3.40  .     .   
## u13086 -1.12 -1.46  2.18  2.38 -2.48  0.73 -9.17 -0.53 -9.08  8.30 -7.57
## u20897  5.97  7.14  7.33  6.55  7.91  6.26  6.26  6.26  7.04 -3.74 -0.49
## u2864  -1.50 -4.47  0.29 -9.85 -3.35 -7.18 -0.44 -9.32 -5.19 -7.72 -0.24
## u18057 -4.17  4.47  8.88  2.86 -7.04  7.72  8.69  6.55  6.80 -4.81  .   
## u16322 -2.96  0.39 -4.08  .    -1.80  .     .     .    -0.24  .     .   
## u12555  7.04  7.09  5.53  6.99  5.58  6.21  6.60  6.99  5.58  2.86  3.50
## u17019  3.20  3.25  3.64 -4.03 -1.65  3.11 -3.35 -2.77 -1.60 -4.13 -4.08
## u11009 -9.32  5.19  6.84  .     2.86 -8.79 -8.11  .    -9.22  .     .   
## u6564   2.72  1.70  0.83 -9.22  4.95 -0.78  2.91 -3.93  6.21  1.75  8.88
## u14537  .     6.75  5.24  .     1.31  .     .     .     8.54  .    -4.22
## u4686  -7.62  7.18  5.44  4.17  1.50 -6.17  3.06 -7.77 -7.72 -3.79 -7.57
## u22472  0.49  1.84  1.07 -0.49  1.26  6.89  0.92 -6.36 -1.12  1.36 -4.85
## u15163  0.58  1.65  3.35  0.53 -0.05 -3.59  1.60 -3.01  2.82  1.55 -3.20
## u20564  .     1.94  4.47  .     3.11  3.01 -4.66  .     .    -8.40  .   
## u9513   4.27  5.24  2.18  1.26  2.57  4.51  4.13 -2.82  4.51 -0.34  1.89
## u3548  -4.90  2.67  2.23  .    -4.85  0.34  5.39 -7.23  0.29  .     .   
## u8958   0.44  7.04  3.59 -7.57  1.02  7.86  6.60  .     7.04 -3.79  .   
## u9436  -2.04 -2.82  2.96  2.23 -1.21 -0.29 -1.41 -3.25 -3.59 -3.16 -1.94
## u6404  -9.42  5.05  6.99  8.79  3.98  4.76  6.89 -9.32 -9.56  9.03  8.69
## u731    5.44  3.69  2.33 -0.58  8.45  0.97  8.06 -9.17 -0.53  0.53 -8.79
## u8743   .     2.86  4.61  .    -1.46  3.98  3.01  5.00  5.44  .     .   
## u814    6.36  7.72  7.14 -9.37  0.00 -0.78  4.13 -0.10  5.49 -3.69 -7.09
## u7866   .     5.10  6.21  2.33  1.50  6.60  .     .     2.91  .     5.92
## u18397 -4.66 -4.66  6.36 -0.05  1.17  0.10 -0.44 -5.10 -2.18 -5.92  8.64
## u19751 -8.25  4.81  6.60  0.24 -8.01 -9.56 -0.34 -8.79 -8.88 -8.64 -8.35
## u13407  0.29  6.17  3.98  4.13 -2.67  3.54  5.87 -4.90  3.64 -4.42  2.43
## u12978  0.05  7.67  2.28  .     0.24  6.41 -1.31 -3.11  0.53  6.70  .   
## u19038  6.12  8.01 -4.22 -9.27  7.86  2.04  6.99  5.29  0.29 -4.51 -8.98
## u24436 -4.17  4.56  4.81  .     4.32  6.07 -5.05 -6.26  6.41 -6.26  .   
## u19765  0.92  5.05  0.53 -6.94  1.55  1.84  3.35  4.32  3.74 -4.51 -4.76
## u12259  8.40  8.20  8.16 -4.56  8.98  3.20  8.98  8.64  8.79  7.52  7.82
## u15320  2.38  2.72  3.35 -9.13  2.43  2.38 -0.19 -8.11  0.63  1.46 -6.60
## u14934  8.88  0.97  3.06  .     6.60  3.74  1.26 -4.08  4.56 -6.70  .   
## u969    .    -1.60  4.71  .     .     .     6.84  .     .     .     .   
## u13795 -7.04  7.43  7.57 -1.21 -0.10 -5.19  3.30  3.74  1.55  2.86 -5.58
## u3752  -6.89  7.09  3.59  7.28 -7.86 -0.29  3.98 -0.29 -0.29 -7.86 -0.29
## u14729 -8.88 -9.61 -9.66  .     .    -9.37  .     .     3.50  .     .   
## u1841   .     7.77  8.45 -9.42  .     7.91  6.99  .     8.16  .     .   
## u687    .     8.25  5.97  1.41  1.50  .     .     .     1.65  .     .   
## u18902 -6.21  9.08  0.58  2.14  1.84  4.61  3.88  5.15 -4.76  0.97 -3.45
## u11109 -0.34  4.71  8.06  8.20  2.38  8.59  2.33 -3.45 -1.70 -3.06 -9.42
## u11283 -5.73 -9.47 -3.45  2.48 -3.30 -7.91  2.33 -9.47 -4.22 -9.47 -9.76
##                                                                         
## u24911  6.12  8.25 -9.37 -1.55  6.50  8.40  1.55 -6.41 -0.68 -1.84  .   
## u19448 -6.46 -5.39 -3.06 -7.18 -1.02 -6.70 -0.15  0.97 -9.32 -3.69 -5.00
## u20529  1.75 -0.73 -1.17  1.46  3.54 -3.88  0.24  .    -0.15 -0.87  3.16
## u2781  -9.42  4.56  9.22  4.17  5.73 -6.12 -9.61 -9.61 -4.76  3.98  3.98
## u19031  1.02 -3.69  1.36  2.67  5.29  2.23 -9.22 -1.31 -0.53 -1.55 -2.48
## u828   -0.87  1.12  1.46  0.19  2.91 -0.44  7.43 -3.74 -9.22  7.09 -9.03
## u1109   6.02  7.04  6.07  7.18  5.24  6.17 -8.20  .     5.24  .     .   
## u10459 -6.99 -4.32  5.87  4.03  5.97  2.91  .     .     8.20  8.88  .   
## u13086 -4.03 -9.17  8.45 -8.98 -7.67  2.77  2.77 -3.69  6.36  8.69  7.52
## u20897  6.89  7.04  7.57  7.52  8.20  6.55 -1.36  5.39  6.94  8.25 -8.40
## u2864   3.25 -6.12 -5.53 -4.27  0.10  0.58 -4.85 -5.10 -4.42 -1.41 -1.55
## u18057  7.82  6.46  4.61  7.14  3.69  8.59  3.79  6.46  8.79  8.20  4.66
## u16322  .     0.34  .    -5.78  0.10  0.87  .     .     1.99  4.71  .   
## u12555  7.14  7.04  6.21  5.92  5.19  6.60  7.09  7.18  5.68  5.78  6.50
## u17019  2.52  5.44 -2.23  3.50 -0.87  3.11 -4.76 -4.32  2.96  2.28  2.82
## u11009 -7.43 -8.35 -0.63  2.43  1.21  3.79  .    -9.08  0.05  5.39  1.75
## u6564   1.02 -1.21  2.09  6.26  6.46  5.24 -5.05 -0.78  4.27  9.32  9.13
## u14537  .     .     .    -3.50  8.83  5.63  .     .     8.59  8.25  .   
## u4686  -7.82 -4.95 -3.98  7.33  3.64  7.23 -7.86 -7.23 -3.25 -3.25 -0.87
## u22472  0.87  1.12  0.63 -4.27  3.40  2.09  7.82 -2.43 -1.12  4.76  0.58
## u15163  2.33  0.15  0.78  0.92  2.33  3.74 -9.76 -0.10 -2.23  2.14  2.57
## u20564 -0.05 -3.79  1.75 -0.39  1.60  4.66  .     4.71  4.61  6.02  2.43
## u9513   3.45 -1.60  4.37  4.51  4.51 -1.36  2.09  0.05  3.54  7.52  0.15
## u3548  -7.43 -0.73 -0.83  4.32  1.07  2.82 -6.31 -0.19  4.47  3.50 -4.90
## u8958  -3.25 -9.47 -8.88 -1.36  8.25  7.28  .     0.49  8.50  3.01 -9.32
## u9436  -0.92  1.07  6.21 -1.07  0.68  2.28  0.44 -2.67  0.83 -3.64 -3.64
## u6404   8.45  0.24  9.22 -8.06  7.82 -0.68  9.03  8.93  6.55  9.03  9.13
## u731    5.05  8.83  5.15  4.81  4.42  3.25 -0.34  3.83  4.51  8.01  2.72
## u8743   4.37  5.00  .     4.37  1.50  3.45  .     4.08  5.00  7.38  .   
## u814    0.78 -2.91  4.51  3.40  6.50  3.54  7.09 -0.73  6.94  8.74 -6.41
## u7866   .     .     .     6.02  6.36  7.72  6.21  .     7.96  1.50  .   
## u18397  6.21  3.25 -0.19  6.80  4.56  7.33  1.75  1.36 -1.31  1.12 -5.92
## u19751  4.56  1.12 -8.25  8.06 -9.27  6.60 -8.79 -9.66 -7.52 -9.27 -0.78
## u13407  4.81  4.47  4.61  3.35  5.19  5.24  5.92  0.73  5.19  3.16 -0.39
## u12978  7.09 -6.94 -2.14 -6.07  3.59  5.63  7.23 -1.80  5.97  0.73  4.95
## u19038  1.07 -3.30  7.57  0.53  0.24  8.79 -1.65 -1.55 -6.02  0.15  5.19
## u24436 -4.08  4.81  3.88  3.88  4.37  4.90 -5.49 -5.44  1.94  0.58 -6.26
## u19765  0.87  2.09  3.59  0.78  4.42  3.59 -2.38  1.41  5.44  3.54  1.31
## u12259  9.08  7.72  6.70  7.23  8.59  7.18  8.64  6.31  8.45  9.27 -6.50
## u15320 -1.55  2.43  2.52  1.60  3.11  2.48 -4.13 -3.25  4.56  1.65 -0.87
## u14934  4.56  5.19  0.19 -5.87  1.75  5.29 -8.25  4.66  2.18  1.21  5.05
## u969    .     0.58 -0.63  4.03 -2.48  5.53  .     .     5.83  3.06  .   
## u13795  7.04 -0.63  0.00  6.21  6.84  2.57  4.13 -0.34  7.57  7.77 -6.41
## u3752   2.04 -0.10 -0.29 -0.29  6.12  1.84 -9.42 -9.42 -6.50 -0.29 -5.34
## u14729 -9.61 -9.90  8.59  9.17 -0.44 -2.18 -9.61  .    -9.76 -8.98  .   
## u1841   .     .     7.86  8.06  8.98  5.05  7.96 -5.53 -3.59  7.04  .   
## u687    .    -3.01  7.52  8.40  6.70  5.00  .     .     8.30  .     .   
## u18902  2.62  3.59  0.39  3.30  7.77  7.18 -5.53 -1.60  8.01  5.19 -0.05
## u11109 -8.74 -0.49  3.98  7.82  8.01  8.06 -1.41  7.72  8.35  8.59  2.43
## u11283  4.32  3.50 -0.19 -5.58  2.62  7.57  3.93  1.02  1.36 -2.72 -6.60
##                                                                         
## u24911  1.17  .     .     .    -2.77 -2.96  6.36  2.72  .     8.30  6.17
## u19448 -1.02 -3.64  7.23 -2.57 -4.13  0.24  3.59 -2.72  0.00 -0.39 -0.39
## u20529 -3.83  .     .     .     .     2.28  1.99  .     .    -4.08  2.67
## u2781  -9.42 -3.40 -9.61 -9.61 -9.61  7.28  9.22  4.17 -9.61  9.22 -9.42
## u19031  2.52 -2.77 -5.97 -1.41  6.12  2.14 -5.24  3.83  6.02 -3.74 -3.79
## u828   -7.82 -5.58 -6.02 -7.67 -4.85 -1.02 -0.58 -4.71  1.41  6.07 -3.25
## u1109   5.53  .     .     .     .    -8.79  6.60  7.38  .     8.11  6.84
## u10459  1.02  .    -8.59  .     .    -0.34  5.24  .     .     1.55  3.83
## u13086 -8.74  7.67 -2.09 -0.83  5.97  8.25 -3.69 -8.45 -7.14 -0.29  8.45
## u20897  7.96 -0.49 -6.41  3.83  5.39  6.36  6.94  6.36 -6.12  8.25  6.60
## u2864  -4.51 -3.20 -8.30 -0.15 -6.36 -0.68 -3.40 -5.24 -5.44 -5.15  5.24
## u18057 -0.44 -1.94 -0.49  5.49  4.47  8.30  7.62  3.74  4.47  5.24  6.07
## u16322  0.44  .     .     .     .    -3.06 -0.58 -4.71  .    -7.28 -1.02
## u12555  5.97  6.12  3.50  7.57 -3.98  6.12  6.99  7.23 -2.48  7.48  5.49
## u17019  5.05 -4.76 -4.32 -3.83 -2.91  3.98 -1.65 -4.66 -4.27  6.02  4.56
## u11009 -2.43  .     .     .     .    -2.91  5.24  2.77  .     0.29  2.23
## u6564   6.46 -0.39 -6.89 -6.36  0.87  3.79  4.71  6.41  9.17  7.43  4.27
## u14537  5.34  .     .     .     .     4.42  2.57  .     .     4.51  8.40
## u4686   2.18 -7.18 -6.84 -3.25 -0.73  6.07  8.54  2.18 -4.22 -2.96  3.50
## u22472  6.41 -8.30 -2.48  2.62  0.34 -1.17  8.98 -0.34  0.58  6.46  7.48
## u15163 -1.75 -9.47  9.32  1.02 -8.69  2.09  2.72  3.01  0.78  1.99  3.11
## u20564  1.50  .     .     .    -5.68  3.98  1.26  .    -7.14  3.45 -0.10
## u9513   5.78 -0.44  0.83  1.65  4.13  1.89  5.68  4.27  2.96  5.39  2.09
## u3548   2.86 -9.66  .     .    -3.59  2.04  2.43 -2.38  .     6.94  4.42
## u8958   3.06  .     .     .     .     7.18  3.79  8.11  .     6.46 -7.57
## u9436  -2.28 -2.38 -4.03  0.10 -1.50 -1.17  1.02 -2.48 -2.62 -2.14  2.57
## u6404   8.50  3.93 -8.83  4.37 -9.76  8.98  8.50  0.15 -9.56  2.96  7.86
## u731   -0.24  4.71  4.95  6.36  1.70  9.03  9.17 -1.60  8.06 -3.35 -8.01
## u8743   3.64  .     .     .     .     8.25  3.16  5.00  .     5.83  7.18
## u814    6.46 -9.27 -9.08 -1.84 -4.71  5.68  4.66 -4.17 -5.97  9.27  5.24
## u7866   .     .     .     .     .     6.07  5.63  .     .     .     8.40
## u18397 -2.33 -7.23  6.60 -2.28  6.99 -1.94 -0.44 -2.96 -4.51 -5.34 -0.10
## u19751 -8.88 -8.35 -9.61 -8.35 -0.78  1.50 -8.88 -8.64 -8.79 -6.31 -9.27
## u13407  3.59 -1.26 -3.69  3.83  3.45  3.16  0.34 -3.74  5.73  2.82  5.58
## u12978  9.32  .     .     .     8.40  5.19  6.55  0.24  6.17  7.04  7.67
## u19038  1.41 -7.96 -8.54  2.67  1.94  1.80 -2.86 -7.96 -0.78 -2.77  5.68
## u24436  3.88  .     .     .     .     3.88  5.29 -6.84  .     5.15  4.56
## u19765  2.82 -2.82 -5.97  0.00 -6.65  4.32  3.06  0.78 -1.84  4.85  2.52
## u12259  8.79  9.08  8.93  9.03  0.05  9.08  6.89  8.20  9.17  7.48  9.17
## u15320  0.68 -6.55 -8.64 -8.64 -0.92 -0.19  0.92  0.34 -8.93  1.84 -1.26
## u14934  2.91  .     .    -4.08  .    -5.39 -2.04 -4.61  .     4.66 -1.07
## u969   -0.10  .     .     .     .    -0.49  3.30  4.81  .     5.39  5.58
## u13795  4.42 -8.01 -5.24  4.13  4.08  6.60  5.63 -7.48 -8.06  7.14  7.91
## u3752   5.92 -0.29 -0.29 -0.29  6.12  6.12  5.92  1.07 -9.42  7.48  5.92
## u14729 -9.32  .     .     .     .    -8.54  5.19  8.98  .    -0.39 -0.58
## u1841   9.08  .     .     .     .     6.36  8.83  .     .     7.52 -9.71
## u687    6.55  .     .     6.46  .     .     4.76  .     .     3.64  7.04
## u18902  6.02 -5.34 -9.27  4.51  7.33  1.84  3.64  7.57 -4.47 -5.63 -2.57
## u11109 -2.72 -6.31 -5.78  2.77  4.56  8.06  8.35  7.72  8.06  4.03  7.82
## u11283  0.97 -9.37 -9.66  0.05 -7.38 -5.97  2.18  2.09 -4.37 -4.51 -8.59
##                                                                         
## u24911  .     8.69  7.77  3.69  .     .     .     1.70 -4.08  .     .   
## u19448 -4.08 -0.19 -2.72 -4.71  .     .     .     .     .     .     .   
## u20529  .     3.20 -7.09  2.43  .     .     .     .     .     .     .   
## u2781  -7.86 -9.61  9.03  4.37 -7.86  7.28  2.62 -9.42 -9.42  8.83 -9.22
## u19031 -4.66  3.11  4.56 -1.84 -2.09  2.23 -4.32  0.97  3.40  5.97  2.77
## u828   -8.30 -0.58  2.67 -0.34 -0.34 -0.10  1.99  0.39 -0.10 -0.63  2.38
## u1109   .     6.17  6.41  .     .     .     .     .     .     .     .   
## u10459  .    -0.15 -3.69  .     3.64  .     .     .     .     .     .   
## u13086  1.12  7.48  0.78  5.34  .     .     .     .     .     .     .   
## u20897  6.94  6.99  7.57  5.10  .     .     .    -7.43  .     .     .   
## u2864  -5.68 -4.47 -1.12 -2.91  .     5.97  .     .     .     .     .   
## u18057 -9.85  7.62  8.59 -7.77  .     .    -0.19  .     .     .     .   
## u16322  .     0.15  1.65  .     .    -2.77  .     .     .     .     .   
## u12555  7.28  6.89  5.87  6.84  8.25  8.45  5.15  7.96  7.82  8.35  6.80
## u17019 -3.83 -1.12  3.83 -3.45  .    -2.48  .    -2.52 -2.82 -3.40 -0.53
## u11009  .    -2.14 -9.47  4.76  .     .     .    -9.42  .     .     .   
## u6564  -3.88  7.04  4.85  4.61  .     .     .     .     .     5.49  3.30
## u14537  .     4.90 -2.14  .     .     .     .     .     .     .     .   
## u4686  -4.17  6.17  1.89 -6.17  .    -1.60 -8.74 -2.91 -8.59 -8.59 -8.30
## u22472  3.25  4.47  2.38  2.86  2.38  1.17  0.78  0.78  1.55  1.99  2.09
## u15163 -0.39 -0.44  3.98  2.28  .     .     .     .     .    -0.29  .   
## u20564  0.49  7.18  6.70  1.17  .     4.37  .     .     .     .     .   
## u9513   0.73  7.14  4.66  2.28  .     .     .     .    -0.34  2.91  .   
## u3548  -3.79  3.69  2.04 -2.38  .     .     .     .     .     .     .   
## u8958   .     7.43  5.92 -8.69  .     .     .     .     .     .     .   
## u9436   4.76  1.26  0.83  3.88 -4.03  2.33  1.41 -1.41 -1.02  1.41 -0.15
## u6404   8.74  8.50  8.54  8.83  8.54  8.98  8.74  8.88  8.64  8.45  8.54
## u731    2.23  6.07  7.28 -0.49  .     .     .     .     .     .    -0.19
## u8743   .     8.50  2.82  .     .     2.38  3.69  .     .     .     .   
## u814   -6.55  2.28  4.08  0.58  .     .     .     .     .     .     .   
## u7866   .     7.57  6.89  .     .     .     .     .     .     .     5.63
## u18397 -3.88  1.80 -2.14 -1.36  .     .     .     .     .     .     .   
## u19751 -8.79  0.78 -8.88 -9.66  .     .     .     .     .     .     .   
## u13407  4.13  2.28  0.15  5.24  6.02  5.97  5.97  5.97  5.10  6.31  5.92
## u12978  .     4.51  8.64  5.10  .     .     .     .     .     .     .   
## u19038 -6.31 -0.53  1.46 -5.92  .     .     .     .     .     .     .   
## u24436 -5.34  4.37  4.56  4.90  .     .     .     .     .     .     .   
## u19765  0.78  2.52  3.25  2.04  .     .     .     .     .     .     .   
## u12259  9.13  8.79  7.43  8.11  8.50  8.01  8.83  8.11  8.25  9.13  8.30
## u15320 -8.93  0.44  0.29 -2.86 -2.43  .     .     .     .     .     .   
## u14934 -5.34  1.80  1.02  5.29  .     .     .     .     .     1.89  .   
## u969    .     3.40  0.58  .     .     .     .     2.28  .     .     .   
## u13795 -0.78 -4.17  3.59  3.16 -9.17  7.57  0.44  6.07  7.72  8.25 -8.16
## u3752  -0.29  5.92  5.92 -6.89  .     .    -0.29  .     .     .     .   
## u14729  8.74 -9.90  5.83  .     .     .     .     .     .     .     .   
## u1841   .     8.59  8.54  .     8.59  .     .     .     .     .     .   
## u687    .     7.48  7.48  .     .     .     .     .     .     .     .   
## u18902  3.01 -5.44 -0.73 -3.01  .     .     .     .     .     .     .   
## u11109 -3.06  8.06  8.06  4.56  .     .     .     .     .     .     .   
## u11283 -9.81  0.97  1.41  0.49  .     .     .     .     .     .     2.28
##                                                                         
## u24911  .     .     .     .     .     .     .     .     .     .     .   
## u19448  .     .     .     .    -0.19  .    -7.52  .     .     .     .   
## u20529  .    -0.97  .     0.63  .     .     .     .     .     .     .   
## u2781  -6.31 -4.76 -0.29  9.03 -9.61 -0.29 -9.61 -9.42 -7.86 -9.42 -6.31
## u19031 -0.87 -0.97 -0.97 -1.02 -0.44 -0.49  1.26 -1.75  3.06 -1.36  9.22
## u828   -0.15 -0.15  3.25  7.04 -6.60  0.44  0.39  6.94 -6.84 -3.25 -2.62
## u1109   .     .     .     .     .     .     .     .     .     .     .   
## u10459  .     .     .     .     .     .     .     .     .     .     .   
## u13086  .     .     .     .     .     .     .     .     .     .     .   
## u20897  .     .     .     .     .     .     .     .     .    -5.68 -6.31
## u2864   .     .     .     .     .     .     .     .     .     .     .   
## u18057  .     .     .     .     .     .     .     .     .     .     .   
## u16322  .     .     .     .     .     .     .     .     2.57  .     .   
## u12555  6.55  6.99  6.46  7.67  8.01  8.69  6.36  6.07  6.84  8.16  8.06
## u17019 -0.58 -2.52  1.41  1.80 -2.57  2.23 -2.52 -0.49 -3.69 -3.50  2.67
## u11009  .     .     .     .     .     .     .     .     .     .     .   
## u6564   0.00  3.98  3.11  4.47  2.72  8.50 -0.34 -4.51  5.05  3.54 -1.07
## u14537  .     .     .     .     .     .     .     .     .     .     .   
## u4686  -8.20 -5.44 -8.40 -5.68 -2.28 -5.19  0.10 -7.57 -6.41 -2.38  3.93
## u22472  0.58 -4.71  0.63  1.84  0.87  8.69 -0.24  0.19  3.88 -4.03  6.46
## u15163  .     .     .     .     1.75  .     .     .     .     .     .   
## u20564  .     .     .     .     .     .     .     .     .     .     .   
## u9513   .     .     .     .     .    -0.73  .     .     .     .     .   
## u3548   .     .     .     .     .     .     .     .     .     .     .   
## u8958   .     .     .     .    -9.17  .     .     .     .     .     .   
## u9436   0.97 -2.96 -2.96 -0.05 -0.97  1.75  4.27  0.68  0.68  1.41 -3.88
## u6404   8.64  8.88  8.54 -9.22  8.59  8.54  8.45  8.83  8.88 -9.81  8.45
## u731    .     .     .     .     .     .    -2.82  .     .     .     .   
## u8743   4.17  .     .     .     .     4.27  .     .     .     .     .   
## u814    6.55  .     .     7.77  .     .     .     .     .     .     .   
## u7866   .     .     .     .     6.17  .     .     .     .     .     .   
## u18397  .     .     .     .     0.29  .     .     .     .     .     6.36
## u19751  .     .     .     .     .     .     .     .     .     .     .   
## u13407  5.10  7.52  2.48  5.19  8.64 -3.93  3.50  5.92  5.87  6.41  4.90
## u12978  .     .     .     2.14  .     .    -9.17  .     .     .     .   
## u19038  .     .     .     .     .     .     .     .     .     .     .   
## u24436  .     .     .     .     .    -0.53  .     .     .     .     .   
## u19765  1.36  .     .     .     .     .     .     .     .     .    -4.03
## u12259  7.09  8.16  7.04  8.74  8.54  8.59  8.35  8.06  8.74  8.25  8.59
## u15320  .     .     .     .    -4.85  .     .     .     .     .     .   
## u14934  .     .     .     .     .     .     .    -0.92  .     .     .   
## u969    .     .     .     .     .     .     .     .     .     .     .   
## u13795 -9.08 -6.80 -7.77  6.89 -8.25 -8.16 -9.08 -9.22 -9.27  7.77  7.91
## u3752   .     .     .     .    -0.29  1.26 -0.29  5.73  0.87 -9.61  4.76
## u14729  .     .     .     .     .     .     .     .     .    -9.61  .   
## u1841   .     .     8.45 -2.57  .     .     .     .     .     .     .   
## u687    .     .     .     0.19  .     .     4.22  .     .     .     .   
## u18902  .     .     .     .     .     .     .     .     .     .     .   
## u11109  .     .     .     .     .     .     .     .     .     .     .   
## u11283  .     .     .     .     .     .     .     .     .     .     .   
##                                                                         
## u24911  .     .     .     .     .     .     .     .     3.83  .     .   
## u19448  .     .     .     .     .     .     .     .     .     .     .   
## u20529  .     .     .     .     .     .     .     .     .     .     .   
## u2781   4.17 -0.29 -9.42 -0.29  4.17 -9.42 -9.42 -0.29 -0.29 -9.61 -9.61
## u19031  7.52 -1.31  6.80  2.09 -0.10  0.92 -2.23  5.58  5.58 -1.99 -1.99
## u828    7.09 -1.84 -0.53 -3.64 -3.64 -0.39  7.33 -6.02 -5.19 -0.78  2.48
## u1109   .     .     .     .     .     .     .     .     .     0.58  .   
## u10459  .     .     0.00  .     .     .     .     .     .     .     .   
## u13086  .     .     6.31  7.91  .     .     .     .     .     .     .   
## u20897  5.68 -8.64 -5.97  6.89  7.38  6.36  6.21  8.11 -6.17  8.16  5.58
## u2864   .     .     .     .     .     .     0.63  .     .     .     .   
## u18057  .     .     .     .     .     .     .     .     .     .     .   
## u16322  .     .     .     .     .     .     4.17  .     .     .     .   
## u12555  6.94  6.07  7.91  3.54  7.67  7.67  7.67  7.33  7.38  6.46  3.30
## u17019 -1.02 -0.68  1.26  2.23 -4.47 -4.08 -5.19  0.78 -4.22 -3.64 -5.00
## u11009  6.94  .     .     .     .     .     .     .     .     .     .   
## u6564   8.98  2.77 -0.10 -9.42  6.75  7.62 -0.63  2.23  4.56  2.48  1.75
## u14537  .     .     .     .     .     4.03  .     .     .     .     .   
## u4686   3.45 -0.49  3.64 -8.83  5.78 -6.26  5.10  3.35  3.30  3.98 -5.53
## u22472  3.35  3.25 -2.67  0.29  0.97  4.47  0.29 -2.67  0.44  1.50 -0.10
## u15163  .     .     .     .     .     .     .     .     .     .     1.55
## u20564  1.17  .     .     .     .     .     .     .     .     4.42  .   
## u9513  -2.86  .     .     .     1.65  .     .     .     .     .     .   
## u3548   .     .     .     .     .     .     .     .     .     .     .   
## u8958   .     .     .     .     .     .     .     .     .     .     .   
## u9436   2.62 -1.70 -1.70 -1.80 -0.10  3.11  0.58  1.26  1.89 -1.21 -0.34
## u6404   7.77  8.74  8.93  8.79  8.35  8.45  8.45  8.45  5.00  8.79  8.69
## u731    .     .     .     .     .     .     .     .     .     .    -1.94
## u8743   .     .     .     .     .     .     .     .     .     .     .   
## u814    .     .     .     .     .     .     .     .     .     .     .   
## u7866   .     .     .     .     .     .     .     .     .     .     .   
## u18397  .     .     .     .     .     .     .     .     .     .     .   
## u19751  8.01  .     .     .     .     .     .     .     .     .     .   
## u13407  5.92  5.29 -0.10  6.02  6.36  6.12  3.93  4.37  5.15  5.39  5.39
## u12978  .     .     .     .     6.99  .     .    -0.39  .     .     .   
## u19038  .    -8.54  .    -0.53  .     .     .     .     .     .     .   
## u24436  .     .     .     .     .     .     .     .     .     .     .   
## u19765  4.85 -2.72  3.35  1.75  1.75  3.01  3.06  3.45  3.30  3.35  0.15
## u12259  6.99  9.03  8.64  8.59  8.74  8.50  8.45  8.01  7.72  8.74  7.14
## u15320  1.46  .    -0.53  .     .    -6.89 -6.02 -3.79 -0.34 -7.23 -0.24
## u14934  .     .     .     .     .     .     .     .     .     .     .   
## u969    .     .     .     .     .    -7.72  .     .     .     .     .   
## u13795  5.73  0.19 -8.50  5.83  7.67 -6.41  0.53  5.49  0.10 -1.21 -0.05
## u3752   7.48  7.28  7.48  5.73  5.73  5.73 -0.29 -0.29  5.73  5.34 -0.29
## u14729  .     .     .     .     .     .     .     .     .     .     .   
## u1841   .     .     4.56  .     .     .     .     .     .     .     .   
## u687    .     .     .     .     .     .     .     .     .     .     1.60
## u18902  .     .     .     2.18  .     .     .     .     .     .     .   
## u11109  .     .     .     .     .     .     .     .     .     .     .   
## u11283  .     .     .    -5.15  .     .     .     .     .     .     .   
##             
## u24911  .   
## u19448  .   
## u20529  .   
## u2781  -9.61
## u19031 -0.29
## u828    8.30
## u1109   .   
## u10459  .   
## u13086  .   
## u20897  7.43
## u2864   .   
## u18057  .   
## u16322  .   
## u12555  6.17
## u17019  1.75
## u11009  .   
## u6564  -8.69
## u14537  .   
## u4686   3.79
## u22472  0.53
## u15163 -9.85
## u20564  .   
## u9513   .   
## u3548   .   
## u8958   .   
## u9436   0.53
## u6404   8.20
## u731    .   
## u8743   .   
## u814    .   
## u7866   .   
## u18397  .   
## u19751  .   
## u13407  6.50
## u12978  .   
## u19038  .   
## u24436  .   
## u19765  0.24
## u12259  4.32
## u15320 -4.66
## u14934  .   
## u969    .   
## u13795  1.41
## u3752   2.62
## u14729  .   
## u1841   .   
## u687    .   
## u18902  .   
## u11109  .   
## u11283  .
image(r)