[1] ["What's on my iPhone 7?", 'iPhone 7 Features', 'iPhone 7 vs. iPhone 6', 'iPhone Comparison', 'Apple iPhone 7', 'Gold iPhone 7', 'Emma Monden', "What's on my Gold iPhone 7?"]
[2] ['Iphone7', 'what i hate about the new ipho', 'whats on my iphone 7', 'the new iphone7']
[3] ['unboxing', 'iphone 7', 'iphone 7 plus', 'apple watch', 'nike', 'evento de apple', 'tim cook', 'primeras impresiones', 'review', 'apple store', 'app store', 'Apple', 'doble camara', 'a10', 'apple event', 'hand on', 'first impression', 'iphone 7 event', 'iPhone 7 Plus Marcianotech']
[4] ['iPhone 7', 'Apple', 'Products', 'Technology']
[5] ['first', 'iphone', 'seven', 'unboxing', 'video', 'before', 'release', 'date', 'apple', 'macbook', 'ipad', 'ipod', 'event', 'jet', 'black']
[6] ['vlogs', 'wartek', 'anil', 'wartekvlog', 'french', 'anilvlog', 'iphone 7 plus', 'iphone 7+', 'iphone 7 noir', 'Iphone 6 vs Iphone 7']
[7] ['lexlos', 'carlos penavega', 'alexa penavega', 'iphone7', 'apple', 'plus', 'married', 'couple', 'christian', 'faith', 'young', 'happy']
[8] ['iphone', 'iphone_7', 'iphone_7_plus', 'teszt', 'videó', 'okosmobil', 'review']
[9] ['sssniperwolf', 'sniper wolf', 'ask wolf', 'iphone 7', 'leafyishere', 'ask wolf 172', 'sssniperwolf ask wolf', 'leafy chin']
[10] ['ign', 'iPhone 7', 'iphone', 'apple', 'Review', 'top videos', 'ign game reviews', 'game reviews', 'iphone 7 plus', 'apple iphone', 'apple iphone 7', 'ign review', 'apple 7', 'iphone 7 feautres', 'iphone 7 apple', 'apple iphone 7 price', 'iphone 7 video review', 'iphone 7 plus video review']
546 Levels: 0 ...
ytube.tags <- function(x) {
tags.vector<-c()
col <- which( colnames(x)=="Tags" )
x[,col] <- as.character(x[,col])
for (i in 1:nrow(x)) {
vector<-x[i,col]
output<-gsub("\\[|\\]|\"",'',as.character(vector))
output<-strsplit(as.character(output),",")
tags.vector <- c(tags.vector,output)
}
tags.vector<-unlist(tags.vector)
tags.vector<-sub("^\\s+", "", tags.vector)
tags.vector<-gsub("'", "",tags.vector)
return(tags.vector)
}
Tags.Vector <- ytube.tags(Video_Data)