dataURL = "https://drive.google.com/file/d/1Dn1BZD3YxgBQJSIjbfNnmCFlDW2jdQGD/view"
download.file(dataURL,destfile = "Project/MovieRecommendationSystem/data" , method = "curl")
library(recommenderlab)
## Loading required package: Matrix
## Loading required package: arules
##
## Attaching package: 'arules'
## The following objects are masked from 'package:base':
##
## abbreviate, write
## Loading required package: proxy
##
## Attaching package: 'proxy'
## The following object is masked from 'package:Matrix':
##
## as.matrix
## The following objects are masked from 'package:stats':
##
## as.dist, dist
## The following object is masked from 'package:base':
##
## as.matrix
## Loading required package: registry
## Registered S3 methods overwritten by 'registry':
## method from
## print.registry_field proxy
## print.registry_entry proxy
library(ggplot2)
library(data.table)
library(reshape2)
##
## Attaching package: 'reshape2'
## The following objects are masked from 'package:data.table':
##
## dcast, melt
movie_data = read.csv("movies.csv",stringsAsFactors = TRUE)
rating_data = read.csv("ratings.csv")
str(movie_data)
## 'data.frame': 10329 obs. of 3 variables:
## $ movieId: int 1 2 3 4 5 6 7 8 9 10 ...
## $ title : Factor w/ 10327 levels "'71 (2014)","'burbs, The (1989)",..: 9391 4930 3876 9797 3148 4072 7853 9335 8741 3723 ...
## $ genres : Factor w/ 938 levels "(no genres listed)",..: 338 396 698 651 601 245 698 380 2 123 ...
str(rating_data)
## 'data.frame': 105339 obs. of 4 variables:
## $ userId : int 1 1 1 1 1 1 1 1 1 1 ...
## $ movieId : int 16 24 32 47 50 110 150 161 165 204 ...
## $ rating : num 4 1.5 4 4 4 4 3 4 3 0.5 ...
## $ timestamp: int 1217897793 1217895807 1217896246 1217896556 1217896523 1217896150 1217895940 1217897864 1217897135 1217895786 ...
summary(movie_data)
## movieId title
## Min. : 1 Men with Guns (1997) : 2
## 1st Qu.: 3240 War of the Worlds (2005) : 2
## Median : 7088 '71 (2014) : 1
## Mean : 31924 'burbs, The (1989) : 1
## 3rd Qu.: 59900 'Hellboy': The Seeds of Creation (2004): 1
## Max. :149532 'night Mother (1986) : 1
## (Other) :10321
## genres
## Drama :1385
## Comedy : 826
## Comedy|Drama : 465
## Drama|Romance : 421
## Comedy|Romance: 363
## Documentary : 300
## (Other) :6569
summary(rating_data)
## userId movieId rating timestamp
## Min. : 1.0 Min. : 1 Min. :0.500 Min. :8.286e+08
## 1st Qu.:192.0 1st Qu.: 1073 1st Qu.:3.000 1st Qu.:9.711e+08
## Median :383.0 Median : 2497 Median :3.500 Median :1.115e+09
## Mean :364.9 Mean : 13381 Mean :3.517 Mean :1.130e+09
## 3rd Qu.:557.0 3rd Qu.: 5991 3rd Qu.:4.000 3rd Qu.:1.275e+09
## Max. :668.0 Max. :149532 Max. :5.000 Max. :1.452e+09
head(movie_data)
## movieId title
## 1 1 Toy Story (1995)
## 2 2 Jumanji (1995)
## 3 3 Grumpier Old Men (1995)
## 4 4 Waiting to Exhale (1995)
## 5 5 Father of the Bride Part II (1995)
## 6 6 Heat (1995)
## genres
## 1 Adventure|Animation|Children|Comedy|Fantasy
## 2 Adventure|Children|Fantasy
## 3 Comedy|Romance
## 4 Comedy|Drama|Romance
## 5 Comedy
## 6 Action|Crime|Thriller
head(rating_data)
## userId movieId rating timestamp
## 1 1 16 4.0 1217897793
## 2 1 24 1.5 1217895807
## 3 1 32 4.0 1217896246
## 4 1 47 4.0 1217896556
## 5 1 50 4.0 1217896523
## 6 1 110 4.0 1217896150
From the above table, we observe that the userId column, as well as the movieId column, consist of integers. Furthermore, we need to convert the genres present in the movie_data dataframe into a more usable format by the users. In order to do so, we will first create a one-hot encoding to create a matrix that comprises of corresponding genres for each of the films.
# Taking genres column from movie_data and storing it in movie_genre data frame
movie_genre = as.data.frame(movie_data$genres , stringsAsFactors=FALSE)
library(data.table)
# converting list to data frame and splitting genres
movie_genre2 <- as.data.frame(tstrsplit(movie_genre[,1], '[|]', type.convert=TRUE), stringsAsFactors=FALSE)
# giving column names to movie_genre2
colnames(movie_genre2) <- c(1:10)
list_genre <- c("Action", "Adventure", "Animation", "Children", "Comedy", "Crime","Documentary", "Drama", "Fantasy", "Film-Noir", "Horror", "Musical", "Mystery", "Romance","Sci-Fi", "Thriller", "War", "Western")
# creating a matix with all zeroes with rowsize as movie ids length and column as types of genres
genre_mat1 <- matrix(0,10330,18)
genre_mat1[1,] <- list_genre
colnames(genre_mat1) <- list_genre
# converting data in movie_genre2 to 0's and 1's as per the column names in genre_mat1
for(index in 1:nrow(movie_genre2)){
for(col in 1:ncol(movie_genre2)){
gen_col = which(genre_mat1[1,] == movie_genre2[index,col])
genre_mat1[index+1,gen_col] = 1
}
}
# removing first row which is genre list
genre_mat2 = as.data.frame(genre_mat1[-1,] , stringsAsFactors = FALSE)
# converting columns to integers from characters
for(col in 1:ncol(genre_mat2)){
genre_mat2[,col] = as.integer(genre_mat2[,col])
}
# confirming the type of each column has changed to integer
str(genre_mat2)
## 'data.frame': 10329 obs. of 18 variables:
## $ Action : int 0 0 0 0 0 1 0 0 1 1 ...
## $ Adventure : int 1 1 0 0 0 0 0 1 0 1 ...
## $ Animation : int 1 0 0 0 0 0 0 0 0 0 ...
## $ Children : int 1 1 0 0 0 0 0 1 0 0 ...
## $ Comedy : int 1 0 1 1 1 0 1 0 0 0 ...
## $ Crime : int 0 0 0 0 0 1 0 0 0 0 ...
## $ Documentary: int 0 0 0 0 0 0 0 0 0 0 ...
## $ Drama : int 0 0 0 1 0 0 0 0 0 0 ...
## $ Fantasy : int 1 1 0 0 0 0 0 0 0 0 ...
## $ Film-Noir : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Horror : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Musical : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Mystery : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Romance : int 0 0 1 1 0 0 1 0 0 0 ...
## $ Sci-Fi : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Thriller : int 0 0 0 0 0 1 0 0 0 1 ...
## $ War : int 0 0 0 0 0 0 0 0 0 0 ...
## $ Western : int 0 0 0 0 0 0 0 0 0 0 ...
we will create a ‘search matrix’ that will allow us to perform an easy search of the films by specifying the genre present in our list.
SearchMatrix = cbind(movie_data[,1:2] , genre_mat2[])
head(SearchMatrix)
## movieId title Action Adventure Animation
## 1 1 Toy Story (1995) 0 1 1
## 2 2 Jumanji (1995) 0 1 0
## 3 3 Grumpier Old Men (1995) 0 0 0
## 4 4 Waiting to Exhale (1995) 0 0 0
## 5 5 Father of the Bride Part II (1995) 0 0 0
## 6 6 Heat (1995) 1 0 0
## Children Comedy Crime Documentary Drama Fantasy Film-Noir Horror Musical
## 1 1 1 0 0 0 1 0 0 0
## 2 1 0 0 0 0 1 0 0 0
## 3 0 1 0 0 0 0 0 0 0
## 4 0 1 0 0 1 0 0 0 0
## 5 0 1 0 0 0 0 0 0 0
## 6 0 0 1 0 0 0 0 0 0
## Mystery Romance Sci-Fi Thriller War Western
## 1 0 0 0 0 0 0
## 2 0 0 0 0 0 0
## 3 0 1 0 0 0 0
## 4 0 1 0 0 0 0
## 5 0 0 0 0 0 0
## 6 0 0 0 1 0 0
There are movies that have several genres, for example, Toy Story, which is an animated film also falls under the genres of Comedy, Fantasy, and Children. This applies to the majority of the films.
For our movie recommendation system to make sense of our ratings through recommenderlabs, we have to convert our matrix into a sparse matrix one. This new matrix is of the class ‘realRatingMatrix’. This is performed as follows:
ratingMatrix <- dcast(rating_data,userId~movieId, value.var = "rating", na.rm=FALSE)
ratingMatrix <- as.matrix(ratingMatrix[,-1]) #remove userIds
#Convert rating matrix into a recommenderlab sparse matrix which is realRatingMatrix class
ratingMatrix <- as(ratingMatrix, "realRatingMatrix")
ratingMatrix
## 668 x 10325 rating matrix of class 'realRatingMatrix' with 105339 ratings.
Let us now overview some of the important parameters that provides us various options for building recommendation systems for movies-
recommendation_model = recommenderRegistry$get_entries(dataType = "realRatingMatrix")
names(recommendation_model)
## [1] "ALS_realRatingMatrix" "ALS_implicit_realRatingMatrix"
## [3] "IBCF_realRatingMatrix" "LIBMF_realRatingMatrix"
## [5] "POPULAR_realRatingMatrix" "RANDOM_realRatingMatrix"
## [7] "RERECOMMEND_realRatingMatrix" "SVD_realRatingMatrix"
## [9] "SVDF_realRatingMatrix" "UBCF_realRatingMatrix"
Let us know the description of each model
lapply(recommendation_model , '[[' , "description")
## $ALS_realRatingMatrix
## [1] "Recommender for explicit ratings based on latent factors, calculated by alternating least squares algorithm."
##
## $ALS_implicit_realRatingMatrix
## [1] "Recommender for implicit data based on latent factors, calculated by alternating least squares algorithm."
##
## $IBCF_realRatingMatrix
## [1] "Recommender based on item-based collaborative filtering."
##
## $LIBMF_realRatingMatrix
## [1] "Matrix factorization with LIBMF via package recosystem (https://cran.r-project.org/web/packages/recosystem/vignettes/introduction.html)."
##
## $POPULAR_realRatingMatrix
## [1] "Recommender based on item popularity."
##
## $RANDOM_realRatingMatrix
## [1] "Produce random recommendations (real ratings)."
##
## $RERECOMMEND_realRatingMatrix
## [1] "Re-recommends highly rated items (real ratings)."
##
## $SVD_realRatingMatrix
## [1] "Recommender based on SVD approximation with column-mean imputation."
##
## $SVDF_realRatingMatrix
## [1] "Recommender based on Funk SVD with gradient descend (https://sifter.org/~simon/journal/20061211.html)."
##
## $UBCF_realRatingMatrix
## [1] "Recommender based on user-based collaborative filtering."
We will implement a single model in our R project – Item Based Collaborative Filtering, 3rd one.
recommendation_model$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
Collaborative Filtering involves suggesting movies to the users that are based on collecting preferences from many other users. For example, if a user A likes to watch action films and so does user B, then the movies that the user B will watch in the future will be recommended to A and vice-versa. Therefore, recommending movies is dependent on creating a relationship of similarity between the two users. With the help of recommenderlab, we can compute similarities using various operators like cosine, pearson as well as jaccard.
similaritY_mat = similarity(ratingMatrix[1:4,],method = "cosine",which="users")
as.matrix(similaritY_mat)
## 1 2 3 4
## 1 0.0000000 0.9760860 0.9641723 0.9914398
## 2 0.9760860 0.0000000 0.9925732 0.9374253
## 3 0.9641723 0.9925732 0.0000000 0.9888968
## 4 0.9914398 0.9374253 0.9888968 0.0000000
image(as.matrix(similaritY_mat),main="Users Similarities")
In the above matrix, each row and column represents a user. We have taken four users and each cell in this matrix represents the similarity that is shared between the two users.
Now, we describe the similarity that is shared between the films:
movie_similarity = similarity(ratingMatrix[,1:4],method="cosine",which="items")
as.matrix(movie_similarity)
## 1 2 3 4
## 1 0.0000000 0.9669732 0.9559341 0.9101276
## 2 0.9669732 0.0000000 0.9658757 0.9412416
## 3 0.9559341 0.9658757 0.0000000 0.9864877
## 4 0.9101276 0.9412416 0.9864877 0.0000000
image(as.matrix(movie_similarity), main="Movies Similarities")
Let us now extract the most unique ratings –
rating_values = as.vector(ratingMatrix@data)
unique(rating_values)
## [1] 0.0 5.0 4.0 3.0 4.5 1.5 2.0 3.5 1.0 2.5 0.5
Now, we will create a table of ratings that will display the most unique ratings.
Table_of_ratings <- table(rating_values)
Table_of_ratings
## rating_values
## 0 0.5 1 1.5 2 2.5 3 3.5 4 4.5
## 6791761 1198 3258 1567 7943 5484 21729 12237 28880 8187
## 5
## 14856
In this section of the machine learning project, we will explore the most viewed movies in our dataset. We will first count the number of views in a film and then organize them in a table that would group them in descending order.
library(ggplot2)
movie_views = colCounts(ratingMatrix) # count views for each movie
table_views = data.frame(movie = names(movie_views) , views = movie_views) #create dataframe of views
table_views = table_views[order(table_views$view , decreasing = TRUE),] #sort by number of views
table_views$title = NA
for(index in 1:10325){
table_views[index,3] = as.character(subset(movie_data,movie_data$movieId == table_views[index,1])$title)
}
table_views[1:6,]
## movie views title
## 296 296 325 Pulp Fiction (1994)
## 356 356 311 Forrest Gump (1994)
## 318 318 308 Shawshank Redemption, The (1994)
## 480 480 294 Jurassic Park (1993)
## 593 593 290 Silence of the Lambs, The (1991)
## 260 260 273 Star Wars: Episode IV - A New Hope (1977)
Now, we will visualize a bar plot for the total number of views of the top films. We will carry this out using ggplot2.
ggplot(table_views[1:6,], aes(x=title,y=views)) +
geom_bar(stat="identity",fill="steelblue")+
geom_text(aes(label=views),vjust=-0.3,size=3.5)+
theme(axis.text.x = element_text(angle = 45,hjust = 1))+
ggtitle("Total Views of the Top Films")
From the above bar-plot, we observe that Pulp Fiction is the most-watched film followed by Forrest Gump.
Now, in this data science project of Recommendation system, we will visualize a heatmap of the movie ratings. This heatmap will contain first 25 rows and 25 columns as follows
image(ratingMatrix[1:25,1:25],axes=FALSE,main="HeatMap of first 25 rows and 25 columns")
We will conduct data preparation in the following three steps –
Selecting useful data. Normalizing data. Binarizing the data.
For finding useful data in our dataset, we have to set the threshold such that users who have rated atleast 50 films. This is also same for minimum number of views that are per film to 50. This way, we have filtered a list of watched films from least-watched ones.
movie_ratings = ratingMatrix[rowCounts(ratingMatrix)>50 , colCounts(ratingMatrix)>50]
movie_ratings
## 420 x 447 rating matrix of class 'realRatingMatrix' with 38341 ratings.
From the above output of ‘movie_ratings’, we observe that there are 420 users and 447 films as opposed to the previous 668 users and 10325 films. We can now delineate our matrix of relevant users as follows –
minimum_movies = quantile(rowCounts(movie_ratings),0.98)
minimum_users = quantile(colCounts(movie_ratings),0.98)
image(movie_ratings[rowCounts(movie_ratings)>minimum_movies, colCounts(movie_ratings)>minimum_users], main="HeatMap of top Users and Movies")
Now, we will visualize the distribution of the average ratings per user.
average_ratings = rowMeans(movie_ratings)
qplot(average_ratings,fill=I("steelblue"),col=I("red"))+ggtitle("Distribution of the average ratings given by each users")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
In the case of some users, there can be high ratings or low ratings provided to all of the watched films. This will act as a bias while implementing our model. In order to remove this, we normalize our data. Normalization is a data preparation procedure to standardize the numerical values in a column to a common scale value. This is done in such a way that there is no distortion in the range of values. Normalization transforms the average value of our ratings column to 0. We then plot a heatmap that delineates our normalized ratings.
normalized_ratings <- normalize(movie_ratings)
norm_sum =sum(rowMeans(normalized_ratings)>0.00001)
image(normalized_ratings[rowCounts(normalized_ratings) > minimum_movies, colCounts(normalized_ratings) > minimum_users], main = "Normalized Ratings of the Top Users")
In the final step of our data preparation in this data science project, we will binarize our data. Binarizing the data means that we have two discrete values 1 and 0, which will allow our recommendation systems to work more efficiently. We will define a matrix that will consist of 1 if the rating is above 3 and otherwise it will be 0.
binary_minimum_movies <- quantile(rowCounts(movie_ratings), 0.95)
binary_minimum_users <- quantile(colCounts(movie_ratings), 0.95)
good_rated_films <- binarize(movie_ratings, minRating = 3)
image(good_rated_films[rowCounts(movie_ratings) > binary_minimum_movies,
colCounts(movie_ratings) > binary_minimum_users],
main = "Heatmap of the top users and movies")
In this section of data science project, we will develop our very own Item Based Collaborative Filtering System. This type of collaborative filtering finds similarity in the items based on the people’s ratings of them. The algorithm first builds a similar-items table of the customers who have purchased them into a combination of similar items. This is then fed into the recommendation system.
The similarity between single products and related products can be determined with the following algorithm –
For each Item i1 present in the product catalog, purchased by customer C. And, for each item i2 also purchased by the customer C. Create record that the customer purchased items i1 and i2. Calculate the similarity between i1 and i2. We will build this filtering system by splitting the dataset into 80% training set and 20% test set.
library(caret)
## Loading required package: lattice
##
## Attaching package: 'caret'
## The following objects are masked from 'package:recommenderlab':
##
## MAE, RMSE
library(e1071)
#inTrain = createDataPartition(y=movie_ratings@data,p=0.80,list = FALSE)
inTrain = sample(x=c(TRUE,FALSE),size=nrow(movie_ratings),replace = TRUE,prob=c(0.8,0.2))
training_data = movie_ratings[inTrain,]
testing_data = movie_ratings[!inTrain,]
We will now explore the various parameters of our Item Based Collaborative Filter. These parameters are default in nature. In the first step, k denotes the number of items for computing their similarities. Here, k is equal to 30. Therefore, the algorithm will now identify the k most similar items and store their number. We use the cosine method which is the default one but you can also use pearson method.
recommendation_system = recommenderRegistry$get_entries(dataType = "realRatingMatrix")
recommendation_system$IBCF_realRatingMatrix$parameters
## $k
## [1] 30
##
## $method
## [1] "Cosine"
##
## $normalize
## [1] "center"
##
## $normalize_sim_matrix
## [1] FALSE
##
## $alpha
## [1] 0.5
##
## $na_as_zero
## [1] FALSE
recommen_model = Recommender(data=training_data,method="IBCF",parameter = list(k=30))
recommen_model
## Recommender of type 'IBCF' for 'realRatingMatrix'
## learned using 330 users.
class(recommen_model)
## [1] "Recommender"
## attr(,"package")
## [1] "recommenderlab"
Let us now explore our data science recommendation system model as follows –
Using the getModel() function, we will retrieve the recommen_model. We will then find the class and dimensions of our similarity matrix that is contained within model_info. Finally, we will generate a heatmap, that will contain the top 20 items and visualize the similarity shared between them.
model_info = getModel(recommen_model)
class(model_info$sim)
## [1] "dgCMatrix"
## attr(,"package")
## [1] "Matrix"
dim(model_info$sim)
## [1] 447 447
top_items= 20
image(model_info$sim[1:top_items,1:top_items],main="Heatmap of first 20 rows and columns")
In the next step of ML project, we will carry out the sum of rows and columns with the similarity of the objects above 0. We will visualize the sum of columns through a distribution as follows –
sum_rows = rowSums(model_info$sim>0)
table(sum_rows)
## sum_rows
## 30
## 447
sum_cols = colSums(model_info$sim>0)
qplot(sum_cols,fill=I("steelblue"),col=I("red"))+ggtitle("Distribution of the column count")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
We will create a top_recommendations variable which will be initialized to 10, specifying the number of films to each user. We will then use the predict() function that will identify similar items and will rank them appropriately. Here, each rating is used as a weight. Each weight is multiplied with related similarities. Finally, everything is added in the end.
top_recommendations <- 10
predicted_recommendations = predict(object=recommen_model,newdata=testing_data,n=top_recommendations)
predicted_recommendations
## Recommendations as 'topNList' with n = 10 for 90 users.
user1 = predicted_recommendations@items[[1]] #recommendation for the first user
movies_user1=predicted_recommendations@itemLabels[user1]
movies_user2 <- movies_user1
for(index in 1:10){
movies_user2[index]=as.character(subset(movie_data,movie_data$movieId==movies_user1[index])$title)
}
movies_user2
## [1] "Mask, The (1994)"
## [2] "Robin Hood: Men in Tights (1993)"
## [3] "English Patient, The (1996)"
## [4] "Traffic (2000)"
## [5] "Harry Potter and the Chamber of Secrets (2002)"
## [6] "Broken Arrow (1996)"
## [7] "Mrs. Doubtfire (1993)"
## [8] "Flintstones, The (1994)"
## [9] "Citizen Kane (1941)"
## [10] "Spirited Away (Sen to Chihiro no kamikakushi) (2001)"
recommendation_matrix <- sapply(predicted_recommendations@items,function(x){as.integer(colnames(movie_ratings)[x])}) #matrix with movie recommendations for each user
recommendation_matrix[,1:4]
## [,1] [,2] [,3] [,4]
## [1,] 367 3 3 1
## [2,] 520 172 17 2
## [3,] 1183 173 21 3
## [4,] 4034 196 36 5
## [5,] 5816 253 150 6
## [6,] 95 316 236 7
## [7,] 500 329 253 10
## [8,] 355 1097 266 11
## [9,] 923 1136 288 16
## [10,] 5618 1249 370 17
Recommendation Systems are the most popular type of machine learning applications that are used in all sectors. They are an improvement over the traditional classification algorithms as they can take many classes of input and provide similarity ranking based algorithms to provide the user with accurate results. These recommendation systems have evolved over time and have incorporated many advanced machine learning techniques to provide the users with the content that they want.