list.of.packages <- c("RColorBrewer","ggplot2", "e1071","tm","ggpubr","SnowballC","wordcloud","gmodels")
new.packages <- list.of.packages[!(list.of.packages %in% installed.packages()[,"Package"])]
if(length(new.packages)) install.packages(new.packages)
library(RColorBrewer)
library(ggplot2)
library(tm)
## Loading required package: NLP
##
## Attaching package: 'NLP'
## The following object is masked from 'package:ggplot2':
##
## annotate
library(SnowballC)
library(wordcloud)
library(ggpubr)
library(gmodels)
library(e1071)
getwd()
## [1] "/home/rafael/Documents/mineria/NaiveBayesSouthPark"
south_park_ds <- read.csv("All-seasons.csv")
south_park_ds <- south_park_ds[-c(1,2)]
names_list <- c("Kyle", "Cartman")
south_park_ds_final <- south_park_ds[south_park_ds$Character %in% names_list, ]
For this second project, we started looking for datasets of texts that may work with the Naive Bayes algorithm. After an exhaustive search we found a dataset of SouthPark’s dialogues from season 1 to season 10. This dataset was divided on four fields the season corresponding to the line, the episode corresponding to the line, the character who said the line and the line itself.
Our application for the algorithm is to predict the character who said the line. This can also be applicable to normal speech from a real person. With that in mind, we are working under the hypothesis it is possible to identify someone with the way of how he/she speaks. This is possible thanks to speech patterns on the speech of regular people. We are using a dataset based on dialogues, because most writers try to create unique characters; by doing this they try also create patterns for the characters, in an attempt of making them stand out from the rest of the characters-.
At first we tried to use Naive Bayes with all of the characters in the show. Obviously, this affected the precision of our predictions, because most characters on this long running show are probably secondary or one off character. Thinking again on how a writer would try to make an unique character, those character who may fit the role are the main characters. But we also run in the some precision issues over there; we attributed this issue to changes on writer’s staff through out different seasons. This may blur a little bit the uniqueness or quirks of the character. So we reduced our character group to two characters Cartman and Kyle, both have a very unique ways of speaking and very difined personalities.
\(P(A|B)=\frac{P(B|A)P(A)}{P(B)}\)
Our dataset was retrieved from kaggle.com, we agreed on the fact that we only needed the line and the character who said it. Then any other character besides Cartman and Kyle were removed. After that we proceeded to clean our data by setting every word to lower caps; removing any numbers; repeated white spaces; any commonly used phrases on the english language; and also we unify most words to their stem. And then we proceed to use the algorithm Naive Bayes to predict the character who said the dialogue based on the training data.
Our data is divided 70% of the entries went to the training set, against the 30% of the entries going to the testing set. We tried to word frecuencies starting high from 1000 instances of a word, trying to achieve better results. Although what we achieved were some errors due to the fact that there weren’t enough frecuent words. So we went down until we reached 10 instances of the word, this is because it gave us a slightly better result than other attempts. Besides it takes a while to actually be running every possibility. Also we leave the laplacian smoothing at 1 in our example of Naive Bayes, because going to 0 will cause trouble to lines f the testing set where there are no common words with our training set. And going higher will dismiss lines with at least one word in common with some other in the training test.
South Park is an American adult animated sitcom created by Trey Parker and Matt Stone and developed by Brian Graden for the Comedy Central television network. The show revolves around four boys-Stan Marsh, Kyle Broflovski, Eric Cartman, and Kenny McCormick-and their bizarre adventures in and around the titular Colorado town. Much like The Simpsons, South Park uses a very large ensemble cast of recurring characters and became infamous for its profanity and dark, surreal humor that satirizes a wide range of topics towards a mature audience.
During the analysis of the dataset, the characters with the greatest amount of appearances across different seasons were selected, the television series has a total of 147 characters. In order to ilustrate the appearances of characters,we plotted a chart with all the characters of all seasons. But given the number of characters and the total of dialogues, it wasn’t legible to us. So we opted to use 5 of the most representative of the series.
south_park_seasons <- read.csv("All-seasons.csv")
names_list <- c("Kyle", "Cartman","Chef","Kenny","Stan")
session_one <- south_park_seasons[south_park_seasons$Character %in% names_list, ]
ggplot(session_one, xlab="Character", ylab="Season" ,aes(y = session_one$Season, x = session_one$Character))+ geom_bar(stat="identity")
Within the analysis we made a graph that shows the most commonly used words on the series, it pertinent to mention that this series is for an adult audience. Reason why, the dialogues of the show may contain coarse language very frecuently along the characters’ lines.
south_park_corpus <- VCorpus(VectorSource (south_park_ds_final$Line))
south_park_dtm <- DocumentTermMatrix(south_park_corpus, control = list(
tolower = TRUE,
removeNumbers = TRUE,
stopwords = TRUE,
removePunctuation = TRUE,
stemming = TRUE))
south_park_corpus_clean <- tm_map(south_park_corpus,content_transformer(tolower))
south_park_corpus_clean <- tm_map(south_park_corpus_clean,removeNumbers)
south_park_corpus_clean <- tm_map(south_park_corpus_clean,removeWords, stopwords())
south_park_corpus_clean <- tm_map(south_park_corpus_clean,removePunctuation)
south_park_corpus_clean <- tm_map(south_park_corpus_clean, stemDocument)
south_park_corpus_clean <- tm_map(south_park_corpus_clean, stripWhitespace)
wordcloud(south_park_corpus_clean, min.freq = 50, random.order = FALSE)
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): goddamnit could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): nobodi could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): stay could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): dreidel could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): christ could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): actual could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): anoth could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): year could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): learn could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): chang could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): christma could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): understand could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): suppos could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): anymor could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): rememb could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): done could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): everybodi could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): name could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): mouth could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): place could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): hankey could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): togeth could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): dead could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): power could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): goddamn could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): person could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): room could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): whatev could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): video could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): enough could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): deal could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): pictur could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): walk could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): excus could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): second could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): alreadi could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): bring could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): kitti could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): move could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): piss could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): tomorrow could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): hang could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): tweek could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): save could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): seem could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): hope could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): took could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): movi could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): part could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): problem could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): bastard could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): door could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): joke could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): open could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): compani could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): garrison could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): insid could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): south could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): stand could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): town could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): hundr could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): happi could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): ginger could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): miss could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): four could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): knew could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): plan could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): present could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): fuckin could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): presid could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): special could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): worri could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): yet could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): anybodi could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): becom could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): mani could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): read could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): without could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): goin could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): parti could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): song could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): break could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): damnit could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): ahead could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): dick could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): frog could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): million could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): free could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): pull could not be fit on page. It will not be plotted.
## Warning in wordcloud(south_park_corpus_clean, min.freq = 50, random.order =
## FALSE): true could not be fit on page. It will not be plotted.
After doing this exercise about the application of the Naive Bayes algorithm to our final data set we can conclude that, even though is not over 90% accurate, it classifies correctly 70% of the lines for Cartman, who is the most iconic character of the show and also has the most iconic catch phrases such as Jew/Jewish “Screw you guys”, “I’m not fat, I’m big boned” and such. On the other side, lines for Kyle are classifed correctly 50% of the times, which is not a high number but it shows that he has some quirks of his own.
We need to understand that we applied this algorithm to speeches, so it’s not like each characters talk a different language, it’s obvious that they say common things of the english language, just like real life. And throughout the series, staff and writers change along with the season; so characters change depending on their writer.
In conclusion, it was a good experiment which probably doesn’t give very accurate results. But it is not conclusive to discard the possibility of identifying somebody by the way of their speech. Probably the next step it’s to try it on real people’s speech; this if we can find a dataset of this sort online. After that, we’ll be able to revisit this little experiment and pinpoint the cause of the lack of accuracy within our results.
south_park_dtm_train <- south_park_dtm[1:11812,]
south_park_dtm_test <- south_park_dtm[11813:16873, ]
south_park_train_labels <- south_park_ds_final[1:11812,]$Character
south_park_test_labels <- south_park_ds_final[11813:16873,]$Character
prop.table(table(south_park_train_labels))
## south_park_train_labels
## AAA Leader
## 0.0000000
## Aaron Brown
## 0.0000000
## AARP leader
## 0.0000000
## AARP lookout
## 0.0000000
## AARP member
## 0.0000000
## AARP member 1
## 0.0000000
## AARP member 2
## 0.0000000
## AARP member 3
## 0.0000000
## AARP Members
## 0.0000000
## AA Speaker
## 0.0000000
## A Banana
## 0.0000000
## A bishop
## 0.0000000
## A Bishop
## 0.0000000
## A bodyguard
## 0.0000000
## A boy
## 0.0000000
## A Boy
## 0.0000000
## Abraham Lincoln
## 0.0000000
## A British person
## 0.0000000
## A British Person
## 0.0000000
## A caller
## 0.0000000
## A cat
## 0.0000000
## A Catfish
## 0.0000000
## Accordionist
## 0.0000000
## A Congressman
## 0.0000000
## A Council Member
## 0.0000000
## A counselor
## 0.0000000
## A Cowboy
## 0.0000000
## A crewman
## 0.0000000
## Actors
## 0.0000000
## Adams
## 0.0000000
## Adam Sandler
## 0.0000000
## Adams County
## 0.0000000
## A Dentist
## 0.0000000
## A Diner
## 0.0000000
## A director
## 0.0000000
## A Doctor
## 0.0000000
## Adolf
## 0.0000000
## A Driver
## 0.0000000
## Adults
## 0.0000000
## Advisor
## 0.0000000
## A fan
## 0.0000000
## A Fan
## 0.0000000
## A Fangirl
## 0.0000000
## A few Congressmen
## 0.0000000
## A few others
## 0.0000000
## A few people
## 0.0000000
## A Few People
## 0.0000000
## Afghan Boys
## 0.0000000
## African-American
## 0.0000000
## Afro Ninja
## 0.0000000
## Agent
## 0.0000000
## Agent 1
## 0.0000000
## Agent 10
## 0.0000000
## Agent 11
## 0.0000000
## Agent 12
## 0.0000000
## Agent 2
## 0.0000000
## Agent 3
## 0.0000000
## Agent 4
## 0.0000000
## Agent 5
## 0.0000000
## Agent 6
## 0.0000000
## Agent 7
## 0.0000000
## Agent 8
## 0.0000000
## Agent 9
## 0.0000000
## Agent Clark
## 0.0000000
## Agent Keen
## 0.0000000
## Agent Marx
## 0.0000000
## Agents
## 0.0000000
## Agent Sharp
## 0.0000000
## Aging Hippie Liberal Douche
## 0.0000000
## A Girl
## 0.0000000
## A Guard
## 0.0000000
## A guest
## 0.0000000
## A Guest
## 0.0000000
## A Hall Monitor
## 0.0000000
## A hippie
## 0.0000000
## Aide
## 0.0000000
## Aide 1
## 0.0000000
## Aide 2
## 0.0000000
## Aide 3
## 0.0000000
## Akmarh
## 0.0000000
## Al
## 0.0000000
## Alan
## 0.0000000
## Alanis Morissette
## 0.0000000
## Alan Jackson
## 0.0000000
## Alarm
## 0.0000000
## Alarm: Alert.
## 0.0000000
## Alec Baldwin
## 0.0000000
## Alex
## 0.0000000
## Alex Spanos
## 0.0000000
## ALF Leader
## 0.0000000
## ALF Member
## 0.0000000
## Al Gore
## 0.0000000
## Alias 1
## 0.0000000
## Alias 2
## 0.0000000
## Alias 3
## 0.0000000
## Alias 4
## 0.0000000
## Alice
## 0.0000000
## Alien
## 0.0000000
## Alien 1
## 0.0000000
## Alien 2
## 0.0000000
## Alien 3
## 0.0000000
## Alien Carl
## 0.0000000
## Alien Man
## 0.0000000
## Aliens
## 0.0000000
## All
## 0.0000000
## All Celebrities
## 0.0000000
## All five quints in unison
## 0.0000000
## All Gingers
## 0.0000000
## All the boys
## 0.0000000
## All the kids
## 0.0000000
## All three
## 0.0000000
## All Three
## 0.0000000
## All three men
## 0.0000000
## Allyson
## 0.0000000
## Alone
## 0.0000000
## Al Roker
## 0.0000000
## Alton Brown
## 0.0000000
## Alvin
## 0.0000000
## al-Zawahri
## 0.0000000
## Al-Zawahri
## 0.0000000
## A man
## 0.0000000
## A Man
## 0.0000000
## Amanda
## 0.0000000
## Ambassador
## 0.0000000
## Amber
## 0.0000000
## A Melvin
## 0.0000000
## A Member
## 0.0000000
## American
## 0.0000000
## American Female
## 0.0000000
## American Male 1
## 0.0000000
## American Male 2
## 0.0000000
## American Male 3
## 0.0000000
## Amir
## 0.0000000
## A Musician
## 0.0000000
## An Aged Voice
## 0.0000000
## An Agent
## 0.0000000
## Analyst
## 0.0000000
## An Anchorman
## 0.0000000
## Anchor
## 0.0000000
## Anchor 2
## 0.0000000
## Anchorman
## 0.0000000
## Anchor Man
## 0.0000000
## Anchorman 2
## 0.0000000
## Anchorman Tom
## 0.0000000
## Anchor Tom
## 0.0000000
## Anchorwoman
## 0.0000000
## Anderson Cooper
## 0.0000000
## An Elderly Man
## 0.0000000
## An Elderly Woman
## 0.0000000
## An Expert
## 0.0000000
## Angel
## 0.0000000
## Angel 1
## 0.0000000
## Angel 10
## 0.0000000
## Angel 11
## 0.0000000
## Angel 12
## 0.0000000
## Angel 2
## 0.0000000
## Angel 3
## 0.0000000
## Angel 4
## 0.0000000
## Angel 5
## 0.0000000
## Angel 6
## 0.0000000
## Angel 7
## 0.0000000
## Angel 9
## 0.0000000
## Angela Merkel
## 0.0000000
## Angelina Jolie
## 0.0000000
## Angels
## 0.0000000
## Anne
## 0.0000000
## Annie
## 0.0000000
## Annoncer
## 0.0000000
## Annoucer
## 0.0000000
## Announcer
## 0.0000000
## Announcer 1
## 0.0000000
## Announcer 2
## 0.0000000
## Announcer 3
## 0.0000000
## An officer
## 0.0000000
## An Officer
## 0.0000000
## An Official
## 0.0000000
## An Older Girl
## 0.0000000
## An old farmer
## 0.0000000
## Another addict
## 0.0000000
## Another Ambassador
## 0.0000000
## Another boy
## 0.0000000
## Another Cardinal
## 0.0000000
## Another fan
## 0.0000000
## Another kid
## 0.0000000
## Another kindergartner
## 0.0000000
## Another Man
## 0.0000000
## Another Mayor
## 0.0000000
## Anthropologist
## 0.0000000
## A Nun
## 0.0000000
## A Nurse
## 0.0000000
## A Page
## 0.0000000
## A pilot
## 0.0000000
## A Politician
## 0.0000000
## Apple Man 1
## 0.0000000
## Apple Man 2
## 0.0000000
## Apple Man 4
## 0.0000000
## Apple Tech
## 0.0000000
## A Protester
## 0.0000000
## A Quarantine
## 0.0000000
## A Quint
## 0.0000000
## Arab
## 0.0000000
## Archangel
## 0.0000000
## A Red Wing
## 0.0000000
## A ring tone
## 0.0000000
## Army Doctor
## 0.0000000
## Army Official
## 0.0000000
## Artist
## 0.0000000
## Artsy Man
## 0.0000000
## A Santa
## 0.0000000
## Ashley
## 0.0000000
## Asian Reporter
## 0.0000000
## A Sign-Holder
## 0.0000000
## A singer
## 0.0000000
## A singer, Goth Kids (singing)
## 0.0000000
## A skier
## 0.0000000
## Aslan
## 0.0000000
## Assembly
## 0.0000000
## Assemblyman 1
## 0.0000000
## Assemblyman 2
## 0.0000000
## Assemblyman 3
## 0.0000000
## Assemblyman 4
## 0.0000000
## Assemblywoman 1
## 0.0000000
## Assemblywoman 2
## 0.0000000
## Assistant
## 0.0000000
## Assistant 1
## 0.0000000
## Associate
## 0.0000000
## Astronaut 1
## 0.0000000
## Astronaut 2
## 0.0000000
## A Teacher
## 0.0000000
## A Teen Boy
## 0.0000000
## A Terrorist
## 0.0000000
## ATF agent
## 0.0000000
## ATF lead
## 0.0000000
## ATF Leader
## 0.0000000
## Athlete
## 0.0000000
## Attendant
## 0.0000000
## Attendant 1
## 0.0000000
## Attorney
## 0.0000000
## Audience
## 0.0000000
## Audience Member
## 0.0000000
## Audience members
## 0.0000000
## Audience Members
## 0.0000000
## Aunt Flo
## 0.0000000
## Aunt Jemima
## 0.0000000
## Aunt Nellie
## 0.0000000
## Aussie
## 0.0000000
## Aussie Crewman
## 0.0000000
## Australia
## 0.0000000
## Autumn
## 0.0000000
## Av 1
## 0.0000000
## Av 2
## 0.0000000
## Av 3
## 0.0000000
## A voice
## 0.0000000
## A Voice
## 0.0000000
## A woman
## 0.0000000
## A Woman
## 0.0000000
## Baahir
## 0.0000000
## Bab
## 0.0000000
## Babrady
## 0.0000000
## Baby
## 0.0000000
## Background Singers
## 0.0000000
## Backup Singers
## 0.0000000
## Badger
## 0.0000000
## Bailey
## 0.0000000
## Bailiff
## 0.0000000
## Baker 2
## 0.0000000
## Bald Convict
## 0.0000000
## Bald Guy
## 0.0000000
## Balding Man
## 0.0000000
## Bald Knight
## 0.0000000
## Ballmer
## 0.0000000
## Band
## 0.0000000
## Band Member 1
## 0.0000000
## Band Member 2
## 0.0000000
## Band Member 3
## 0.0000000
## Banker
## 0.0000000
## Barack Obama
## 0.0000000
## Barbardy
## 0.0000000
## Barber
## 0.0000000
## Barbrady
## 0.0000000
## Barbrady Actor
## 0.0000000
## Barbra Streisand
## 0.0000000
## Barkeep
## 0.0000000
## Barker
## 0.0000000
## Barkley
## 0.0000000
## Barky
## 0.0000000
## Barnaby Jones
## 0.0000000
## Bar Patron
## 0.0000000
## Bar Patron 1
## 0.0000000
## Bar Patron 2
## 0.0000000
## Bar Patrons
## 0.0000000
## Bart
## 0.0000000
## Bartender
## 0.0000000
## Bat dad
## 0.0000000
## Bat Dad
## 0.0000000
## BBC Anchor
## 0.0000000
## BBC Announcer
## 0.0000000
## BB Founder
## 0.0000000
## Bea Arthur
## 0.0000000
## Bear
## 0.0000000
## Bear cub
## 0.0000000
## Bearded man
## 0.0000000
## Bearded Man
## 0.0000000
## Bearded PeTA Member
## 0.0000000
## Beary
## 0.0000000
## Beary Bear
## 0.0000000
## Beast
## 0.0000000
## Beat-up Boy
## 0.0000000
## Beavery
## 0.0000000
## Beavery Beaver
## 0.0000000
## Bebe
## 0.0000000
## Bebe, New Kid
## 0.0000000
## Bebe's Mom
## 0.0000000
## Becker
## 0.0000000
## Bee Alien
## 0.0000000
## Beefcake
## 0.0000000
## Beelzeboot
## 0.0000000
## Bellboy
## 0.0000000
## Ben
## 0.0000000
## Ben Affleck
## 0.0000000
## Benedict XVI
## 0.0000000
## Benjamin
## 0.0000000
## Bennigan's Chef
## 0.0000000
## Ben Roethlisberger
## 0.0000000
## Ben Rothlisberger
## 0.0000000
## Bertha
## 0.0000000
## Best Buy President
## 0.0000000
## Best Buy Rep
## 0.0000000
## Betsy
## 0.0000000
## Betsy MacIntosh
## 0.0000000
## BHI President
## 0.0000000
## Bible Vendor
## 0.0000000
## Big Blonde
## 0.0000000
## Big-Eared Boy
## 0.0000000
## Big Gay Al
## 0.0000000
## Biggie Smalls
## 0.0000000
## Big Harry
## 0.0000000
## Big Man
## 0.0000000
## Big Stan
## 0.0000000
## Big Woman
## 0.0000000
## Biker 10
## 0.0000000
## Biker 11
## 0.0000000
## Biker 12
## 0.0000000
## Biker 13
## 0.0000000
## Biker 14
## 0.0000000
## Biker 15
## 0.0000000
## Biker 2
## 0.0000000
## Biker 3
## 0.0000000
## Biker 4
## 0.0000000
## Biker 5
## 0.0000000
## Biker 6
## 0.0000000
## Biker 7
## 0.0000000
## Biker 8
## 0.0000000
## Biker 9
## 0.0000000
## Bikers
## 0.0000000
## Bill
## 0.0000000
## Bill Clinton
## 0.0000000
## Bill Cosby
## 0.0000000
## Bill Gates
## 0.0000000
## Bill O'Reilly
## 0.0000000
## Bill's hologram
## 0.0000000
## Billy
## 0.0000000
## Billy Mays
## 0.0000000
## Billy's Mom
## 0.0000000
## Bishop
## 0.0000000
## Bishop 1
## 0.0000000
## Bishop 2
## 0.0000000
## Bishop 3
## 0.0000000
## Black Bailiff
## 0.0000000
## Black Bitch
## 0.0000000
## Black Bouncer
## 0.0000000
## Black boy
## 0.0000000
## Blackjack Dealer
## 0.0000000
## Black kid
## 0.0000000
## Black Man
## 0.0000000
## Black Man 2
## 0.0000000
## Black Man 3
## 0.0000000
## Black Member
## 0.0000000
## Black Officer
## 0.0000000
## Black Official
## 0.0000000
## Black Player
## 0.0000000
## Black Plumber
## 0.0000000
## Blacksmith
## 0.0000000
## Black Vamp
## 0.0000000
## Black Vamp, Mike, and Pete
## 0.0000000
## Black Woman
## 0.0000000
## Black Woman 2
## 0.0000000
## Blaine
## 0.0000000
## Blaintologist
## 0.0000000
## Blanket
## 0.0000000
## Blavius
## 0.0000000
## Blind Man
## 0.0000000
## Blond
## 0.0000000
## Blond agent
## 0.0000000
## Blond Agent
## 0.0000000
## Blond Boy
## 0.0000000
## Blond Cop
## 0.0000000
## Blonde
## 0.0000000
## Blonde 2
## 0.0000000
## Blonde 3
## 0.0000000
## Blonde Boy
## 0.0000000
## Blonde Girl
## 0.0000000
## Blonde Judge
## 0.0000000
## Blonde Mother
## 0.0000000
## Blonde Nurse
## 0.0000000
## Blonde PeTA Member
## 0.0000000
## Blonde PeTA Member 2
## 0.0000000
## Blonde PeTA Woman
## 0.0000000
## Blonde Protester
## 0.0000000
## Blonde Russian
## 0.0000000
## Blond Girl
## 0.0000000
## Blond Knight
## 0.0000000
## Blond man
## 0.0000000
## Blond Man
## 0.0000000
## Blond Member
## 0.0000000
## Blond Officer
## 0.0000000
## Blond Russian
## 0.0000000
## Blond Trekker
## 0.0000000
## Blood
## 0.0000000
## Blood 1
## 0.0000000
## Blood 2
## 0.0000000
## Blood 3
## 0.0000000
## Blood 4
## 0.0000000
## Blood 5
## 0.0000000
## Blood 6
## 0.0000000
## Bloodrayne
## 0.0000000
## Blue Team
## 0.0000000
## Board Member
## 0.0000000
## Board Rep
## 0.0000000
## Board Rep 1
## 0.0000000
## Board Rep 2
## 0.0000000
## Boat Ride Singers
## 0.0000000
## Bob
## 0.0000000
## Bobby Flay
## 0.0000000
## Bob Dole
## 0.0000000
## Bobo
## 0.0000000
## Bob Saget
## 0.0000000
## Bob Summers
## 0.0000000
## Bob Thomas
## 0.0000000
## Bodybuilder
## 0.0000000
## Bodyguard
## 0.0000000
## Bonds
## 0.0000000
## Bono
## 0.0000000
## Bookie
## 0.0000000
## Boombox
## 0.0000000
## Border Guard
## 0.0000000
## Border Officer 1
## 0.0000000
## Border Officer 2
## 0.0000000
## Border Officer 3
## 0.0000000
## Border Officer 4
## 0.0000000
## Border Officer 5
## 0.0000000
## Boss
## 0.0000000
## Both
## 0.0000000
## Both Cartmans
## 0.0000000
## Both Kyles
## 0.0000000
## Both men
## 0.0000000
## Both parents
## 0.0000000
## Both Parents
## 0.0000000
## Both sides
## 0.0000000
## Bouncer
## 0.0000000
## Boy
## 0.0000000
## Boy 1
## 0.0000000
## Boy #1
## 0.0000000
## Boy #1*
## 0.0000000
## Boy 2
## 0.0000000
## Boy #2
## 0.0000000
## Boy 3
## 0.0000000
## Boy 4
## 0.0000000
## Boy 5
## 0.0000000
## Boy Announcer
## 0.0000000
## Boyfriend
## 0.0000000
## Boy in Blue Vest
## 0.0000000
## Boy in glasses
## 0.0000000
## Boy in Green Shirt
## 0.0000000
## Boy In The Red Shirt
## 0.0000000
## Boys
## 0.0000000
## Boys 1/2
## 0.0000000
## Boys, Hankeys
## 0.0000000
## Boy Slave
## 0.0000000
## Boy Sledders
## 0.0000000
## Boy with Red Scarf
## 0.0000000
## BP Man 1
## 0.0000000
## BP Man 2
## 0.0000000
## BP Man 3
## 0.0000000
## BP Man 4
## 0.0000000
## Brad
## 0.0000000
## Bradley
## 0.0000000
## Bradley Biggle
## 0.0000000
## Brad Morgan
## 0.0000000
## Brad Paisley
## 0.0000000
## Braided Crip
## 0.0000000
## Brandon Carlile
## 0.0000000
## Brandy's Mom
## 0.0000000
## Brazil
## 0.0000000
## Breeder
## 0.0000000
## Brent Musberger
## 0.0000000
## Brett
## 0.0000000
## Brett Favre
## 0.0000000
## Brian
## 0.0000000
## Bridon
## 0.0000000
## Bridon, Wendy
## 0.0000000
## Britain
## 0.0000000
## British Cardinal
## 0.0000000
## British Delegate
## 0.0000000
## Britney
## 0.0000000
## Brobee
## 0.0000000
## Broderick
## 0.0000000
## Broker
## 0.0000000
## Broloff
## 0.0000000
## Bronco 1
## 0.0000000
## Bronco 2
## 0.0000000
## Broncos
## 0.0000000
## Bros
## 0.0000000
## Brother Anderson
## 0.0000000
## Brown Hare
## 0.0000000
## Brunet
## 0.0000000
## Brunet Boy
## 0.0000000
## Brunet Man
## 0.0000000
## Brunet Member
## 0.0000000
## Brunette
## 0.0000000
## Brunette 2
## 0.0000000
## Brunette 3
## 0.0000000
## Brunette Nurse
## 0.0000000
## Brunet Trekker
## 0.0000000
## BSM-471
## 0.0000000
## Bucky Bailey
## 0.0000000
## Buddha
## 0.0000000
## Buddy 1
## 0.0000000
## Buddy 2
## 0.0000000
## BUDS Man
## 0.0000000
## Buff Crip
## 0.0000000
## Bulter
## 0.0000000
## Bum
## 0.0000000
## Bum 1
## 0.0000000
## Bum 10
## 0.0000000
## Bum 11
## 0.0000000
## Bum 12
## 0.0000000
## Bum 13
## 0.0000000
## Bum 14
## 0.0000000
## Bum 15
## 0.0000000
## Bum 16
## 0.0000000
## Bum 17
## 0.0000000
## Bum 18
## 0.0000000
## Bum 2
## 0.0000000
## Bum 3
## 0.0000000
## Bum 4
## 0.0000000
## Bum 5
## 0.0000000
## Bum 6
## 0.0000000
## Bum 7
## 0.0000000
## Bum 8
## 0.0000000
## Bum 9
## 0.0000000
## Bums
## 0.0000000
## Bundy
## 0.0000000
## Burger King Exec
## 0.0000000
## Burly man
## 0.0000000
## Burns
## 0.0000000
## Bus Driver
## 0.0000000
## Bush
## 0.0000000
## Bushy Eyebrows Boy
## 0.0000000
## Businessman
## 0.0000000
## Butler
## 0.0000000
## Butters
## 0.0000000
## Butters and the Freaks
## 0.0000000
## Butters, Cartman
## 0.0000000
## Butters' profile
## 0.0000000
## Butter's Voice
## 0.0000000
## Butt Out!
## 0.0000000
## Butt Out! Lady
## 0.0000000
## Butt Out! Man 1
## 0.0000000
## Butt Out! Man 2
## 0.0000000
## Butt Out! Man 3
## 0.0000000
## Butt Out!'s Kyle
## 0.0000000
## Cabbie
## 0.0000000
## Cable Guy
## 0.0000000
## Café 180 Patron
## 0.0000000
## Café Monet diner
## 0.0000000
## Cajun Shrimper
## 0.0000000
## Caller
## 0.0000000
## Caller 1
## 0.0000000
## Caller 2
## 0.0000000
## Caller 3
## 0.0000000
## Cameraman
## 0.0000000
## Campers
## 0.0000000
## Camp Soldier
## 0.0000000
## Camp Warden
## 0.0000000
## Canadian
## 0.0000000
## Canadian 1
## 0.0000000
## Canadian 2
## 0.0000000
## Canadian 3
## 0.0000000
## Canadian Man
## 0.0000000
## Canadian Paparazzo
## 0.0000000
## Canadian PM
## 0.0000000
## Canadians
## 0.0000000
## Candice
## 0.0000000
## Cantor
## 0.0000000
## Canyoner
## 0.0000000
## Captain
## 0.0000000
## Captain Bly
## 0.0000000
## Captain Hindsight
## 0.0000000
## Captain Paul Watson
## 0.0000000
## Cardinal
## 0.0000000
## Cardinal Mahoney
## 0.0000000
## Cardinal Mallory
## 0.0000000
## Carl
## 0.0000000
## Carlos
## 0.0000000
## Carlos Mencia
## 0.0000000
## Carlos Ramirez
## 0.0000000
## Carol
## 0.0000000
## Caroline
## 0.0000000
## Carrot Ass
## 0.0000000
## Car Salesman
## 0.0000000
## Carson
## 0.0000000
## Carson replica
## 0.0000000
## Cartamn
## 0.0000000
## Carter
## 0.0000000
## Cartman
## 0.5794954
## Cartman and Kyle
## 0.0000000
## Cartman and the Gingers
## 0.0000000
## Cartman (Butters)
## 0.0000000
## Cartman, Butters
## 0.0000000
## Cartman, Choir
## 0.0000000
## Cartman/ Kenny
## 0.0000000
## Cartman, Kyle
## 0.0000000
## Cartman, Kyle, Kenny
## 0.0000000
## Cartman on Left
## 0.0000000
## Cartman on Right
## 0.0000000
## Cartman's Bad Side
## 0.0000000
## Cartmans/Boys
## 0.0000000
## Cartman's Conscience
## 0.0000000
## Cartman's Good Side
## 0.0000000
## Cartman Smurf
## 0.0000000
## Cartman's Side
## 0.0000000
## Cartman, Stan
## 0.0000000
## Cartman's voice
## 0.0000000
## Cartmen
## 0.0000000
## Case Worker
## 0.0000000
## Casey
## 0.0000000
## Cashier
## 0.0000000
## Cast
## 0.0000000
## Castro
## 0.0000000
## Cat
## 0.0000000
## Catatafish
## 0.0000000
## Cat Burglar
## 0.0000000
## Cavity Creeps
## 0.0000000
## CD
## 0.0000000
## Cee Lo Green
## 0.0000000
## Celine
## 0.0000000
## Celine Dion
## 0.0000000
## Celine, Terrance, Bob, Phillip, and people on the field
## 0.0000000
## Center
## 0.0000000
## Center 1
## 0.0000000
## Center 2
## 0.0000000
## Center Gnome
## 0.0000000
## Center Judge
## 0.0000000
## Centers
## 0.0000000
## Centers and Right
## 0.0000000
## CEO
## 0.0000000
## Cesar
## 0.0000000
## Chad
## 0.0000000
## Chad's Dad
## 0.0000000
## Chairman
## 0.0000000
## Chamber of Farts Operator
## 0.0000000
## Character
## 0.0000000
## Charise
## 0.0000000
## Charles Biggens
## 0.0000000
## Charlie
## 0.0000000
## Charlie Brown
## 0.0000000
## Charlie Rose
## 0.0000000
## Charlie Sheen
## 0.0000000
## Charlotte Poll Worker
## 0.0000000
## Chase
## 0.0000000
## Chauffeur
## 0.0000000
## Cheerleader 1
## 0.0000000
## Cheerleader 2
## 0.0000000
## Cheerleaders
## 0.0000000
## Cheesy Poof Cartman
## 0.0000000
## Cheesy Poofs Commercial
## 0.0000000
## Cheetara
## 0.0000000
## Chef
## 0.0000000
## Chef Actor
## 0.0000000
## Chef and James Taylor
## 0.0000000
## Chef and Principle Victoria
## 0.0000000
## Chef (falsetto)
## 0.0000000
## Chef (recording)
## 0.0000000
## Chef's dad
## 0.0000000
## Chef's mom
## 0.0000000
## Chef, Veronica
## 0.0000000
## Chef, Victoria, Mackey
## 0.0000000
## Cheney
## 0.0000000
## Cher
## 0.0000000
## Chet
## 0.0000000
## Chickadee-y
## 0.0000000
## Chief
## 0.0000000
## Chief Aide
## 0.0000000
## Chief David
## 0.0000000
## Chief elder
## 0.0000000
## Chief Elder
## 0.0000000
## Chief Joe
## 0.0000000
## Chief Justice
## 0.0000000
## Chief of Security
## 0.0000000
## Chief Running Pinto
## 0.0000000
## Chief Running Pinto (Tommy Chong in his stoner voice)
## 0.0000000
## Chief Running Water
## 0.0000000
## Chief Stevens
## 0.0000000
## Child
## 0.0000000
## Child singers
## 0.0000000
## China
## 0.0000000
## Chinese Commentator
## 0.0000000
## Chinese kid
## 0.0000000
## Chinese Officer
## 0.0000000
## Chip
## 0.0000000
## Chocolate Rain Guy
## 0.0000000
## Choir
## 0.0000000
## Choir Boy
## 0.0000000
## Choir Girl
## 0.0000000
## Choir Teacher
## 0.0000000
## Chorus
## 0.0000000
## Chris
## 0.0000000
## Chris Crocker
## 0.0000000
## Chris Holt
## 0.0000000
## Chris Martin
## 0.0000000
## Chris/Saddam
## 0.0000000
## Chris Swollenballs
## 0.0000000
## Christina Aguilera monster
## 0.0000000
## Christina Naylon
## 0.0000000
## Christine
## 0.0000000
## Chubby Official
## 0.0000000
## CIA Leader 2
## 0.0000000
## CIA Vice Head
## 0.0000000
## Cinderella
## 0.0000000
## Cipac
## 0.0000000
## Citizen
## 0.0000000
## Citizen 2
## 0.0000000
## City Wok Owner
## 0.0000000
## Class
## 0.0000000
## Classmates
## 0.0000000
## Clean Garrison
## 0.0000000
## Cleric 1
## 0.0000000
## Cleric 2
## 0.0000000
## Cleric 3
## 0.0000000
## Clerk
## 0.0000000
## Clerk 1
## 0.0000000
## Clerk 2
## 0.0000000
## Clerk 3
## 0.0000000
## Clerk 4
## 0.0000000
## Cliff
## 0.0000000
## Clinic Doctor
## 0.0000000
## Clinton
## 0.0000000
## Clown
## 0.0000000
## Club Members
## 0.0000000
## Clyde
## 0.0000000
## Clyde Frog
## 0.0000000
## Clyde, Ike
## 0.0000000
## Clyde, Kenny
## 0.0000000
## CNN Anchor
## 0.0000000
## CNN Reporter
## 0.0000000
## Coach
## 0.0000000
## Coach 2
## 0.0000000
## Coach Connors
## 0.0000000
## Cochran
## 0.0000000
## COCKA-3
## 0.0000000
## Cody
## 0.0000000
## Colin
## 0.0000000
## Colleague
## 0.0000000
## Colleague 1
## 0.0000000
## Colleague 2
## 0.0000000
## Collector
## 0.0000000
## Collins
## 0.0000000
## Comedian
## 0.0000000
## Commander
## 0.0000000
## Commentator
## 0.0000000
## Commentator 1
## 0.0000000
## Commentator 2
## 0.0000000
## Commissioner
## 0.0000000
## Company rep
## 0.0000000
## Computer
## 0.0000000
## Computer Voice
## 0.0000000
## Comrade 1
## 0.0000000
## Comrade 2
## 0.0000000
## Conan O'Brien
## 0.0000000
## Conductor
## 0.0000000
## Confederate 1
## 0.0000000
## Confederate 2
## 0.0000000
## Confederate Reenactors
## 0.0000000
## Confederates
## 0.0000000
## Congregants
## 0.0000000
## Congregation
## 0.0000000
## Congressman
## 0.0000000
## Congressman 1
## 0.0000000
## Congressman 1, Cartman
## 0.0000000
## Congressman 2
## 0.0000000
## Congressman 3
## 0.0000000
## Congressmen
## 0.0000000
## Connelly
## 0.0000000
## Conner
## 0.0000000
## Connor
## 0.0000000
## Constance
## 0.0000000
## Construction Worker
## 0.0000000
## Contestant
## 0.0000000
## Contestant 2
## 0.0000000
## Controller 1
## 0.0000000
## Controller 2
## 0.0000000
## Convict 2
## 0.0000000
## Coon
## 0.0000000
## Coon's Friends
## 0.0000000
## Coordinator
## 0.0000000
## Cop
## 0.0000000
## Cop 1
## 0.0000000
## Cop 2
## 0.0000000
## Copilot
## 0.0000000
## Cops
## 0.0000000
## Corey
## 0.0000000
## Cornwallis
## 0.0000000
## Corporate Head
## 0.0000000
## Coucilman
## 0.0000000
## Counselor
## 0.0000000
## Counselor Steve
## 0.0000000
## Country Singer
## 0.0000000
## Cous-Cous
## 0.0000000
## Cow
## 0.0000000
## Cowboy
## 0.0000000
## Cowboy 1
## 0.0000000
## Cowboy 2
## 0.0000000
## Cowboys
## 0.0000000
## Cowlick Vamp
## 0.0000000
## Cowlick Vampire
## 0.0000000
## Coworker
## 0.0000000
## Co-Worker
## 0.0000000
## Cows
## 0.0000000
## Cpt. Gabriel
## 0.0000000
## Cpt. Taylor
## 0.0000000
## Crab Leader
## 0.0000000
## Crab Man 2
## 0.0000000
## Crab Man 3
## 0.0000000
## Crab People
## 0.0000000
## Crab Solo
## 0.0000000
## Craig
## 0.0000000
## Craig's father
## 0.0000000
## Craig's Father
## 0.0000000
## Craig's father, Tom
## 0.0000000
## Creamy Goodness
## 0.0000000
## Creature
## 0.0000000
## Creature from the Black Lagoon
## 0.0000000
## Crew
## 0.0000000
## Crewman
## 0.0000000
## Crewman 1
## 0.0000000
## Crewman 2
## 0.0000000
## Crewman 3
## 0.0000000
## Crewman 4
## 0.0000000
## Crewman 5
## 0.0000000
## Crewman 6
## 0.0000000
## Crew, Stan
## 0.0000000
## Crip
## 0.0000000
## Crip 1
## 0.0000000
## Crip 2
## 0.0000000
## Crips
## 0.0000000
## Critter
## 0.0000000
## Critters
## 0.0000000
## Crowd
## 0.0000000
## Crowd Member
## 0.0000000
## Crowd members
## 0.0000000
## Crowd Members
## 0.0000000
## Crowd outside
## 0.0000000
## Cruise
## 0.0000000
## Cruise Attendant
## 0.0000000
## Cruise, Travolta
## 0.0000000
## Cult Leader
## 0.0000000
## Cupid Me
## 0.0000000
## Customer
## 0.0000000
## Customer 2
## 0.0000000
## Customers
## 0.0000000
## DA
## 0.0000000
## Dad
## 0.0000000
## Dahmer
## 0.0000000
## Dahmer, Gacy
## 0.0000000
## Dale
## 0.0000000
## Dale Earnhardt, Jr.
## 0.0000000
## Damanta Unit 5
## 0.0000000
## Damien
## 0.0000000
## Damla
## 0.0000000
## Damned Soul
## 0.0000000
## Dan
## 0.0000000
## Dan Akawa
## 0.0000000
## Danica Patrick
## 0.0000000
## Daniel
## 0.0000000
## Danish Man
## 0.0000000
## Danish Woman
## 0.0000000
## Dan Snyder
## 0.0000000
## Dark Cub
## 0.0000000
## Darryl
## 0.0000000
## Darryl Weathers
## 0.0000000
## Darth Chef
## 0.0000000
## Date
## 0.0000000
## Daughter
## 0.0000000
## Dave
## 0.0000000
## David
## 0.0000000
## David Carradine
## 0.0000000
## David Duchovny
## 0.0000000
## David Lee Roth
## 0.0000000
## David Letterman
## 0.0000000
## Davis
## 0.0000000
## Dawkins
## 0.0000000
## Dawson
## 0.0000000
## DC Captain
## 0.0000000
## DC Crew
## 0.0000000
## DC Crewman
## 0.0000000
## DC Crewmen
## 0.0000000
## Dean
## 0.0000000
## Dean Howland
## 0.0000000
## Death
## 0.0000000
## Deckhand
## 0.0000000
## Deck Hand
## 0.0000000
## Deery
## 0.0000000
## Deery Deer
## 0.0000000
## Delivery Man
## 0.0000000
## Demon
## 0.0000000
## Demon 1
## 0.0000000
## Demon 2
## 0.0000000
## Demon 3
## 0.0000000
## Demonius
## 0.0000000
## Dennis
## 0.0000000
## Dental Floss
## 0.0000000
## Dentist
## 0.0000000
## Dentists
## 0.0000000
## Denver Catcher
## 0.0000000
## Denver citizens
## 0.0000000
## Denver Cop
## 0.0000000
## Denver Fans
## 0.0000000
## Denver Goalie
## 0.0000000
## Denver Guard
## 0.0000000
## Denver Pitcher
## 0.0000000
## Denver Player
## 0.0000000
## Denver Player 2
## 0.0000000
## Denver Player 3
## 0.0000000
## Denver Player 4
## 0.0000000
## Denver Poll Worker
## 0.0000000
## Denver Team
## 0.0000000
## Deputy 1
## 0.0000000
## Deputy 2
## 0.0000000
## Derek
## 0.0000000
## Designer
## 0.0000000
## Desk Officer
## 0.0000000
## Detective
## 0.0000000
## Detective 3
## 0.0000000
## Detective 4
## 0.0000000
## Det. Harris
## 0.0000000
## Det. Jarvis
## 0.0000000
## Det. Yates
## 0.0000000
## Devil
## 0.0000000
## DiCaprio
## 0.0000000
## Dick Cheney
## 0.0000000
## Dick Dastardly
## 0.0000000
## Dickinson
## 0.0000000
## Dimitri
## 0.0000000
## Diner 1
## 0.0000000
## Diner 2
## 0.0000000
## Diner 3
## 0.0000000
## Diner 4
## 0.0000000
## Diners
## 0.0000000
## Dio
## 0.0000000
## Director
## 0.0000000
## Director 1
## 0.0000000
## Director 10
## 0.0000000
## Director 2
## 0.0000000
## Director 3
## 0.0000000
## Director 4
## 0.0000000
## Director 5
## 0.0000000
## Director 6
## 0.0000000
## Director 7
## 0.0000000
## Director 8
## 0.0000000
## Director 9
## 0.0000000
## Disciples vocalist
## 0.0000000
## Disfigured Country Singer
## 0.0000000
## Disney Exec 1
## 0.0000000
## Disney Exec 2
## 0.0000000
## Disney Exec 3
## 0.0000000
## Dispatcher
## 0.0000000
## Dispatcher 1
## 0.0000000
## Dispatcher 2
## 0.0000000
## Dispatcher 3
## 0.0000000
## DJ
## 0.0000000
## DJ AM
## 0.0000000
## DMV Official
## 0.0000000
## Doctor
## 0.0000000
## Doctor 1
## 0.0000000
## Doctor 2
## 0.0000000
## Doctor Pal
## 0.0000000
## Doctor's assistant
## 0.0000000
## DogPoo
## 0.0000000
## DOI 1
## 0.0000000
## DOI 2
## 0.0000000
## DOI 3
## 0.0000000
## Dominique and Zizi
## 0.0000000
## Domino
## 0.0000000
## Don
## 0.0000000
## Donald
## 0.0000000
## Donald Rumsfeld
## 0.0000000
## Donald T. Brown
## 0.0000000
## Donald Trump
## 0.0000000
## Don King
## 0.0000000
## Donna
## 0.0000000
## Doorman
## 0.0000000
## Dora
## 0.0000000
## Dougie
## 0.0000000
## Douglas
## 0.0000000
## DP Executive 1
## 0.0000000
## DP Executive 2
## 0.0000000
## DP Executive 3
## 0.0000000
## DP Executive 4
## 0.0000000
## DP Executive 5
## 0.0000000
## DP Executive 6
## 0.0000000
## DP Executives
## 0.0000000
## Draco
## 0.0000000
## Dr Adams
## 0.0000000
## Dr. Adams
## 0.0000000
## Dr. Biber
## 0.0000000
## Dr. Carroll
## 0.0000000
## Dr. Chinstrap
## 0.0000000
## Dr. Doctor
## 0.0000000
## Dr. Doom
## 0.0000000
## Dreadlocked PeTA man
## 0.0000000
## Dreadlocked PeTA Man
## 0.0000000
## Dream Estella
## 0.0000000
## Drew
## 0.0000000
## Dr. Hallis
## 0.0000000
## Driver
## 0.0000000
## Driver 1
## 0.0000000
## Driver 2
## 0.0000000
## Driver 3
## 0.0000000
## Driver 3's Passenger
## 0.0000000
## Driver 4
## 0.0000000
## Driver 5
## 0.0000000
## Dr. Janus
## 0.0000000
## Dr. Katz
## 0.0000000
## Dr. Land
## 0.0000000
## Dr. Lott
## 0.0000000
## Dr. Mephesto
## 0.0000000
## Dr. Neeland
## 0.0000000
## Dr. Oz
## 0.0000000
## Dr. Phil
## 0.0000000
## Dr. Phillips
## 0.0000000
## Dr. Roberts
## 0.0000000
## Dr. Schwartz
## 0.0000000
## Dr. Shay
## 0.0000000
## Dr. Spookalot
## 0.0000000
## Dr. Tonton
## 0.0000000
## Drummer
## 0.0000000
## Dude
## 0.0000000
## Duncan
## 0.0000000
## Duncan Everton
## 0.0000000
## DVDA
## 0.0000000
## Dylan
## 0.0000000
## Eager Man
## 0.0000000
## Earl
## 0.0000000
## Ed
## 0.0000000
## Edge
## 0.0000000
## Editor
## 0.0000000
## Ed McMahon
## 0.0000000
## Ed Sullivan
## 0.0000000
## EFSM President
## 0.0000000
## Elder
## 0.0000000
## Elder 1
## 0.0000000
## Elder 2
## 0.0000000
## Elder 3
## 0.0000000
## Elder Carn
## 0.0000000
## Elder Garth
## 0.0000000
## Elder Harris
## 0.0000000
## Elderlay man
## 0.0000000
## Elderly Driver
## 0.0000000
## Elderly Lady
## 0.0000000
## Elderly man
## 0.0000000
## Elderly Man
## 0.0000000
## Elderly Man 1
## 0.0000000
## Elderly Man 10
## 0.0000000
## Elderly Man 11
## 0.0000000
## Elderly Man 2
## 0.0000000
## Elderly Man 3
## 0.0000000
## Elderly Man 4
## 0.0000000
## Elderly Man 5
## 0.0000000
## Elderly Man 6
## 0.0000000
## Elderly Man 7
## 0.0000000
## Elderly Man 8
## 0.0000000
## Elderly Man 9
## 0.0000000
## Elderly Passenger
## 0.0000000
## Elderly Priest
## 0.0000000
## Elderly Tree Hugger
## 0.0000000
## Elderly Voice
## 0.0000000
## Elderly woman
## 0.0000000
## Elderly Woman
## 0.0000000
## Elderly Woman 1
## 0.0000000
## Elderly Woman 2
## 0.0000000
## Elderly Woman 3
## 0.0000000
## Elderly Woman 4
## 0.0000000
## Elderly Woman 6
## 0.0000000
## Elderly Woman 7
## 0.0000000
## Elders
## 0.0000000
## Elder Schwartz
## 0.0000000
## Electronic Head
## 0.0000000
## Elephant Man
## 0.0000000
## Elin
## 0.0000000
## Elise
## 0.0000000
## Ellen
## 0.0000000
## Ellen DeGeneres
## 0.0000000
## Elmo
## 0.0000000
## Elon Musk
## 0.0000000
## El Presidente
## 0.0000000
## Elton
## 0.0000000
## Elton John
## 0.0000000
## Elvin
## 0.0000000
## Elvis' Hologram
## 0.0000000
## Emcee
## 0.0000000
## Emily
## 0.0000000
## Emir
## 0.0000000
## Emmanuel Lewis
## 0.0000000
## Emmett
## 0.0000000
## Emo Boy
## 0.0000000
## Emo Boy 1
## 0.0000000
## Emo Boy 2
## 0.0000000
## Emo Girl
## 0.0000000
## Emperor Akihito
## 0.0000000
## Emperor Hirohito
## 0.0000000
## Employee
## 0.0000000
## Employee 1
## 0.0000000
## Employee 2
## 0.0000000
## Employee 3
## 0.0000000
## Engineer
## 0.0000000
## Enrique
## 0.0000000
## Enrique Iglesias
## 0.0000000
## Ensign
## 0.0000000
## EOD Leader
## 0.0000000
## Eric
## 0.0000000
## Eric Cartman
## 0.0000000
## Eric Roberts
## 0.0000000
## Eric Roberts (as Kevin!)
## 0.0000000
## ESPN Announcer
## 0.0000000
## ESPN Host
## 0.0000000
## Estella
## 0.0000000
## Esther
## 0.0000000
## Ethiopian
## 0.0000000
## Ethiopians
## 0.0000000
## Ethiopian Woman
## 0.0000000
## ET Reporter
## 0.0000000
## Eugene Levy
## 0.0000000
## Evan Stone
## 0.0000000
## Everybody
## 0.0000000
## Everyone
## 0.0000000
## Everyone Else
## 0.0000000
## EVGames Clerk
## 0.0000000
## Evil Cartman
## 0.0000000
## Evil Kyle
## 0.0000000
## Evil Stan
## 0.0000000
## Ex-Convict
## 0.0000000
## Exec. 1
## 0.0000000
## Exec. 2
## 0.0000000
## Exec. 3
## 0.0000000
## Exec. 4
## 0.0000000
## Executive
## 0.0000000
## Executive 1
## 0.0000000
## Executives
## 0.0000000
## Executor
## 0.0000000
## Expert 1
## 0.0000000
## Expert 10
## 0.0000000
## Expert 11
## 0.0000000
## Expert 2
## 0.0000000
## Expert 3
## 0.0000000
## Expert 4
## 0.0000000
## Expert 5
## 0.0000000
## Expert 6
## 0.0000000
## Expert 7
## 0.0000000
## Expert 8
## 0.0000000
## Expert 9
## 0.0000000
## Factory workers
## 0.0000000
## Falcon
## 0.0000000
## Falsetto
## 0.0000000
## Family
## 0.0000000
## Fan
## 0.0000000
## Fan 1
## 0.0000000
## Fan 2
## 0.0000000
## Fanciful Mayor
## 0.0000000
## Fangirls
## 0.0000000
## Fans
## 0.0000000
## Fan wearing #3
## 0.0000000
## Fan wearing #74
## 0.0000000
## Fan wearing #82
## 0.0000000
## Fan wearing a blue star
## 0.0000000
## Farmer
## 0.0000000
## Farmer 2
## 0.0000000
## Farmer Carl
## 0.0000000
## Farmer Friend 2
## 0.0000000
## Farmers
## 0.0000000
## Farrah Fawcett
## 0.0000000
## Fat Abbot
## 0.0000000
## Fat Boy
## 0.0000000
## Fat Cop
## 0.0000000
## Fat Girl
## 0.0000000
## Father
## 0.0000000
## Father Barnes
## 0.0000000
## Father Maxi
## 0.0000000
## Fat Man
## 0.0000000
## Fat Plumber
## 0.0000000
## Fat Priest
## 0.0000000
## FBI agent
## 0.0000000
## FBI Agent
## 0.0000000
## FBI Agents
## 0.0000000
## FBI Leader
## 0.0000000
## FBI Negotiator
## 0.0000000
## FC Announcer
## 0.0000000
## FC Batter
## 0.0000000
## FC Batter 1
## 0.0000000
## FC Catcher
## 0.0000000
## FC Fat Player
## 0.0000000
## FC Pitcher
## 0.0000000
## FC Team
## 0.0000000
## FDA Agent 1
## 0.0000000
## Fed
## 0.0000000
## Felipe
## 0.0000000
## Female
## 0.0000000
## Female Activist
## 0.0000000
## Female Agent
## 0.0000000
## Female Agent 2
## 0.0000000
## Female Aide
## 0.0000000
## Female Anchor
## 0.0000000
## Female announcer
## 0.0000000
## Female CPS Agent
## 0.0000000
## Female Detective
## 0.0000000
## Female director
## 0.0000000
## Female director 2
## 0.0000000
## Female fan
## 0.0000000
## Female Gambler 1
## 0.0000000
## Female Gambler 2
## 0.0000000
## Female hippie
## 0.0000000
## Female Host
## 0.0000000
## Female Nurse
## 0.0000000
## Female passenger
## 0.0000000
## Female Psychic
## 0.0000000
## Female Reporter
## 0.0000000
## Female Reporter 2
## 0.0000000
## Females
## 0.0000000
## Female Sailor
## 0.0000000
## Female singer
## 0.0000000
## Female Staffer
## 0.0000000
## Female voice
## 0.0000000
## Female Voice
## 0.0000000
## Ferrari
## 0.0000000
## Fiancée
## 0.0000000
## Field Reporter
## 0.0000000
## Field Reporter 1
## 0.0000000
## Field Reporter 2
## 0.0000000
## Field Reporter 3
## 0.0000000
## Fields
## 0.0000000
## Fieldy
## 0.0000000
## Fifth Grader
## 0.0000000
## Fifth Graders
## 0.0000000
## Figure 1
## 0.0000000
## Fillmore
## 0.0000000
## Fillmore and Friend
## 0.0000000
## Filmore
## 0.0000000
## Filmore*
## 0.0000000
## Filmore's Supporters
## 0.0000000
## Fingerbang
## 0.0000000
## Finland
## 0.0000000
## Fire Captain
## 0.0000000
## Fire Chief
## 0.0000000
## Firefighter
## 0.0000000
## Fireman
## 0.0000000
## Fireman 1
## 0.0000000
## Fireman 2
## 0.0000000
## Fireman 3
## 0.0000000
## Fire Marshal
## 0.0000000
## Firkle
## 0.0000000
## First Mate
## 0.0000000
## Fisherman
## 0.0000000
## Flannagan
## 0.0000000
## Fleetwood Mac
## 0.0000000
## Flight attendant
## 0.0000000
## Flight Attendant
## 0.0000000
## Flight Attendant 1
## 0.0000000
## Flight Attendant 2
## 0.0000000
## Flight Attendant 3
## 0.0000000
## Floating Man
## 0.0000000
## Flora
## 0.0000000
## Florence
## 0.0000000
## Foley
## 0.0000000
## Followers
## 0.0000000
## Fonzie
## 0.0000000
## Foofa
## 0.0000000
## Foreman
## 0.0000000
## Formena
## 0.0000000
## Former Coach
## 0.0000000
## Fosse
## 0.0000000
## FOX 11 Anchor
## 0.0000000
## FOX President
## 0.0000000
## Foxy
## 0.0000000
## Frakes
## 0.0000000
## France
## 0.0000000
## Frances
## 0.0000000
## Francis
## 0.0000000
## Francis Ford Coppola
## 0.0000000
## Frank
## 0.0000000
## Frankenstein Alien
## 0.0000000
## Frank Hammond
## 0.0000000
## Franklin
## 0.0000000
## Frank Sinatra
## 0.0000000
## Frans
## 0.0000000
## Frat Boy 1
## 0.0000000
## Frat Boy 2
## 0.0000000
## Frat Boy 3
## 0.0000000
## Frat Boys
## 0.0000000
## Freddy Krueger
## 0.0000000
## Frederick
## 0.0000000
## Fred Savage
## 0.0000000
## French Canadians
## 0.0000000
## French Captain
## 0.0000000
## French Cardinal
## 0.0000000
## French Delegate
## 0.0000000
## Frida
## 0.0000000
## Fr. Maxi
## 0.0000000
## Frog King
## 0.0000000
## Front Desk Officer
## 0.0000000
## Frothgar
## 0.0000000
## Fuhrman
## 0.0000000
## Funbot
## 0.0000000
## Funnybot
## 0.0000000
## Future Butters
## 0.0000000
## Future Cartman
## 0.0000000
## Future Stan
## 0.0000000
## Gabriel
## 0.0000000
## Gacy
## 0.0000000
## Gail
## 0.0000000
## Galeed
## 0.0000000
## Gambler 1
## 0.0000000
## Gambler 2
## 0.0000000
## Gambler 3
## 0.0000000
## Gambler 4
## 0.0000000
## Game Voice
## 0.0000000
## Gandalf
## 0.0000000
## Gang Members
## 0.0000000
## Ganz
## 0.0000000
## Gardener
## 0.0000000
## Garrison
## 0.0000000
## Garrison 1
## 0.0000000
## Garrison 2
## 0.0000000
## Garrison Actor
## 0.0000000
## Garrison's profile
## 0.0000000
## Garth
## 0.0000000
## Gary
## 0.0000000
## Gary Coleman
## 0.0000000
## Gary Condit
## 0.0000000
## Gary Johnson's profile
## 0.0000000
## Gary Nelson
## 0.0000000
## Gary Sr
## 0.0000000
## Gary Sr.
## 0.0000000
## Gary Sr., Karen
## 0.0000000
## Gas Mask PeTA Member
## 0.0000000
## Gates
## 0.0000000
## Gavin
## 0.0000000
## Gay Lion
## 0.0000000
## Geddy Lee
## 0.0000000
## Geldon
## 0.0000000
## Gelgamek Cardinal
## 0.0000000
## Gene
## 0.0000000
## General
## 0.0000000
## General Disarray
## 0.0000000
## General Tso
## 0.0000000
## Gene Siskel
## 0.0000000
## Geoff
## 0.0000000
## Geoff Hamill
## 0.0000000
## Geologist 1
## 0.0000000
## Geologist 2
## 0.0000000
## George Bailey
## 0.0000000
## George Burns
## 0.0000000
## George Bush
## 0.0000000
## George Lucas
## 0.0000000
## George Zimmerman
## 0.0000000
## Gerald
## 0.0000000
## Gerald and Sheila
## 0.0000000
## Gerald Broflovski
## 0.0000000
## Gerald/Chris
## 0.0000000
## Gerald, Kyle
## 0.0000000
## Geraldo
## 0.0000000
## Gerald, Sheila
## 0.0000000
## German 1
## 0.0000000
## German 2
## 0.0000000
## Germany
## 0.0000000
## Gerry
## 0.0000000
## Gerry's Daughters
## 0.0000000
## Ghandi
## 0.0000000
## Ghetto Avenue Boys
## 0.0000000
## Ghost
## 0.0000000
## Ghost 2
## 0.0000000
## Giant Douche
## 0.0000000
## Gil
## 0.0000000
## Ginger 1
## 0.0000000
## Ginger 2
## 0.0000000
## Ginger 3
## 0.0000000
## Ginger 4
## 0.0000000
## Ginger Boy
## 0.0000000
## Ginger Boy 2
## 0.0000000
## Ginger Girl
## 0.0000000
## Gingers
## 0.0000000
## Gino
## 0.0000000
## Girl
## 0.0000000
## Girl 1
## 0.0000000
## Girl 2
## 0.0000000
## Girl 2's Father
## 0.0000000
## Girl 3
## 0.0000000
## Girlfriend
## 0.0000000
## Girl in O T-shirt
## 0.0000000
## Girl in Pink
## 0.0000000
## Girl In Pink
## 0.0000000
## Girl in Puppy T-shirt
## 0.0000000
## Girls
## 0.0000000
## Girls' Table
## 0.0000000
## Girl with Blue Vest
## 0.0000000
## Girl with Brown Coat
## 0.0000000
## Glen
## 0.0000000
## Glen Dumont
## 0.0000000
## Glinda
## 0.0000000
## Gloria Allred
## 0.0000000
## Gnome
## 0.0000000
## Gnome 1
## 0.0000000
## Gnome 2
## 0.0000000
## Gnome 3
## 0.0000000
## Gnome 4
## 0.0000000
## Gnome 5
## 0.0000000
## Gnomes
## 0.0000000
## Goat
## 0.0000000
## Goateed man
## 0.0000000
## Goat leader
## 0.0000000
## God
## 0.0000000
## Goodell
## 0.0000000
## Goodly
## 0.0000000
## Gordon
## 0.0000000
## Gordon Stoltski
## 0.0000000
## Goths
## 0.0000000
## Goth Voice
## 0.0000000
## Governor
## 0.0000000
## Gram'ma
## 0.0000000
## Grammy
## 0.0000000
## Grampa
## 0.0000000
## Grandma
## 0.0000000
## Grandmama
## 0.0000000
## Grandma Marsh's profile
## 0.0000000
## Grandma Obama
## 0.0000000
## Grandmother Mother
## 0.0000000
## Grandpa
## 0.0000000
## Grandpa Marvin
## 0.0000000
## Grant
## 0.0000000
## Gray Hare
## 0.0000000
## Great-Great-Grampa
## 0.0000000
## Greeley Batter
## 0.0000000
## Greeley Man
## 0.0000000
## Greeley Officer 1
## 0.0000000
## Greeley Officer 2
## 0.0000000
## Greeley Officer 3
## 0.0000000
## Greeley Team
## 0.0000000
## Greenfield
## 0.0000000
## Greeter
## 0.0000000
## Greg Nimins
## 0.0000000
## Gretchen
## 0.0000000
## Grey Hat
## 0.0000000
## Grizzled Man
## 0.0000000
## Groundskeeper
## 0.0000000
## Group
## 0.0000000
## Groupie
## 0.0000000
## GRRM
## 0.0000000
## GS-401
## 0.0000000
## Guard
## 0.0000000
## Guard 1
## 0.0000000
## Guard 2
## 0.0000000
## Guard 3
## 0.0000000
## Guard 4
## 0.0000000
## Guard 5
## 0.0000000
## Guard 6
## 0.0000000
## Guard 7
## 0.0000000
## Guard 8
## 0.0000000
## Guard 9
## 0.0000000
## Guard on Right
## 0.0000000
## Guest
## 0.0000000
## Guest 1
## 0.0000000
## Guest 2
## 0.0000000
## Guest 3
## 0.0000000
## Guest 4
## 0.0000000
## Guests
## 0.0000000
## Guests in line
## 0.0000000
## Guest Speaker
## 0.0000000
## Guide
## 0.0000000
## Guide 1
## 0.0000000
## Gunsmith
## 0.0000000
## Guy 1
## 0.0000000
## Guy 2
## 0.0000000
## Guy Fieri
## 0.0000000
## Guy in Audience
## 0.0000000
## Guy in flat top
## 0.0000000
## Guy in Leather Jacket
## 0.0000000
## Guy with Long Hair
## 0.0000000
## Hackman
## 0.0000000
## Halfy
## 0.0000000
## Hall Monitor
## 0.0000000
## Haman
## 0.0000000
## Hamlet
## 0.0000000
## Hammerhead Man
## 0.0000000
## Hancock
## 0.0000000
## Hankey Elf
## 0.0000000
## Hansen
## 0.0000000
## Hard Candy
## 0.0000000
## Hare 1
## 0.0000000
## Hare 2
## 0.0000000
## Hare 3
## 0.0000000
## Hare 4
## 0.0000000
## Hare 5
## 0.0000000
## Hare 6
## 0.0000000
## Hare 7
## 0.0000000
## Hares
## 0.0000000
## Harold
## 0.0000000
## Harris
## 0.0000000
## Harrison Moore
## 0.0000000
## Harry
## 0.0000000
## Harvey Brown
## 0.0000000
## Hasselback
## 0.0000000
## Hat McCollough
## 0.0000000
## Hatoyama
## 0.0000000
## Hazmat man
## 0.0000000
## HazMat official
## 0.0000000
## HBC President
## 0.0000000
## HBC Reporter
## 0.0000000
## HC Driver 1
## 0.0000000
## HC Driver 2
## 0.0000000
## HC Driver 3
## 0.0000000
## HC Driver 4
## 0.0000000
## HC Driver 5
## 0.0000000
## HC Driver 6
## 0.0000000
## HC Driver 7
## 0.0000000
## HC drivers
## 0.0000000
## Head
## 0.0000000
## Head Adventurer
## 0.0000000
## Head Agent
## 0.0000000
## Head Baker
## 0.0000000
## Head Concierge
## 0.0000000
## Headless Horseman
## 0.0000000
## Head nurse
## 0.0000000
## Head of Programming
## 0.0000000
## Head of Public Safety
## 0.0000000
## Head Scoutmaster
## 0.0000000
## Head Waiter
## 0.0000000
## Heather
## 0.0000000
## Heidi
## 0.0000000
## Heidi, Millie
## 0.0000000
## Heidi's Mom
## 0.0000000
## Helen
## 0.0000000
## Hell Director
## 0.0000000
## Hemorrhoid
## 0.0000000
## Henchman
## 0.0000000
## Henrietta
## 0.0000000
## Henrietta's Mom
## 0.0000000
## Herbert Garrison
## 0.0000000
## Her Blossom
## 0.0000000
## Her crotch
## 0.0000000
## Hildog Fan
## 0.0000000
## Hillary
## 0.0000000
## Hillary Clinton
## 0.0000000
## Hippie
## 0.0000000
## Hippie 1
## 0.0000000
## Hippie 2
## 0.0000000
## Hippie 3
## 0.0000000
## Hippie 4
## 0.0000000
## Hippie 5
## 0.0000000
## Hippie 6
## 0.0000000
## Hippies
## 0.0000000
## Hippies and Kyle
## 0.0000000
## His Date
## 0.0000000
## Hispanic Reporter
## 0.0000000
## Hitler
## 0.0000000
## Ho
## 0.0000000
## Hobo
## 0.0000000
## Hockey Player
## 0.0000000
## Hollis
## 0.0000000
## Homeless Advisor
## 0.0000000
## Homeowner
## 0.0000000
## Honey Boo Boo
## 0.0000000
## Hooded Figure
## 0.0000000
## Hooker
## 0.0000000
## Hopkins
## 0.0000000
## Horace
## 0.0000000
## Horatio
## 0.0000000
## Host
## 0.0000000
## Host 1
## 0.0000000
## Host 2
## 0.0000000
## HotForBoys219
## 0.0000000
## Hotline Man
## 0.0000000
## Hotline Voice
## 0.0000000
## House
## 0.0000000
## Howard
## 0.0000000
## Howard Stern
## 0.0000000
## Huddle
## 0.0000000
## Hula Dancers
## 0.0000000
## Human Kite
## 0.0000000
## Human Wendy
## 0.0000000
## Husband
## 0.0000000
## Hyde
## 0.0000000
## Icarus
## 0.0000000
## Iggy
## 0.0000000
## Iggy's Ass
## 0.0000000
## Ike
## 0.0000000
## Ike Supporter
## 0.0000000
## Incredibly Obese Black Man
## 0.0000000
## Indian 1
## 0.0000000
## Indian Ambassador
## 0.0000000
## Indian Chief
## 0.0000000
## Indiglo Girls singer
## 0.0000000
## Individual in crowd
## 0.0000000
## Inductee
## 0.0000000
## Inductee 1
## 0.0000000
## Inductee 2
## 0.0000000
## Inductees
## 0.0000000
## Indy
## 0.0000000
## Injured Man
## 0.0000000
## Inmate
## 0.0000000
## Inmates
## 0.0000000
## Installer
## 0.0000000
## Instructor
## 0.0000000
## Instructors
## 0.0000000
## Intruder
## 0.0000000
## Iraqi
## 0.0000000
## Iraqi General
## 0.0000000
## Iraqi Man 1
## 0.0000000
## Iraqi Man 2
## 0.0000000
## Iron Maiden
## 0.0000000
## Ishmael
## 0.0000000
## Isiah
## 0.0000000
## ISIS Spokesman
## 0.0000000
## Israeli
## 0.0000000
## Israeli 2
## 0.0000000
## Italian Cardinal
## 0.0000000
## Italy
## 0.0000000
## Jabs
## 0.0000000
## Jack
## 0.0000000
## Jack Brolin
## 0.0000000
## Jacqueline
## 0.0000000
## Jada Pinkett Smith
## 0.0000000
## Jai
## 0.0000000
## Jakartha
## 0.0000000
## Jake
## 0.0000000
## Jakov
## 0.0000000
## Jakovasaur
## 0.0000000
## Jakovasaur Boy
## 0.0000000
## Jakovasaur Girl
## 0.0000000
## Jakovasaur Kid 1
## 0.0000000
## Jakovasaur Kid 2
## 0.0000000
## Jakovasaur Kid 3
## 0.0000000
## Jakovasaur Kid 4
## 0.0000000
## Jakovasaur Kid 5
## 0.0000000
## Jakovasaurs
## 0.0000000
## Jambu
## 0.0000000
## James Cameron
## 0.0000000
## James Hetfield
## 0.0000000
## James Taylor
## 0.0000000
## Jamie
## 0.0000000
## Jamie Oliver
## 0.0000000
## Janet
## 0.0000000
## Janet Reno
## 0.0000000
## Janitor
## 0.0000000
## Janitor 2
## 0.0000000
## Janitor/Farmer 1
## 0.0000000
## Japan
## 0.0000000
## Japanese Delegate
## 0.0000000
## Japanese Man 1
## 0.0000000
## Japanese Man 2
## 0.0000000
## Japanese Man 3
## 0.0000000
## Japanese Man 4
## 0.0000000
## Japanese Man 5
## 0.0000000
## Japanese Pilot
## 0.0000000
## Japanese Sailor
## 0.0000000
## Japanese woman
## 0.0000000
## Japanese Woman
## 0.0000000
## Jared
## 0.0000000
## Jared Fogle
## 0.0000000
## Jarvis
## 0.0000000
## Jason
## 0.0000000
## Jason, Craig, Tweek, Token
## 0.0000000
## Jason Voorhees
## 0.0000000
## Jay
## 0.0000000
## Jay Leno
## 0.0000000
## Jeff
## 0.0000000
## Jeff Arrando
## 0.0000000
## Jefferson
## 0.0000000
## Jeff Gordon
## 0.0000000
## Jeffrey
## 0.0000000
## Jeffrey Maynard
## 0.0000000
## Jeff VanVonderen
## 0.0000000
## Jeff White
## 0.0000000
## Jenkins
## 0.0000000
## Jennifer Lopez
## 0.0000000
## Jenny
## 0.0000000
## Jenny, Mark
## 0.0000000
## Jenny's Mother
## 0.0000000
## Jerry
## 0.0000000
## Jerry Jones
## 0.0000000
## Jerry Sanders
## 0.0000000
## Jersey Man
## 0.0000000
## Jersey Man 2
## 0.0000000
## Jersey People
## 0.0000000
## Jersey Woman
## 0.0000000
## Jesse Jackson
## 0.0000000
## Jessica
## 0.0000000
## Jessica's Mom
## 0.0000000
## Jessie
## 0.0000000
## Jesus
## 0.0000000
## Jesus' Producer
## 0.0000000
## Jill
## 0.0000000
## Jim
## 0.0000000
## Jimbo
## 0.0000000
## Jimbo Kern
## 0.0000000
## Jimbo, Ned
## 0.0000000
## Jim Brown-ish
## 0.0000000
## Jim Irsay
## 0.0000000
## Jim Lehrer
## 0.0000000
## Jimmie Johnson
## 0.0000000
## Jimmy
## 0.0000000
## Jimmy Buffet
## 0.0000000
## Jimmy Buffett
## 0.0000000
## Jimmy Kimmel
## 0.0000000
## Jim Rome
## 0.0000000
## Jinbo
## 0.0000000
## Jo
## 0.0000000
## Joanie
## 0.0000000
## Joanie Cunningham
## 0.0000000
## Joe
## 0.0000000
## Joe Jonas
## 0.0000000
## Joe Strummer
## 0.0000000
## Jogger
## 0.0000000
## John
## 0.0000000
## John Cena
## 0.0000000
## John Edward
## 0.0000000
## John Elway
## 0.0000000
## John Garner
## 0.0000000
## Johnny
## 0.0000000
## Johnny Knoxville
## 0.0000000
## John Ramsey
## 0.0000000
## Johnson
## 0.0000000
## John Travolta
## 0.0000000
## John Walsh
## 0.0000000
## John Warzog
## 0.0000000
## Joint
## 0.0000000
## Joline
## 0.0000000
## Jonas Brothers
## 0.0000000
## Jonathan
## 0.0000000
## Jonesy
## 0.0000000
## Joozian 1
## 0.0000000
## Joozian 2
## 0.0000000
## Jordan
## 0.0000000
## Joseph
## 0.0000000
## Joseph Smith
## 0.0000000
## Josh
## 0.0000000
## Judge
## 0.0000000
## Judge 1
## 0.0000000
## Judge 2
## 0.0000000
## Judge 3
## 0.0000000
## Judge 4
## 0.0000000
## Judge Julie
## 0.0000000
## Judge Moses
## 0.0000000
## Jukebox
## 0.0000000
## Junichi
## 0.0000000
## Junjun
## 0.0000000
## Justin Bieber
## 0.0000000
## K-10
## 0.0000000
## Kal
## 0.0000000
## Kale
## 0.0000000
## Kansas
## 0.0000000
## Kanye
## 0.0000000
## Kanye (backup singers)
## 0.0000000
## Kanye West
## 0.0000000
## Karen
## 0.0000000
## Karin
## 0.0000000
## Karl Rove
## 0.0000000
## Katherine
## 0.0000000
## Kathie Lee
## 0.0000000
## Katie
## 0.0000000
## Keenan
## 0.0000000
## Kelly
## 0.0000000
## Kelly Menskin
## 0.0000000
## Kelly Pinkertonstinfurter
## 0.0000000
## Kelly Rutherfordmenskin
## 0.0000000
## Kenny
## 0.0000000
## Kenny G
## 0.0000000
## Kenny G.
## 0.0000000
## Kenny's Mom
## 0.0000000
## Kenny, Stan
## 0.0000000
## Kenny, Stan, Cartman
## 0.0000000
## Kenya
## 0.0000000
## Kevern Zaksor
## 0.0000000
## Kevin
## 0.0000000
## Kevin Donahue's profile
## 0.0000000
## Kevin Harris
## 0.0000000
## Kevin Jonas
## 0.0000000
## KFC Exec
## 0.0000000
## Kid
## 0.0000000
## Kid 1
## 0.0000000
## Kid 2
## 0.0000000
## Kid #2
## 0.0000000
## Kid 3
## 0.0000000
## Kid 4
## 0.0000000
## Kid 5
## 0.0000000
## Kid Magician
## 0.0000000
## Kids
## 0.0000000
## Kids around Kenny
## 0.0000000
## Kids around Timmy
## 0.0000000
## Kids at Finish Line
## 0.0000000
## Kids, Chef
## 0.0000000
## Kids in Class
## 0.0000000
## Kid's Mom
## 0.0000000
## Kim
## 0.0000000
## Kindergarten boy
## 0.0000000
## Kindergartner
## 0.0000000
## Kindergartners
## 0.0000000
## Kindergoth
## 0.0000000
## King
## 0.0000000
## King Claudius
## 0.0000000
## Kip
## 0.0000000
## Kip's Dad
## 0.0000000
## Kip's Mom
## 0.0000000
## KIT-9
## 0.0000000
## Kitty
## 0.0000000
## KKK Leader
## 0.0000000
## KKK Members
## 0.0000000
## Kobe Bryant
## 0.0000000
## Korashki
## 0.0000000
## KoRn
## 0.0000000
## Kris
## 0.0000000
## Krishna
## 0.0000000
## Kurt Loder
## 0.0000000
## Kurt Russell
## 0.0000000
## Kurt's hologram
## 0.0000000
## Kyan
## 0.0000000
## Kyle
## 0.4205046
## Kyle.
## 0.0000000
## Kyle 1
## 0.0000000
## Kyle Broflovski
## 0.0000000
## Kyle, Butters
## 0.0000000
## Kyle, Butters, Tweek
## 0.0000000
## Kyle, Cartman
## 0.0000000
## Kyle/Cartman
## 0.0000000
## Kyle, Kenny
## 0.0000000
## Kyle, Ms. Crabtree
## 0.0000000
## Kyles
## 0.0000000
## Kyle Schwartz
## 0.0000000
## Kyle's Side
## 0.0000000
## Kyle, Stan
## 0.0000000
## Kyle/Stan
## 0.0000000
## Kyle, Stan, Butters
## 0.0000000
## Kyle, Stan, Cartman
## 0.0000000
## Kyle's Team
## 0.0000000
## Kyle, Towelie
## 0.0000000
## Kyle Two
## 0.0000000
## Kylie
## 0.0000000
## Kylie's Mom
## 0.0000000
## Laborer 1
## 0.0000000
## Laborer 2
## 0.0000000
## Laborer 3
## 0.0000000
## Laborer 4
## 0.0000000
## Laborer 5
## 0.0000000
## Laborers
## 0.0000000
## Lab Tech
## 0.0000000
## Lab Tech 1
## 0.0000000
## Lab Tech 2
## 0.0000000
## Lab Tech 3
## 0.0000000
## Ladies
## 0.0000000
## Lady
## 0.0000000
## Lady 1
## 0.0000000
## Lady 2
## 0.0000000
## Lady Judge
## 0.0000000
## Lady Member
## 0.0000000
## Lady Member 2
## 0.0000000
## Lady Protester
## 0.0000000
## Laertes
## 0.0000000
## Lamb Chop
## 0.0000000
## Lambtor
## 0.0000000
## Lambtron
## 0.0000000
## Lamond
## 0.0000000
## Lamont
## 0.0000000
## Landlord
## 0.0000000
## Lao Tse
## 0.0000000
## Lao Tzu
## 0.0000000
## Large Crip
## 0.0000000
## Larger Group
## 0.0000000
## Large woman
## 0.0000000
## Large Woman
## 0.0000000
## Larry
## 0.0000000
## Larry King
## 0.0000000
## Lars
## 0.0000000
## Larsen
## 0.0000000
## Larson
## 0.0000000
## Lars Ulrich
## 0.0000000
## Latino Protesters
## 0.0000000
## Laura
## 0.0000000
## Laura Tucker
## 0.0000000
## Lawrence
## 0.0000000
## Lawyer
## 0.0000000
## Layman
## 0.0000000
## Lead Agent
## 0.0000000
## Lead Agent Collins
## 0.0000000
## Lead Alien
## 0.0000000
## Lead Biker
## 0.0000000
## Lead Convict
## 0.0000000
## Leader
## 0.0000000
## Leader Turkey
## 0.0000000
## Lead FBI agent
## 0.0000000
## Lead Ginger
## 0.0000000
## Lead Knight
## 0.0000000
## Lead Referee
## 0.0000000
## Lead Scientist
## 0.0000000
## Lead Screener
## 0.0000000
## Lead Soldier
## 0.0000000
## Lead tech
## 0.0000000
## Lead Vampire
## 0.0000000
## Leeroy
## 0.0000000
## Left
## 0.0000000
## Left Breast
## 0.0000000
## Left Creature
## 0.0000000
## Legless Boy
## 0.0000000
## Lenora
## 0.0000000
## Leonard Maltin
## 0.0000000
## Leonardo DiCaprio
## 0.0000000
## Leprechaun
## 0.0000000
## Leroy
## 0.0000000
## Lesbian 10
## 0.0000000
## Lesbian 11
## 0.0000000
## Lesbian 4
## 0.0000000
## Lesbian 5
## 0.0000000
## Lesbian 6
## 0.0000000
## Lesbian 7
## 0.0000000
## Lesbian 8
## 0.0000000
## Lesbian 9
## 0.0000000
## Lesbians
## 0.0000000
## Les Claypool
## 0.0000000
## Leslie
## 0.0000000
## Lexus
## 0.0000000
## Liane
## 0.0000000
## Liane and Cartman
## 0.0000000
## Liane and Eric
## 0.0000000
## Librarian
## 0.0000000
## Lice
## 0.0000000
## Lieutenant
## 0.0000000
## Lift Operator
## 0.0000000
## Lil Kathie Lee
## 0.0000000
## Lil Kim
## 0.0000000
## Lil Mr. Garrison
## 0.0000000
## Lincoln
## 0.0000000
## Linda
## 0.0000000
## Linda Black
## 0.0000000
## Linda Stotch
## 0.0000000
## Line Ride Operator
## 0.0000000
## Lion 1
## 0.0000000
## Lion 2
## 0.0000000
## Lion Cub 1
## 0.0000000
## Lion Cub 2
## 0.0000000
## Lion Cub 3
## 0.0000000
## Lion-head Alien
## 0.0000000
## Lisa
## 0.0000000
## Little Boy
## 0.0000000
## Little Chef
## 0.0000000
## Little Girl
## 0.0000000
## Little Slave
## 0.0000000
## Little Vamp
## 0.0000000
## Loa Tse
## 0.0000000
## Local Announcer 1
## 0.0000000
## Lois
## 0.0000000
## Lola
## 0.0000000
## Lola, Jenny, Red, and Wendy
## 0.0000000
## Lollipop King
## 0.0000000
## Lolly
## 0.0000000
## Loogie
## 0.0000000
## Looter 1
## 0.0000000
## Looter 2
## 0.0000000
## Looter 3
## 0.0000000
## Looter 4
## 0.0000000
## Lorraine
## 0.0000000
## Lou
## 0.0000000
## Louse 1
## 0.0000000
## Louse 10
## 0.0000000
## Louse 11
## 0.0000000
## Louse 12
## 0.0000000
## Louse 13
## 0.0000000
## Louse 2
## 0.0000000
## Louse 3
## 0.0000000
## Louse 4
## 0.0000000
## Louse 5
## 0.0000000
## Louse 6
## 0.0000000
## Louse 7
## 0.0000000
## Louse 8
## 0.0000000
## Louse 9
## 0.0000000
## Lowes Pit Boss
## 0.0000000
## LSX Reporter
## 0.0000000
## Lt. Nelson
## 0.0000000
## Lucas
## 0.0000000
## Lucy
## 0.0000000
## Luke
## 0.0000000
## Luke Skywalker
## 0.0000000
## Lumberjack
## 0.0000000
## M
## 0.0000000
## Ma'am
## 0.0000000
## Mackey
## 0.0000000
## Madame Foreperson
## 0.0000000
## Madman
## 0.0000000
## Madonna
## 0.0000000
## Maggie
## 0.0000000
## Magic
## 0.0000000
## Magician
## 0.0000000
## Mailman
## 0.0000000
## Mailman and Kids
## 0.0000000
## Maintenance Guy
## 0.0000000
## Maitre D
## 0.0000000
## Male
## 0.0000000
## Male 1
## 0.0000000
## Male 2
## 0.0000000
## Male Activist
## 0.0000000
## Male Aide
## 0.0000000
## Male Anchor
## 0.0000000
## Male Counselor
## 0.0000000
## Male CPS Agent
## 0.0000000
## Male Crew 1
## 0.0000000
## Male Diner
## 0.0000000
## Male Guest
## 0.0000000
## Male hippie
## 0.0000000
## Male Host
## 0.0000000
## Male Louse
## 0.0000000
## Male Member
## 0.0000000
## Male Nurse
## 0.0000000
## Male passenger
## 0.0000000
## Male Psychic 1
## 0.0000000
## Male Psychic 2
## 0.0000000
## Males
## 0.0000000
## Male Sailor 1
## 0.0000000
## Male Sailor 2
## 0.0000000
## Male Staffer
## 0.0000000
## Male voice
## 0.0000000
## Male Voice
## 0.0000000
## Mall Bunny
## 0.0000000
## Mall Hankey
## 0.0000000
## Mama
## 0.0000000
## Mamsie
## 0.0000000
## Man
## 0.0000000
## Man 1
## 0.0000000
## Man 10
## 0.0000000
## Man 11
## 0.0000000
## Man 12
## 0.0000000
## Man 13
## 0.0000000
## Man 14
## 0.0000000
## Man 15
## 0.0000000
## Man 16
## 0.0000000
## Man 17
## 0.0000000
## Man 18
## 0.0000000
## Man 19
## 0.0000000
## Man 2
## 0.0000000
## Man 20
## 0.0000000
## Man 21
## 0.0000000
## Man 22
## 0.0000000
## Man 23
## 0.0000000
## Man 24
## 0.0000000
## Man 25
## 0.0000000
## Man 26
## 0.0000000
## Man 27
## 0.0000000
## Man 28
## 0.0000000
## Man 29
## 0.0000000
## Man 2 in Crowd
## 0.0000000
## Man 2, Woman 2
## 0.0000000
## Man 3
## 0.0000000
## Man 30
## 0.0000000
## Man 31
## 0.0000000
## Man 32
## 0.0000000
## Man 4
## 0.0000000
## Man 5
## 0.0000000
## Man 6
## 0.0000000
## Man 7
## 0.0000000
## Man 8
## 0.0000000
## Man 9
## 0.0000000
## Manager
## 0.0000000
## ManBearPig
## 0.0000000
## Mandy
## 0.0000000
## Man in audience
## 0.0000000
## Man in Back
## 0.0000000
## Man in background
## 0.0000000
## Man in Barrel
## 0.0000000
## Man in briefs
## 0.0000000
## Man in Brown Shirt
## 0.0000000
## Man in crowd
## 0.0000000
## Man in Crowd
## 0.0000000
## Man in foreground
## 0.0000000
## Man In Middle
## 0.0000000
## Man in Shorts
## 0.0000000
## Man in Vest
## 0.0000000
## Man in Wheelchair
## 0.0000000
## Man In Wheelchair
## 0.0000000
## Man In Yellow Jacket
## 0.0000000
## Manning
## 0.0000000
## Man On Crutches
## 0.0000000
## Man on Porto Potty
## 0.0000000
## Manson
## 0.0000000
## Manuel
## 0.0000000
## Man with Afro
## 0.0000000
## Man with Foot on Head
## 0.0000000
## Man With Grey Hair
## 0.0000000
## Man with Mustache
## 0.0000000
## Man With No Face
## 0.0000000
## Man with No Limbs
## 0.0000000
## Man With No Limbs
## 0.0000000
## Man With Picket Sign
## 0.0000000
## Man with Terrible Skin Condition
## 0.0000000
## Many Men
## 0.0000000
## Manymoons
## 0.0000000
## Marc
## 0.0000000
## Marcia
## 0.0000000
## Marcus
## 0.0000000
## Marilyn Manson
## 0.0000000
## Marine
## 0.0000000
## Mark
## 0.0000000
## Mark, Jenny
## 0.0000000
## Marklar
## 0.0000000
## Marklar dispatcher
## 0.0000000
## Marklar Leader
## 0.0000000
## Marksman
## 0.0000000
## Marsha
## 0.0000000
## Marsh Family
## 0.0000000
## Martha
## 0.0000000
## Martha Stewart
## 0.0000000
## Martin
## 0.0000000
## Marty
## 0.0000000
## Marvin
## 0.0000000
## Marvin Marsh
## 0.0000000
## Mary
## 0.0000000
## Master
## 0.0000000
## Matt
## 0.0000000
## Matthew
## 0.0000000
## Matthew McConaughey
## 0.0000000
## Matt Lauer
## 0.0000000
## Matt Stone
## 0.0000000
## Maury
## 0.0000000
## Mayor
## 0.0000000
## Mayor McDaniels
## 0.0000000
## Mayor McDaniels.
## 0.0000000
## MC
## 0.0000000
## M.C
## 0.0000000
## M. C.
## 0.0000000
## M.C.
## 0.0000000
## McCain
## 0.0000000
## McCain, Obama
## 0.0000000
## McCormick Parents
## 0.0000000
## McDaniels
## 0.0000000
## McDonald's Exec
## 0.0000000
## McGee-zax
## 0.0000000
## McGillicuddy
## 0.0000000
## McGuire
## 0.0000000
## Meat Loaf
## 0.0000000
## Mechanic
## 0.0000000
## Mediator
## 0.0000000
## Medic
## 0.0000000
## Medicine Man
## 0.0000000
## Megan
## 0.0000000
## Mel
## 0.0000000
## Mel Gibson
## 0.0000000
## Melissa
## 0.0000000
## Melita
## 0.0000000
## Melvin 1
## 0.0000000
## Melvin 2
## 0.0000000
## Melvin 3
## 0.0000000
## Melvin 4
## 0.0000000
## Melvins
## 0.0000000
## Member
## 0.0000000
## Member 1
## 0.0000000
## Member 2
## 0.0000000
## Member 3
## 0.0000000
## Member 4
## 0.0000000
## Member 5
## 0.0000000
## Member 6
## 0.0000000
## Member 7
## 0.0000000
## Members
## 0.0000000
## Men
## 0.0000000
## Mencia
## 0.0000000
## Mepehsto
## 0.0000000
## Mephesto
## 0.0000000
## Mephesto Actor
## 0.0000000
## Mephesto Tryout
## 0.0000000
## Mercedes
## 0.0000000
## Meredith
## 0.0000000
## Meredith Vieira
## 0.0000000
## Mexicans
## 0.0000000
## Michael
## 0.0000000
## Michael Bay
## 0.0000000
## Michael Buffer
## 0.0000000
## Michael Chertoff
## 0.0000000
## Michael Collins
## 0.0000000
## Michael Deets
## 0.0000000
## Michael Dorn
## 0.0000000
## Michael Douglas
## 0.0000000
## Michael Jackson
## 0.0000000
## Michael Moore
## 0.0000000
## Michael Richards
## 0.0000000
## Michael Taylor
## 0.0000000
## Michelle
## 0.0000000
## Michelle Obama
## 0.0000000
## Mick
## 0.0000000
## Mickey
## 0.0000000
## Mickey Mouse
## 0.0000000
## Middle Dwarf
## 0.0000000
## Middle Prostitute
## 0.0000000
## Middling Group
## 0.0000000
## Midget
## 0.0000000
## Midnight Vampire
## 0.0000000
## Mike
## 0.0000000
## Mike, Michael, and Pete
## 0.0000000
## Miles
## 0.0000000
## Miley Cyrus
## 0.0000000
## Miller
## 0.0000000
## Millie
## 0.0000000
## Millionaire
## 0.0000000
## Millionaire 1
## 0.0000000
## Millionaire Protesters
## 0.0000000
## Millionaires
## 0.0000000
## Milly
## 0.0000000
## Milo
## 0.0000000
## Mime
## 0.0000000
## Mimi
## 0.0000000
## Mimsy
## 0.0000000
## Miner 1
## 0.0000000
## Miner 2
## 0.0000000
## Miner 3
## 0.0000000
## Miner 4
## 0.0000000
## Mingie
## 0.0000000
## Minister
## 0.0000000
## Minister of Sports
## 0.0000000
## Minstrel
## 0.0000000
## Mint-Berry Crunch
## 0.0000000
## Miss Aliton
## 0.0000000
## Miss Information
## 0.0000000
## Miss Stevens
## 0.0000000
## Miss Stevenson
## 0.0000000
## Miss Travis
## 0.0000000
## Missy
## 0.0000000
## Mitch
## 0.0000000
## Mitch Conner
## 0.0000000
## Mitchell
## 0.0000000
## Mitch Harris
## 0.0000000
## Mitt
## 0.0000000
## MJ Hologram
## 0.0000000
## MJ's hologram
## 0.0000000
## MJ's Hologram
## 0.0000000
## M. Night Shyalaman
## 0.0000000
## Mob
## 0.0000000
## Moderator
## 0.0000000
## Mohammad
## 0.0000000
## Mohawk Vamp
## 0.0000000
## Molly
## 0.0000000
## Mom
## 0.0000000
## Mona
## 0.0000000
## Mongolian
## 0.0000000
## Monitor Man
## 0.0000000
## Monk
## 0.0000000
## Monkey
## 0.0000000
## More Voices
## 0.0000000
## Morgan
## 0.0000000
## Morgan Freeman
## 0.0000000
## Mormon 1
## 0.0000000
## Mormon 2
## 0.0000000
## Mormon 3
## 0.0000000
## Mormon 4
## 0.0000000
## Mormon 5
## 0.0000000
## Mormon 6
## 0.0000000
## Mormons
## 0.0000000
## Moroccan Cardinal
## 0.0000000
## Moroni
## 0.0000000
## Morpheus
## 0.0000000
## Mortician
## 0.0000000
## Moses
## 0.0000000
## Mosquito
## 0.0000000
## Most Senators
## 0.0000000
## Motel Clerk
## 0.0000000
## Mother
## 0.0000000
## Mother 1
## 0.0000000
## Mother 2
## 0.0000000
## Mother Lion
## 0.0000000
## Motorcycle Driver
## 0.0000000
## Motorcyclist
## 0.0000000
## Mountie
## 0.0000000
## Mouse
## 0.0000000
## Mousey
## 0.0000000
## Mover
## 0.0000000
## Moviegoer
## 0.0000000
## Mr. Adams
## 0.0000000
## Mr. Adler
## 0.0000000
## Mr. Allens
## 0.0000000
## Mr. Appleby
## 0.0000000
## Mr. Bell
## 0.0000000
## Mr. Biggle
## 0.0000000
## Mr. Billings
## 0.0000000
## Mr. Black
## 0.0000000
## Mr. Brooks
## 0.0000000
## Mr. Brown
## 0.0000000
## Mr. Casher
## 0.0000000
## Mr. Circlovich
## 0.0000000
## Mr. Connolly
## 0.0000000
## Mr. Cotswolds
## 0.0000000
## Mr. Dawkins
## 0.0000000
## Mr. Denkins
## 0.0000000
## Mr. Derp
## 0.0000000
## Mr. Donaldson
## 0.0000000
## Mr. Donovan
## 0.0000000
## Mr. Evans
## 0.0000000
## Mr. Farkle
## 0.0000000
## Mr. Farnickle
## 0.0000000
## Mr. Feegan
## 0.0000000
## Mr. Foley
## 0.0000000
## Mr. Freely
## 0.0000000
## Mr. Fun
## 0.0000000
## Mr. Garrett
## 0.0000000
## Mr Garrison
## 0.0000000
## Mr. Garrison
## 0.0000000
## Mr. Garrison Sr.
## 0.0000000
## Mr. Geiger
## 0.0000000
## Mr. Glughgogawk
## 0.0000000
## Mr. Grazier
## 0.0000000
## Mr. Gueermo
## 0.0000000
## Mr. Hakeem
## 0.0000000
## Mr. Hammerhead
## 0.0000000
## Mr. Hankey
## 0.0000000
## Mr. Hankey, Cornwallis
## 0.0000000
## Mr. Hardly
## 0.0000000
## Mr. Harris
## 0.0000000
## Mr. Harrison
## 0.0000000
## Mr. Hart
## 0.0000000
## Mr. Hat
## 0.0000000
## Mr. Hat 1
## 0.0000000
## Mr. Hat 2
## 0.0000000
## Mr. Hat Actor (!)
## 0.0000000
## Mr. Hollis
## 0.0000000
## Mr. Jabs
## 0.0000000
## Mr. Jarvis
## 0.0000000
## Mr. Jefferson
## 0.0000000
## Mr. Johnson
## 0.0000000
## Mr. Kim
## 0.0000000
## Mr. Kincade
## 0.0000000
## Mr. Kitty
## 0.0000000
## Mr. Leon
## 0.0000000
## Mr Mackey
## 0.0000000
## Mr.Mackey
## 0.0000000
## Mr. Mackey
## 0.0000000
## Mr. Mackey, Principal Victoria
## 0.0000000
## Mr. Mackey's Father
## 0.0000000
## Mr. Mathers
## 0.0000000
## Mr. Meryl
## 0.0000000
## Mr. Needlebaum
## 0.0000000
## Mr. Nelson
## 0.0000000
## Mr. Ose
## 0.0000000
## Mr. Peters
## 0.0000000
## Mr. Pirrip
## 0.0000000
## Mr. Pratt
## 0.0000000
## Mr. Sanders
## 0.0000000
## Mrs. Appleby
## 0.0000000
## Mrs. Applegate
## 0.0000000
## Mrs. Biggle
## 0.0000000
## Mrs. Brooks
## 0.0000000
## Mrs. Brown
## 0.0000000
## Mrs. Campbell
## 0.0000000
## Mrs Cartman
## 0.0000000
## Mrs. Cartman
## 0.0000000
## Mrs, Circlovich
## 0.0000000
## Mrs. Cotswolds
## 0.0000000
## Mrs. Crabtree
## 0.0000000
## Mrs. Donovan
## 0.0000000
## Mrs. Farnickle
## 0.0000000
## Mrs. Feegan
## 0.0000000
## Mrs. Garrison
## 0.0000000
## Mrs. Garrison Sr.
## 0.0000000
## Mrs. Garrsion
## 0.0000000
## Mrs. Garthunk
## 0.0000000
## Mrs. Gueermo
## 0.0000000
## Mrs. Hakeem
## 0.0000000
## Mrs. Harris
## 0.0000000
## Mrs. Hollis
## 0.0000000
## Mrs. Joe
## 0.0000000
## Mrs. Landis
## 0.0000000
## Mr. Slave
## 0.0000000
## Mrs.McCormick
## 0.0000000
## Mrs. McCormick
## 0.0000000
## Mrs. Melman
## 0.0000000
## Mrs. Miller
## 0.0000000
## Mrs. Polk
## 0.0000000
## Mrs. Sanders
## 0.0000000
## Mrs. Stevens
## 0.0000000
## Mrs. Streibel
## 0.0000000
## Mrs. Streible
## 0.0000000
## Mrs. Tenorman
## 0.0000000
## Mrs. Testaburger
## 0.0000000
## Mr. Stevens
## 0.0000000
## Mr. Stevenson
## 0.0000000
## Mr. Streible
## 0.0000000
## Mrs.Tucker
## 0.0000000
## Mrs. Tucker
## 0.0000000
## Mrs. Turner
## 0.0000000
## Mrs. Tweak
## 0.0000000
## Mrs. Tweek
## 0.0000000
## Mrs. Weatherhead
## 0.0000000
## Mrs. Wyland
## 0.0000000
## Mr. T
## 0.0000000
## Mr. Takiyama
## 0.0000000
## Mr. Tenorman
## 0.0000000
## Mr. Testaburger
## 0.0000000
## Mr. Thompson
## 0.0000000
## Mr. Torres
## 0.0000000
## Mr. Triscotti
## 0.0000000
## Mr. Tucker
## 0.0000000
## Mr. Tumnus
## 0.0000000
## Mr. Tuong
## 0.0000000
## Mr. Turner
## 0.0000000
## Mr. Tweek
## 0.0000000
## Mr. Twig
## 0.0000000
## Mr. Valmer
## 0.0000000
## Mr. Varcas
## 0.0000000
## Mr. Vladchick
## 0.0000000
## Mr. Waters
## 0.0000000
## Mr. Weatherhead
## 0.0000000
## Mr. Williams
## 0.0000000
## Mr. Wyland
## 0.0000000
## Mr. Yelman
## 0.0000000
## Ms. Choksondik
## 0.0000000
## Ms. Crabtree
## 0.0000000
## Ms. Ellen
## 0.0000000
## Ms. Garrison
## 0.0000000
## Ms. Havisham
## 0.0000000
## Ms.McCormick
## 0.0000000
## Ms. McCormick
## 0.0000000
## Ms. Sanders
## 0.0000000
## Ms. Turnod
## 0.0000000
## Ms. Williams
## 0.0000000
## Muhammad
## 0.0000000
## Munky
## 0.0000000
## Muno
## 0.0000000
## Murderin' Murphy
## 0.0000000
## Murphy
## 0.0000000
## Muscleman Marc
## 0.0000000
## Musician 2
## 0.0000000
## Musician 3
## 0.0000000
## Music Instructor
## 0.0000000
## Muslim
## 0.0000000
## Muslim 2
## 0.0000000
## Mysterion
## 0.0000000
## Mysterion, the Coon
## 0.0000000
## Nadia
## 0.0000000
## Nagix
## 0.0000000
## Naked Man
## 0.0000000
## NAMBLA leader
## 0.0000000
## NAMBLA Leader
## 0.0000000
## NAMBLA Member
## 0.0000000
## Nancy
## 0.0000000
## Nancy Kerrigan
## 0.0000000
## Narrator
## 0.0000000
## Natalie
## 0.0000000
## Nathan
## 0.0000000
## Nathan's Dad
## 0.0000000
## Nathan's Mom
## 0.0000000
## Native American Chief
## 0.0000000
## Native paddler in vest
## 0.0000000
## Natsako Semu
## 0.0000000
## NC 9 Reporter
## 0.0000000
## Ned
## 0.0000000
## Neely
## 0.0000000
## Neely, Davis
## 0.0000000
## Neighbors
## 0.0000000
## Nellie
## 0.0000000
## Nelly
## 0.0000000
## Nelson
## 0.0000000
## Neo
## 0.0000000
## Neo 2
## 0.0000000
## Nerd #1
## 0.0000000
## Nerd #2
## 0.0000000
## Network Anchor
## 0.0000000
## Network President
## 0.0000000
## Netzel
## 0.0000000
## New Cartman
## 0.0000000
## New Director
## 0.0000000
## New Kenny
## 0.0000000
## New kid
## 0.0000000
## New Mormon
## 0.0000000
## News 4 Anchor
## 0.0000000
## News 4 Reporter
## 0.0000000
## News Anchor
## 0.0000000
## News Anchor 2
## 0.0000000
## News Announcer
## 0.0000000
## Newscaster
## 0.0000000
## News Reporter
## 0.0000000
## Newt
## 0.0000000
## New Teacher
## 0.0000000
## New Yorker
## 0.0000000
## New Yorker 1
## 0.0000000
## New Yorker 2
## 0.0000000
## New Yorkers
## 0.0000000
## Nibblet
## 0.0000000
## Nichole
## 0.0000000
## Nick
## 0.0000000
## Nicki
## 0.0000000
## Nick Jabs
## 0.0000000
## Nick Jonas
## 0.0000000
## Nick Nolte
## 0.0000000
## Nicole
## 0.0000000
## Nicole, Lola, Annie
## 0.0000000
## Niles
## 0.0000000
## Ninja 1
## 0.0000000
## Ninja 2
## 0.0000000
## Nobunaga
## 0.0000000
## Numa Numa
## 0.0000000
## Numa Numa Guy
## 0.0000000
## Number 17
## 0.0000000
## Number 24
## 0.0000000
## Number 37
## 0.0000000
## Nun
## 0.0000000
## Nurse
## 0.0000000
## Nurse 1
## 0.0000000
## Nurse 2
## 0.0000000
## Nurse Bronski
## 0.0000000
## Nurse Gollum
## 0.0000000
## Nurse Goodly
## 0.0000000
## Nut Gobbler
## 0.0000000
## Obama
## 0.0000000
## Obese Lady
## 0.0000000
## Obese Man
## 0.0000000
## Obese Man 2
## 0.0000000
## Obese woman
## 0.0000000
## Obese Woman
## 0.0000000
## OC
## 0.0000000
## Occupant
## 0.0000000
## OC Girl
## 0.0000000
## OC Leader
## 0.0000000
## OC Member
## 0.0000000
## OC Member 1
## 0.0000000
## OC Member 2
## 0.0000000
## OC Member 3
## 0.0000000
## OC Members
## 0.0000000
## Odd Boy
## 0.0000000
## Officer
## 0.0000000
## Officer 1
## 0.0000000
## Officer 10
## 0.0000000
## Officer 2
## 0.0000000
## Officer 3
## 0.0000000
## Officer 4
## 0.0000000
## Officer 5
## 0.0000000
## Officer 6
## 0.0000000
## Officer 7
## 0.0000000
## Officer 8
## 0.0000000
## Officer 9
## 0.0000000
## Officer Barbardy
## 0.0000000
## Officer Barbrady
## 0.0000000
## Officer Bob
## 0.0000000
## Officer Harris
## 0.0000000
## Officers
## 0.0000000
## Official
## 0.0000000
## Official 1
## 0.0000000
## Official 2
## 0.0000000
## Official 3
## 0.0000000
## Ohrlich
## 0.0000000
## O.J. Simpson
## 0.0000000
## Old Cap
## 0.0000000
## Older Boy
## 0.0000000
## Older brother
## 0.0000000
## Older Daughter
## 0.0000000
## Older Girl
## 0.0000000
## Older kid
## 0.0000000
## Older Louse
## 0.0000000
## Older man
## 0.0000000
## Older Man
## 0.0000000
## Older sister
## 0.0000000
## Older Woman
## 0.0000000
## Older Worker
## 0.0000000
## Old Folks
## 0.0000000
## Old Man
## 0.0000000
## Old Man 2
## 0.0000000
## Old Monk
## 0.0000000
## Old-Timer
## 0.0000000
## Old Woman
## 0.0000000
## Old Woman 2
## 0.0000000
## One of the Cubs
## 0.0000000
## Operative
## 0.0000000
## Operator
## 0.0000000
## Oprah
## 0.0000000
## Oprah Winfrey
## 0.0000000
## Optometrist
## 0.0000000
## Oragne cat
## 0.0000000
## Orator 1
## 0.0000000
## Orator 2
## 0.0000000
## Orc
## 0.0000000
## O'Reilly
## 0.0000000
## Osama and the Taliban Soldiers
## 0.0000000
## Osama bin Laden
## 0.0000000
## Osric
## 0.0000000
## Ostrich-baby
## 0.0000000
## Other acts
## 0.0000000
## Other Bikers
## 0.0000000
## Other boys
## 0.0000000
## Other campers
## 0.0000000
## Other Cardinals
## 0.0000000
## Other classmates
## 0.0000000
## Other Execs
## 0.0000000
## Other fans
## 0.0000000
## Other girls
## 0.0000000
## Other Girls
## 0.0000000
## Other Goths
## 0.0000000
## Other kids
## 0.0000000
## Other Kids
## 0.0000000
## Other man
## 0.0000000
## Other Members
## 0.0000000
## Other men
## 0.0000000
## Other Men
## 0.0000000
## Other mothers
## 0.0000000
## Other Musicians
## 0.0000000
## Other NAMBLA Men
## 0.0000000
## Other Officers
## 0.0000000
## Other People
## 0.0000000
## Other priests
## 0.0000000
## Other psychics
## 0.0000000
## Others
## 0.0000000
## Other Seniors
## 0.0000000
## Other Sixth Graders
## 0.0000000
## Other Soldiers
## 0.0000000
## Other students
## 0.0000000
## Other Students
## 0.0000000
## Other Townsfolk
## 0.0000000
## Other Vampires
## 0.0000000
## Other Vamps
## 0.0000000
## Other Women
## 0.0000000
## Otis
## 0.0000000
## Otter 1
## 0.0000000
## Otter 2
## 0.0000000
## Otter 3
## 0.0000000
## Otter Leader
## 0.0000000
## Otters
## 0.0000000
## Otter Soldier
## 0.0000000
## Owner
## 0.0000000
## Owners
## 0.0000000
## Ozzy
## 0.0000000
## Pablo
## 0.0000000
## Page
## 0.0000000
## Palin
## 0.0000000
## Pam
## 0.0000000
## Pamphleteer
## 0.0000000
## Pan
## 0.0000000
## Paolo Captain
## 0.0000000
## Paparazzo
## 0.0000000
## Paparazzo 10
## 0.0000000
## Paparazzo 11
## 0.0000000
## Paparazzo 12
## 0.0000000
## Paparazzo 2
## 0.0000000
## Paparazzo 3
## 0.0000000
## Paparazzo 5
## 0.0000000
## Paparazzo 6
## 0.0000000
## Paparazzo 7
## 0.0000000
## Paparazzo 8
## 0.0000000
## Paparazzo 9
## 0.0000000
## Paramedic
## 0.0000000
## Paramedic 1
## 0.0000000
## Paratrooper
## 0.0000000
## Parents
## 0.0000000
## Paris
## 0.0000000
## Paris Hilton
## 0.0000000
## Park County
## 0.0000000
## Partner
## 0.0000000
## Passenger
## 0.0000000
## Passenger 1
## 0.0000000
## Passenger 2
## 0.0000000
## Passenger 3
## 0.0000000
## Passenger 4
## 0.0000000
## Passengers
## 0.0000000
## Passer-by
## 0.0000000
## Pastor Phillips
## 0.0000000
## PA System
## 0.0000000
## Pat
## 0.0000000
## Patient
## 0.0000000
## Pat O'Brien
## 0.0000000
## Patricia
## 0.0000000
## Patrick
## 0.0000000
## Patrick Duffy
## 0.0000000
## Patrick Swayze
## 0.0000000
## Patron
## 0.0000000
## Patron 1
## 0.0000000
## Patron 10
## 0.0000000
## Patron 2
## 0.0000000
## Patron 3
## 0.0000000
## Patron 4
## 0.0000000
## Patron 5
## 0.0000000
## Patron 6
## 0.0000000
## Patron 7
## 0.0000000
## Patron 8
## 0.0000000
## Patron 9
## 0.0000000
## Patrons
## 0.0000000
## Patron with hat
## 0.0000000
## Pat Sajak
## 0.0000000
## Patsy Ramsey
## 0.0000000
## Pat the Hammer
## 0.0000000
## Patty
## 0.0000000
## Paul
## 0.0000000
## Paula Deen
## 0.0000000
## Paul Allen
## 0.0000000
## Paul Harris
## 0.0000000
## Paul Shaffer
## 0.0000000
## Paul Stanley
## 0.0000000
## Pearl
## 0.0000000
## Pedo 2
## 0.0000000
## Pedo 3
## 0.0000000
## Pedo 4
## 0.0000000
## Pedo 5
## 0.0000000
## Pedo 6
## 0.0000000
## Pedo 7
## 0.0000000
## Peg-leg
## 0.0000000
## Penis
## 0.0000000
## Penis, Mouse
## 0.0000000
## People
## 0.0000000
## People in Audience
## 0.0000000
## People in Crowd
## 0.0000000
## People's Army Leader
## 0.0000000
## Performer
## 0.0000000
## Perseus
## 0.0000000
## Persian
## 0.0000000
## Persian 2
## 0.0000000
## Persians
## 0.0000000
## Person
## 0.0000000
## Personnel
## 0.0000000
## PeTA Man
## 0.0000000
## Pete
## 0.0000000
## Peter
## 0.0000000
## Peter Griffin
## 0.0000000
## Peter Panda
## 0.0000000
## Peters
## 0.0000000
## Peterson
## 0.0000000
## Petey
## 0.0000000
## Petey/Boys
## 0.0000000
## PewDiePie
## 0.0000000
## P.F. Pityef
## 0.0000000
## Pharaoh
## 0.0000000
## Pharmacist
## 0.0000000
## Phil
## 0.0000000
## Phil Collins
## 0.0000000
## Phillip
## 0.0000000
## Phillip Stand-in
## 0.0000000
## Phl
## 0.0000000
## Phlllip
## 0.0000000
## Photographer
## 0.0000000
## Photographer 1
## 0.0000000
## Photographer 2
## 0.0000000
## Photographer 3
## 0.0000000
## Photographer 4
## 0.0000000
## Photo Seller
## 0.0000000
## Phyllis
## 0.0000000
## Pianist
## 0.0000000
## Pig
## 0.0000000
## Pilgrim
## 0.0000000
## Pilgrim Girl
## 0.0000000
## Pilgrim King
## 0.0000000
## Pilot
## 0.0000000
## Pimp
## 0.0000000
## Pimp 2
## 0.0000000
## Pinkerton
## 0.0000000
## Pink Hare
## 0.0000000
## Pink Monster
## 0.0000000
## Pioneer Paul
## 0.0000000
## Pip
## 0.0000000
## Pi Pi
## 0.0000000
## Pirate
## 0.0000000
## Pirate 1
## 0.0000000
## Pirate 2
## 0.0000000
## Pirate 3
## 0.0000000
## Pirate 4
## 0.0000000
## Pirate 5
## 0.0000000
## Pirate 6
## 0.0000000
## Pirate 7
## 0.0000000
## Pirate 8
## 0.0000000
## Pirate Choir
## 0.0000000
## Pirate Ghost 2
## 0.0000000
## Pirate Ghost cutout
## 0.0000000
## Pirate Ghosts
## 0.0000000
## Pirates
## 0.0000000
## Pirate voice
## 0.0000000
## Pirate Voice
## 0.0000000
## Pit Crewman
## 0.0000000
## Pizza Hut Exec
## 0.0000000
## Pizza Man
## 0.0000000
## Player
## 0.0000000
## Player 1
## 0.0000000
## Player 2
## 0.0000000
## Player 3
## 0.0000000
## Player 4
## 0.0000000
## Player 6
## 0.0000000
## Player 70
## 0.0000000
## Players
## 0.0000000
## Plex
## 0.0000000
## Pocket
## 0.0000000
## Poe
## 0.0000000
## Police Captain
## 0.0000000
## Police Chief
## 0.0000000
## Police Chief Stevens
## 0.0000000
## Police Commissioner
## 0.0000000
## Police drone
## 0.0000000
## Policeman 1
## 0.0000000
## Policeman Brown
## 0.0000000
## Police Officer
## 0.0000000
## Police Officer 1
## 0.0000000
## Police Officer 2
## 0.0000000
## Police Radio
## 0.0000000
## Polly
## 0.0000000
## Polly Prissypants
## 0.0000000
## Polly Prissy Pants
## 0.0000000
## Poodle
## 0.0000000
## Poor Girl
## 0.0000000
## Poor Mom
## 0.0000000
## Pope Benedict
## 0.0000000
## Pope Francis
## 0.0000000
## Popeye
## 0.0000000
## Pops
## 0.0000000
## Porcupiney
## 0.0000000
## Porsche
## 0.0000000
## Posse
## 0.0000000
## Postem
## 0.0000000
## Postman
## 0.0000000
## Postmaster
## 0.0000000
## Postum
## 0.0000000
## Preacher
## 0.0000000
## Predator
## 0.0000000
## Premise Running Thin
## 0.0000000
## Prerecorded Voice
## 0.0000000
## President
## 0.0000000
## President Bush
## 0.0000000
## President Calderón
## 0.0000000
## President Clinton
## 0.0000000
## President Hirohito
## 0.0000000
## President Obama
## 0.0000000
## President Wulff
## 0.0000000
## Press Coordinator
## 0.0000000
## Pricipal Victoria
## 0.0000000
## Priest
## 0.0000000
## Priest 1
## 0.0000000
## Priest 2
## 0.0000000
## Priest 3
## 0.0000000
## Priest 4
## 0.0000000
## Priest Maxi
## 0.0000000
## Priests
## 0.0000000
## Prime Minister
## 0.0000000
## Prince
## 0.0000000
## Princess
## 0.0000000
## Princess Diana
## 0.0000000
## Princesses
## 0.0000000
## Principal
## 0.0000000
## Principal Victoria
## 0.0000000
## Principa Victoria
## 0.0000000
## Print Reporter
## 0.0000000
## Proctologist
## 0.0000000
## Producer
## 0.0000000
## Professor Chaos
## 0.0000000
## Profile 1
## 0.0000000
## Profile 2
## 0.0000000
## Profile 3
## 0.0000000
## Profile 4
## 0.0000000
## Profile 5
## 0.0000000
## Profile 6
## 0.0000000
## Profile Stan Marsh
## 0.0000000
## Prof. Thomas
## 0.0000000
## Programmer
## 0.0000000
## Programmer 1
## 0.0000000
## Programmer 2
## 0.0000000
## Programmer 3
## 0.0000000
## Programmer 4
## 0.0000000
## Programmer 5
## 0.0000000
## Promoter
## 0.0000000
## Prop. 10 Supporter
## 0.0000000
## Proprietor
## 0.0000000
## Prosecutor
## 0.0000000
## Prostitute
## 0.0000000
## Protester
## 0.0000000
## Protester 1
## 0.0000000
## Protester 2
## 0.0000000
## Protester 3
## 0.0000000
## Protester 4
## 0.0000000
## Protester 5
## 0.0000000
## Protester 6
## 0.0000000
## Protester 7
## 0.0000000
## Protesters
## 0.0000000
## Protestor #1
## 0.0000000
## Protestor #2
## 0.0000000
## Protestor #3
## 0.0000000
## Protestor #4
## 0.0000000
## Protestor #5
## 0.0000000
## PS4 Army
## 0.0000000
## P. Sanchez
## 0.0000000
## Psychic
## 0.0000000
## Psycho Janus
## 0.0000000
## P-Train
## 0.0000000
## Publisher
## 0.0000000
## Publisher 1
## 0.0000000
## Publisher 2
## 0.0000000
## Pueblo Dad
## 0.0000000
## Pueblo Team
## 0.0000000
## Puerto Rican Player
## 0.0000000
## Puff Daddy
## 0.0000000
## Puffy the Bear
## 0.0000000
## Punk
## 0.0000000
## Purity Boy 1
## 0.0000000
## Purity Boy 2
## 0.0000000
## Purity Boy 3
## 0.0000000
## Purple Hare
## 0.0000000
## Purple Hare 2
## 0.0000000
## Purry
## 0.0000000
## Putin
## 0.0000000
## Q Money
## 0.0000000
## Quadraplegic Swiss man
## 0.0000000
## Queen Elizabeth II
## 0.0000000
## Queen Gertrude
## 0.0000000
## Queen Spider
## 0.0000000
## Quincy
## 0.0000000
## Quint 1
## 0.0000000
## Quint 2
## 0.0000000
## Quint #2
## 0.0000000
## Quint 3
## 0.0000000
## Quint 4
## 0.0000000
## Quint 5
## 0.0000000
## Rabbi
## 0.0000000
## Rabbi 1
## 0.0000000
## Rabbi 2
## 0.0000000
## Rabbi 3
## 0.0000000
## Rabbi 4
## 0.0000000
## Rabbi 5
## 0.0000000
## Rabbity
## 0.0000000
## Rabbity Rabbit
## 0.0000000
## Raccoony
## 0.0000000
## Rachel
## 0.0000000
## Radio Host
## 0.0000000
## Radio Talk Show Host
## 0.0000000
## Raisins Girl
## 0.0000000
## Raisins Girls
## 0.0000000
## Ralph
## 0.0000000
## Ramdu
## 0.0000000
## Rancher
## 0.0000000
## Rancher Bob
## 0.0000000
## Rancid
## 0.0000000
## Random Voices
## 0.0000000
## Randy
## 0.0000000
## Randy and the Boys
## 0.0000000
## Randy, Gerald
## 0.0000000
## Randy Marsh
## 0.0000000
## Randy Newman
## 0.0000000
## Randy's Boss
## 0.0000000
## Randy, Sharon
## 0.0000000
## Randy Singing
## 0.0000000
## Randy's profile
## 0.0000000
## Randy, Stan
## 0.0000000
## Ranger
## 0.0000000
## Ranger McFriendly
## 0.0000000
## Ranger Pete
## 0.0000000
## R. Booth
## 0.0000000
## Really Shocked Man
## 0.0000000
## Real Mackey
## 0.0000000
## Rebecca
## 0.0000000
## Rebecca Turnod
## 0.0000000
## Receptionist
## 0.0000000
## Receptionist 2
## 0.0000000
## Record Executive
## 0.0000000
## Record Producer
## 0.0000000
## Recruiter
## 0.0000000
## Recruits
## 0.0000000
## Red
## 0.0000000
## Red, Annie
## 0.0000000
## Red Cross Chick
## 0.0000000
## Red Cross Dude
## 0.0000000
## Red Goth
## 0.0000000
## Red-Haired Woman
## 0.0000000
## Redhead
## 0.0000000
## Redheaded Prostitute
## 0.0000000
## Redneck
## 0.0000000
## Redneck 1
## 0.0000000
## Redneck 10
## 0.0000000
## Redneck 11
## 0.0000000
## Redneck 12
## 0.0000000
## Redneck 13
## 0.0000000
## Redneck 14
## 0.0000000
## Redneck 15
## 0.0000000
## Redneck 16
## 0.0000000
## Redneck 17
## 0.0000000
## Redneck 18
## 0.0000000
## Redneck 19
## 0.0000000
## Redneck 2
## 0.0000000
## Redneck 20
## 0.0000000
## Redneck 21
## 0.0000000
## Redneck 22
## 0.0000000
## Redneck 23
## 0.0000000
## Redneck 24
## 0.0000000
## Redneck 25
## 0.0000000
## Redneck 26
## 0.0000000
## Redneck 27
## 0.0000000
## Redneck 28
## 0.0000000
## Redneck 29
## 0.0000000
## Redneck 3
## 0.0000000
## Redneck 30
## 0.0000000
## Redneck 4
## 0.0000000
## Redneck 5
## 0.0000000
## Redneck 6
## 0.0000000
## Redneck 7
## 0.0000000
## Redneck 8
## 0.0000000
## Redneck 9
## 0.0000000
## Red Wings Coach
## 0.0000000
## Reenactor
## 0.0000000
## Reenactor 1
## 0.0000000
## Reenactor 2
## 0.0000000
## Reenactor 3
## 0.0000000
## Reenactor 4
## 0.0000000
## Reenactors
## 0.0000000
## Reeve
## 0.0000000
## Referee
## 0.0000000
## Referee 2
## 0.0000000
## Refugee Man 1
## 0.0000000
## Refugee Man 2
## 0.0000000
## Refugee Man 3
## 0.0000000
## Refugee Man 4
## 0.0000000
## Refugee Man 5
## 0.0000000
## Refugees
## 0.0000000
## Reginald
## 0.0000000
## Regis
## 0.0000000
## Registrar
## 0.0000000
## REO Speedwagon
## 0.0000000
## Rep
## 0.0000000
## Replacement Friend
## 0.0000000
## Reporter
## 0.0000000
## Reporter 1
## 0.0000000
## Reporter 2
## 0.0000000
## Reporter 3
## 0.0000000
## Reporter 4
## 0.0000000
## Reporter 5
## 0.0000000
## Reporter 6
## 0.0000000
## Reporter Chris
## 0.0000000
## Reporters
## 0.0000000
## Representative
## 0.0000000
## Rescuer
## 0.0000000
## Rescuer 1
## 0.0000000
## Rescuer 2
## 0.0000000
## Rescuer 3
## 0.0000000
## Rescuer 4
## 0.0000000
## Rescuer 5
## 0.0000000
## Rescuer 6
## 0.0000000
## Researcher
## 0.0000000
## Researcher 1
## 0.0000000
## Researcher 2
## 0.0000000
## Researcher 3
## 0.0000000
## Research Leader
## 0.0000000
## Resident 1
## 0.0000000
## Resident 10
## 0.0000000
## Resident 11
## 0.0000000
## Resident 12
## 0.0000000
## Resident 13
## 0.0000000
## Resident 14
## 0.0000000
## Resident 15
## 0.0000000
## Resident 2
## 0.0000000
## Resident 3
## 0.0000000
## Resident 4
## 0.0000000
## Resident 5
## 0.0000000
## Resident 6
## 0.0000000
## Resident 7
## 0.0000000
## Resident 8
## 0.0000000
## Resident 9
## 0.0000000
## Resident Bishop
## 0.0000000
## Residents
## 0.0000000
## Retarded Fish
## 0.0000000
## Reveler
## 0.0000000
## Reveler 1
## 0.0000000
## Reveler 2
## 0.0000000
## Reveler 3
## 0.0000000
## Reveler 4
## 0.0000000
## Reveler 5
## 0.0000000
## Revelers
## 0.0000000
## Rex
## 0.0000000
## Richard
## 0.0000000
## Richards
## 0.0000000
## Richardson
## 0.0000000
## Richard Tweak
## 0.0000000
## Richard Tweek
## 0.0000000
## Richie
## 0.0000000
## Rich kid
## 0.0000000
## Rick
## 0.0000000
## Rick...
## 0.0000000
## Rick James
## 0.0000000
## Rick Watts
## 0.0000000
## Ride operator
## 0.0000000
## Ride Operator
## 0.0000000
## Rider 1
## 0.0000000
## Rider 2
## 0.0000000
## Right
## 0.0000000
## Right Breast
## 0.0000000
## Right Creature
## 0.0000000
## Riley
## 0.0000000
## Ringtone
## 0.0000000
## R. Kelly
## 0.0000000
## Roadie
## 0.0000000
## Roadie 2
## 0.0000000
## Road Warrior Queef
## 0.0000000
## Road Workers
## 0.0000000
## Robber 1
## 0.0000000
## Robber 2
## 0.0000000
## Robber 3
## 0.0000000
## Robber 4
## 0.0000000
## Robert
## 0.0000000
## Robert Pooner
## 0.0000000
## Robert Redford
## 0.0000000
## Robert Smith
## 0.0000000
## Robin Hood
## 0.0000000
## Robot
## 0.0000000
## Robot Guard
## 0.0000000
## Robot Monkey
## 0.0000000
## Rob Reiner
## 0.0000000
## Rob Schneider
## 0.0000000
## Rockety Rocket
## 0.0000000
## Rod
## 0.0000000
## Roger
## 0.0000000
## Roland
## 0.0000000
## Roma
## 0.0000000
## Romanian official
## 0.0000000
## Romanian Official
## 0.0000000
## Romanian Protesters
## 0.0000000
## Romper Stomper
## 0.0000000
## Ron
## 0.0000000
## Rookie Guard
## 0.0000000
## Roostor
## 0.0000000
## Rosemary
## 0.0000000
## Rosie
## 0.0000000
## Rosie O'Donnell
## 0.0000000
## Roulette Dealer
## 0.0000000
## Roy
## 0.0000000
## Ruby Tucker
## 0.0000000
## Rudy
## 0.0000000
## Rumpertumskin
## 0.0000000
## Rumsfeld
## 0.0000000
## Runs with Premise
## 0.0000000
## Runs With Premise
## 0.0000000
## Russel Crowe
## 0.0000000
## Russell Crowe
## 0.0000000
## Russell Crowe (off-screen)
## 0.0000000
## Russia
## 0.0000000
## Russian
## 0.0000000
## R. West
## 0.0000000
## R. Wiley
## 0.0000000
## Ryan
## 0.0000000
## Saddam
## 0.0000000
## Saddam/Chris
## 0.0000000
## Saddam Hussein
## 0.0000000
## Sailor
## 0.0000000
## Salesman
## 0.0000000
## Sally
## 0.0000000
## Sally Struthers
## 0.0000000
## Salon Girl
## 0.0000000
## Sam
## 0.0000000
## Sandy Cervix
## 0.0000000
## Santa
## 0.0000000
## Sarah
## 0.0000000
## Sarah McLachlan
## 0.0000000
## Sarah's Mom
## 0.0000000
## Sarah Valmer
## 0.0000000
## Satan
## 0.0000000
## Satan and Males
## 0.0000000
## Satan, Chris
## 0.0000000
## Satan/Chris
## 0.0000000
## Sawitsky
## 0.0000000
## Sawitzky
## 0.0000000
## Scary Assistant
## 0.0000000
## Schlomo
## 0.0000000
## Schroeder
## 0.0000000
## Schwartz
## 0.0000000
## Schwarzenegger
## 0.0000000
## Scientist
## 0.0000000
## Scientist 1
## 0.0000000
## Scientist 2
## 0.0000000
## Scientist 3
## 0.0000000
## Scientist 4
## 0.0000000
## Scientist 5
## 0.0000000
## Scott
## 0.0000000
## Scott Tenorman
## 0.0000000
## Scott, Tyler
## 0.0000000
## Scout
## 0.0000000
## Scout Leader
## 0.0000000
## Scoutmaster 1
## 0.0000000
## Scoutmaster 2
## 0.0000000
## Scouts
## 0.0000000
## Scuzzlebutt
## 0.0000000
## Seaman
## 0.0000000
## Sea Otters
## 0.0000000
## Second Baseman
## 0.0000000
## Secretary
## 0.0000000
## Secretary 1
## 0.0000000
## Secret Service Agent
## 0.0000000
## Secret Service Leader
## 0.0000000
## Secure group
## 0.0000000
## Secure Group
## 0.0000000
## Security Agent
## 0.0000000
## Security Guard
## 0.0000000
## Security Guard 1
## 0.0000000
## Selena Gomez
## 0.0000000
## Senator
## 0.0000000
## Senator 1
## 0.0000000
## Senator 2
## 0.0000000
## Senator 3
## 0.0000000
## Senator 4
## 0.0000000
## Seniors
## 0.0000000
## Señor Lopez
## 0.0000000
## Sergeant
## 0.0000000
## Sergeant Yates
## 0.0000000
## Sgt. Boll
## 0.0000000
## Sgt. Larsen
## 0.0000000
## Sgt. Masters
## 0.0000000
## Sgt. Yates
## 0.0000000
## Shades Vamp
## 0.0000000
## Shake Weight
## 0.0000000
## Shari
## 0.0000000
## Sharon
## 0.0000000
## Shawna
## 0.0000000
## Sheep
## 0.0000000
## Sheila
## 0.0000000
## Sheila Broflovski
## 0.0000000
## Sheila, Gerald
## 0.0000000
## Shelley
## 0.0000000
## Shelly
## 0.0000000
## Sheriff
## 0.0000000
## Shlomo
## 0.0000000
## Shoe Salesman
## 0.0000000
## Shopper
## 0.0000000
## Shopper 1
## 0.0000000
## Shopper 10
## 0.0000000
## Shopper 11
## 0.0000000
## Shopper 12
## 0.0000000
## Shopper 13
## 0.0000000
## Shopper 2
## 0.0000000
## Shopper 3
## 0.0000000
## Shopper 4
## 0.0000000
## Shopper 5
## 0.0000000
## Shopper 6
## 0.0000000
## Shopper 7
## 0.0000000
## Shopper 8
## 0.0000000
## Shopper 9
## 0.0000000
## Shoppers
## 0.0000000
## Short Man
## 0.0000000
## Short Reporter
## 0.0000000
## Show Announcer
## 0.0000000
## Shvek
## 0.0000000
## Sia
## 0.0000000
## Sid
## 0.0000000
## Side Judge
## 0.0000000
## Sidney Poitier
## 0.0000000
## Siimon
## 0.0000000
## Simon
## 0.0000000
## Sinéad
## 0.0000000
## Singer
## 0.0000000
## Singer (and backup singers)
## 0.0000000
## Singer (background singers)
## 0.0000000
## Singers
## 0.0000000
## Singers (Widelife)
## 0.0000000
## Sir 1
## 0.0000000
## Sir Harrington
## 0.0000000
## Sister Anne
## 0.0000000
## Sixth Grade Leader
## 0.0000000
## Sixth Grader
## 0.0000000
## Sixth Grader 1
## 0.0000000
## Sixth Grader 2
## 0.0000000
## Sixth Grader 3
## 0.0000000
## Sixth Grader 4
## 0.0000000
## Sixth Grader 5
## 0.0000000
## Sixth Grader 6
## 0.0000000
## Sixth Grader 8
## 0.0000000
## Sixth Grader 9
## 0.0000000
## Sixth Graders
## 0.0000000
## Sixth Graders 2/3
## 0.0000000
## Skeeter
## 0.0000000
## Skid Row
## 0.0000000
## Skier
## 0.0000000
## Skunky
## 0.0000000
## Sky-fi Reporter
## 0.0000000
## Skyler
## 0.0000000
## Skynard Man
## 0.0000000
## Sledders
## 0.0000000
## Slim Reporter
## 0.0000000
## Small Group
## 0.0000000
## Smalls
## 0.0000000
## Smith
## 0.0000000
## Smithy
## 0.0000000
## Smoker
## 0.0000000
## Snarf
## 0.0000000
## Snetzl
## 0.0000000
## Sniper
## 0.0000000
## SNN anchor
## 0.0000000
## SNN Anchor
## 0.0000000
## SNN Correspondent
## 0.0000000
## SNN reporter
## 0.0000000
## SNN Reporter
## 0.0000000
## Snooki
## 0.0000000
## Snoop Dogg
## 0.0000000
## Soccer Captain
## 0.0000000
## Social Worker
## 0.0000000
## Solders
## 0.0000000
## Soldier
## 0.0000000
## Soldier 1
## 0.0000000
## Soldier 2
## 0.0000000
## Soldier 3
## 0.0000000
## Soldier 4
## 0.0000000
## Soldier 5
## 0.0000000
## Soldier 6
## 0.0000000
## Soldier 7
## 0.0000000
## Soldiers
## 0.0000000
## Soloist
## 0.0000000
## Somali 1
## 0.0000000
## Somali 2
## 0.0000000
## Some adults
## 0.0000000
## Some audience members
## 0.0000000
## Somebody
## 0.0000000
## Some boys
## 0.0000000
## Some Folks
## 0.0000000
## Some Guy
## 0.0000000
## Some Kids
## 0.0000000
## Some KKK members
## 0.0000000
## Some men
## 0.0000000
## Someone
## 0.0000000
## Someone in the crowd
## 0.0000000
## Some people
## 0.0000000
## Some People
## 0.0000000
## Some Townsfolk
## 0.0000000
## Sondheim
## 0.0000000
## Sonny
## 0.0000000
## Sony President
## 0.0000000
## Sorcerer
## 0.0000000
## Sound Engineer
## 0.0000000
## Sound man
## 0.0000000
## Sound Man
## 0.0000000
## South Korea
## 0.0000000
## South Park Men
## 0.0000000
## SP Adults
## 0.0000000
## Sparkly Vampire
## 0.0000000
## Sparky
## 0.0000000
## Sparrow Prince
## 0.0000000
## SP Cabbie
## 0.0000000
## Speaker
## 0.0000000
## Specialist
## 0.0000000
## Specialist 1
## 0.0000000
## Specialist 2
## 0.0000000
## Specialist 3
## 0.0000000
## Specialist 4
## 0.0000000
## Spectator
## 0.0000000
## Spectator 1
## 0.0000000
## Spectator 2
## 0.0000000
## Spectator 3
## 0.0000000
## Spectators
## 0.0000000
## Sphinx
## 0.0000000
## Spielberg
## 0.0000000
## Spiky Vamp
## 0.0000000
## Spiky Vampire
## 0.0000000
## Spirit
## 0.0000000
## Spirit 2
## 0.0000000
## Spokesman
## 0.0000000
## Spontaneous Bootay
## 0.0000000
## Sports Reporter
## 0.0000000
## Springer
## 0.0000000
## SP Team
## 0.0000000
## Spy Angel
## 0.0000000
## Squirrelly Squirrel
## 0.0000000
## Squirrely
## 0.0000000
## Squirt
## 0.0000000
## Squirt 1
## 0.0000000
## Squirt 2
## 0.0000000
## Squirt leader
## 0.0000000
## SS Agent
## 0.0000000
## SS Agent 2
## 0.0000000
## Stab
## 0.0000000
## Stacy
## 0.0000000
## Staff
## 0.0000000
## Staffer
## 0.0000000
## Staffer 1
## 0.0000000
## Staffer 2
## 0.0000000
## Staffer 3
## 0.0000000
## Stagehand
## 0.0000000
## Stage hand
## 0.0000000
## Stage Hand
## 0.0000000
## Stallone
## 0.0000000
## Stan
## 0.0000000
## Stan and Jesus
## 0.0000000
## Stan and Kenny
## 0.0000000
## Stan and Kyle
## 0.0000000
## Stan, Cartman
## 0.0000000
## Stan, Cartman, Kenny
## 0.0000000
## Standing Patron
## 0.0000000
## Stan, Jesus
## 0.0000000
## Stan/Kenny/ Cartman
## 0.0000000
## Stan, Kenny, Kyle
## 0.0000000
## Stan, Kyle
## 0.0000000
## Stan/Kyle
## 0.0000000
## Stan, Kyle, Blanket
## 0.0000000
## Stan, Kyle, Butters
## 0.0000000
## Stan, Kyle, Butters, Token
## 0.0000000
## Stan, Kyle, Cartman
## 0.0000000
## Stan/Kyle/ Cartman
## 0.0000000
## Stan, Kyle, Cartman, Kenny
## 0.0000000
## Stan, Kyle, Kenny
## 0.0000000
## Stan/Kyle/ Kenny
## 0.0000000
## Stan, Kyle, Kenny, Cartman
## 0.0000000
## Stanley
## 0.0000000
## Stan Marsh
## 0.0000000
## Star Wars Kid
## 0.0000000
## Steamy Nicks
## 0.0000000
## Stella
## 0.0000000
## Stephen
## 0.0000000
## Stephen Abootman
## 0.0000000
## Stephen, Butters
## 0.0000000
## Stephen Stotch
## 0.0000000
## Stephen Tamil
## 0.0000000
## Steve
## 0.0000000
## Steve Bischiotti
## 0.0000000
## Steve Black
## 0.0000000
## Steve Forbes
## 0.0000000
## Steve Irwin
## 0.0000000
## Steve Jobs
## 0.0000000
## Steve "Last Call"
## 0.0000000
## Steven
## 0.0000000
## Steve Nelson
## 0.0000000
## Stevens
## 0.0000000
## Steven Spielberg
## 0.0000000
## Stewart
## 0.0000000
## Stewie
## 0.0000000
## Stingray Announcer
## 0.0000000
## Stinky
## 0.0000000
## Stockbroker
## 0.0000000
## Stormtrooper
## 0.0000000
## Storm Trooper
## 0.0000000
## Stout Man
## 0.0000000
## Stranger
## 0.0000000
## Strawberry Shortcake
## 0.0000000
## Stripper
## 0.0000000
## Strummer
## 0.0000000
## Stu
## 0.0000000
## Stuart
## 0.0000000
## Stuart and Mrs. McCormick
## 0.0000000
## Stuart and wife, and Receptionist
## 0.0000000
## Student
## 0.0000000
## Student 1
## 0.0000000
## Student 2
## 0.0000000
## Student 3
## 0.0000000
## Students
## 0.0000000
## Studio Audience
## 0.0000000
## Subway Rep 2
## 0.0000000
## Subway Rep 3
## 0.0000000
## Subway Representative
## 0.0000000
## Suicide 1
## 0.0000000
## Suicide 2
## 0.0000000
## Suicide 3
## 0.0000000
## Suicide 4
## 0.0000000
## Suicide 5
## 0.0000000
## Suicide 6
## 0.0000000
## Suicide 7
## 0.0000000
## Suitcase
## 0.0000000
## Summit Host
## 0.0000000
## Superman
## 0.0000000
## Supporter
## 0.0000000
## Supporter 1
## 0.0000000
## Supporter 2
## 0.0000000
## Supporter 3
## 0.0000000
## Supporter 4
## 0.0000000
## Supporter 5
## 0.0000000
## Supporters
## 0.0000000
## Surgeon-General
## 0.0000000
## Susan
## 0.0000000
## Susan92's profile
## 0.0000000
## Sussan
## 0.0000000
## Suzanne
## 0.0000000
## Suzette
## 0.0000000
## SWAT Hansen
## 0.0000000
## SWAT Officer
## 0.0000000
## SWAT Officer 1
## 0.0000000
## SWAT Officer 2
## 0.0000000
## SWAT Officer 3
## 0.0000000
## SWAT Officer 4
## 0.0000000
## SWAT Officer 5
## 0.0000000
## SWAT rescuer Hansen
## 0.0000000
## Swiss Delegate
## 0.0000000
## Sylvester
## 0.0000000
## Taco Bell Exec
## 0.0000000
## Tactical Officer
## 0.0000000
## Tad
## 0.0000000
## Tad and friends
## 0.0000000
## Tad's friends
## 0.0000000
## Talent Scout
## 0.0000000
## Talk Show Host
## 0.0000000
## Tall Crip
## 0.0000000
## Taller Boy
## 0.0000000
## Taller man
## 0.0000000
## Tall Goon
## 0.0000000
## Tall Goth
## 0.0000000
## Tammy
## 0.0000000
## Tan Jovi
## 0.0000000
## Tank Driver
## 0.0000000
## Tape
## 0.0000000
## TAPS
## 0.0000000
## Tardy Man
## 0.0000000
## Taylor
## 0.0000000
## TCO Reporter
## 0.0000000
## Teabag
## 0.0000000
## Tea Bag Participant
## 0.0000000
## Teacher
## 0.0000000
## Tech
## 0.0000000
## Tech 1
## 0.0000000
## Tech 2
## 0.0000000
## Tech 3
## 0.0000000
## Tech 4
## 0.0000000
## Tech 5
## 0.0000000
## Tech 7
## 0.0000000
## Techs
## 0.0000000
## Ted
## 0.0000000
## Ted Koppel
## 0.0000000
## Teen 1
## 0.0000000
## Teen 2
## 0.0000000
## Teen boy
## 0.0000000
## Teen Boy
## 0.0000000
## Teen Boy 1
## 0.0000000
## Teen Boy 2
## 0.0000000
## Teen Boy 3
## 0.0000000
## Teen Boy 4
## 0.0000000
## Teen Boy 5
## 0.0000000
## Teen Boy 6
## 0.0000000
## Teen Boy 7
## 0.0000000
## Teen Boy 8
## 0.0000000
## Teen girl
## 0.0000000
## Teen Girl
## 0.0000000
## Teen Girl 1
## 0.0000000
## Teen Girl 2
## 0.0000000
## Teen MC
## 0.0000000
## Teens
## 0.0000000
## Tele's Owner
## 0.0000000
## Televangelist
## 0.0000000
## Teller
## 0.0000000
## Teresa
## 0.0000000
## Terrance
## 0.0000000
## Terrance & Phillip
## 0.0000000
## Terrance/Phillip
## 0.0000000
## Terrorist #1
## 0.0000000
## Terrorists
## 0.0000000
## Terry
## 0.0000000
## Thad
## 0.0000000
## THC President
## 0.0000000
## The Adults
## 0.0000000
## The Avs
## 0.0000000
## The Boy
## 0.0000000
## The boys
## 0.0000000
## The Boys
## 0.0000000
## The Boys and The Brandos
## 0.0000000
## The Boys (except Cartman) and Dr. Phillips
## 0.0000000
## The Broflovskis
## 0.0000000
## The Broflovskis' Answering Machine
## 0.0000000
## The class
## 0.0000000
## The Class
## 0.0000000
## The Clergy
## 0.0000000
## The Colonel
## 0.0000000
## The Coon
## 0.0000000
## The Cotswolds
## 0.0000000
## The Crew
## 0.0000000
## The Cubs
## 0.0000000
## The Doctor
## 0.0000000
## The Dragon
## 0.0000000
## The Family
## 0.0000000
## The Freaks
## 0.0000000
## The Ghost of Human Kindness
## 0.0000000
## The Giant
## 0.0000000
## The Gintses
## 0.0000000
## The Girls
## 0.0000000
## The group
## 0.0000000
## The Guys
## 0.0000000
## The Harrisons
## 0.0000000
## The Human Kite
## 0.0000000
## The Japanese
## 0.0000000
## The Jonas Brothers
## 0.0000000
## The Kardashians
## 0.0000000
## The kids
## 0.0000000
## The Kids
## 0.0000000
## The Kids of South Park Elementary
## 0.0000000
## The King
## 0.0000000
## The KKK
## 0.0000000
## The Ladies
## 0.0000000
## The Lords
## 0.0000000
## The Males
## 0.0000000
## The Males (Randy)
## 0.0000000
## The Marshes' Answering Machine
## 0.0000000
## The Mayor
## 0.0000000
## Theme
## 0.0000000
## The men
## 0.0000000
## The Men
## 0.0000000
## The Minotaur
## 0.0000000
## The Nerds
## 0.0000000
## The New Lyrics
## 0.0000000
## The New Lyrics, part II
## 0.0000000
## The Nuggets
## 0.0000000
## The Office
## 0.0000000
## The other boys
## 0.0000000
## The Other Boys
## 0.0000000
## The other four
## 0.0000000
## The other kids
## 0.0000000
## The Other Kids
## 0.0000000
## The Other Members
## 0.0000000
## The other men
## 0.0000000
## The others
## 0.0000000
## The Others
## 0.0000000
## The Parents
## 0.0000000
## The Phantom
## 0.0000000
## The Pope
## 0.0000000
## The Queer Eye Guys
## 0.0000000
## The Ramseys
## 0.0000000
## The Ramseys and Condit
## 0.0000000
## The Ramseys, O.J., Condit
## 0.0000000
## Therapist
## 0.0000000
## The rest of the boys
## 0.0000000
## The Scenes
## 0.0000000
## The Situation
## 0.0000000
## The South Park boys
## 0.0000000
## The Streible Girls
## 0.0000000
## The Tape
## 0.0000000
## The Team
## 0.0000000
## The three adults
## 0.0000000
## The three men
## 0.0000000
## The Three Spirits
## 0.0000000
## The TV
## 0.0000000
## The Wise One
## 0.0000000
## The Wizard
## 0.0000000
## The Women
## 0.0000000
## Thin Cop
## 0.0000000
## Thin Plumber
## 0.0000000
## Third Graders
## 0.0000000
## Third Official
## 0.0000000
## Thom
## 0.0000000
## Thomas
## 0.0000000
## Thomas, Kyle
## 0.0000000
## Thomas McElroy
## 0.0000000
## Thompson
## 0.0000000
## Three kids
## 0.0000000
## Three Tortured Souls
## 0.0000000
## Thumper
## 0.0000000
## Ticket 2974 Holder
## 0.0000000
## Ticket agent
## 0.0000000
## Ticket Salesman
## 0.0000000
## Ticket Teller
## 0.0000000
## Tiger
## 0.0000000
## Tiger Woods
## 0.0000000
## Tim Burton
## 0.0000000
## Time Child
## 0.0000000
## Timmy
## 0.0000000
## TiVo
## 0.0000000
## Toby
## 0.0000000
## Together
## 0.0000000
## Token
## 0.0000000
## Token, Craig
## 0.0000000
## Token, Kyle, Stan
## 0.0000000
## Token's father
## 0.0000000
## Token's Father
## 0.0000000
## Token's Mother
## 0.0000000
## Tom
## 0.0000000
## Tom and Mary
## 0.0000000
## Tom Brady
## 0.0000000
## Tom Cruise
## 0.0000000
## Tom Davis
## 0.0000000
## Tom Green
## 0.0000000
## Tom Hanks
## 0.0000000
## Tom Johansen
## 0.0000000
## Tommy
## 0.0000000
## Tommy and His Dad
## 0.0000000
## Tom Nelson
## 0.0000000
## Tom Shane
## 0.0000000
## Tom Snyder
## 0.0000000
## Tom Vilsack
## 0.0000000
## Tong Leader
## 0.0000000
## Tony
## 0.0000000
## Tony Hayward
## 0.0000000
## Tony Kornheiser
## 0.0000000
## Toodee
## 0.0000000
## Toolshed
## 0.0000000
## Tooth
## 0.0000000
## Toothbrush
## 0.0000000
## Tooth Decay
## 0.0000000
## Toothpaste
## 0.0000000
## Top Girl
## 0.0000000
## Top Official
## 0.0000000
## Top Official 2
## 0.0000000
## Toss-a-Ball Operator
## 0.0000000
## Toss-A-Ball Operator
## 0.0000000
## Tough Boy 1
## 0.0000000
## Tough Boy 2
## 0.0000000
## Tough Boy 3
## 0.0000000
## Tough Guy 1
## 0.0000000
## Tough Guy 2
## 0.0000000
## Tour Guide
## 0.0000000
## Tour Guide 2
## 0.0000000
## Tourist
## 0.0000000
## Towel
## 0.0000000
## Towelie
## 0.0000000
## Towelie Clone
## 0.0000000
## Townsfolk
## 0.0000000
## Townsman
## 0.0000000
## Townsman 1
## 0.0000000
## Townsman 10
## 0.0000000
## Townsman 11
## 0.0000000
## Townsman 12
## 0.0000000
## Townsman 13
## 0.0000000
## Townsman 14
## 0.0000000
## Townsman 15
## 0.0000000
## Townsman 16
## 0.0000000
## Townsman 17
## 0.0000000
## Townsman 2
## 0.0000000
## Townsman 3
## 0.0000000
## Townsman 4
## 0.0000000
## Townsman 5
## 0.0000000
## Townsman 6
## 0.0000000
## Townsman 7
## 0.0000000
## Townsman 8
## 0.0000000
## Townsman 9
## 0.0000000
## Townspeople
## 0.0000000
## Townsperson 1
## 0.0000000
## Townsperson 2
## 0.0000000
## Townsperson 3
## 0.0000000
## Townswoman
## 0.0000000
## Townswoman 1
## 0.0000000
## Townswoman 2
## 0.0000000
## Tow Truck Driver
## 0.0000000
## Tracy
## 0.0000000
## Train Conductor
## 0.0000000
## Trainee Barbrady
## 0.0000000
## Trainer
## 0.0000000
## Trainer 1
## 0.0000000
## Trainer 2
## 0.0000000
## Trainer 3
## 0.0000000
## Transient Man 1
## 0.0000000
## Transient Man 2
## 0.0000000
## Transient Man 3
## 0.0000000
## Transient Man 4
## 0.0000000
## Transient Man 5
## 0.0000000
## Transient Man 6
## 0.0000000
## Translator
## 0.0000000
## Trapper Keeper
## 0.0000000
## Trashman
## 0.0000000
## Travis
## 0.0000000
## Travolta
## 0.0000000
## Treasurer 1
## 0.0000000
## Treasurer 2
## 0.0000000
## Treasurer 3
## 0.0000000
## Tree hugger
## 0.0000000
## Trent
## 0.0000000
## Trey Parker
## 0.0000000
## Trinity
## 0.0000000
## Tron Guy
## 0.0000000
## Tron Soldier
## 0.0000000
## Trooper
## 0.0000000
## Troupe
## 0.0000000
## Truck Driver
## 0.0000000
## Trucker
## 0.0000000
## TSA Agent 1
## 0.0000000
## TSA Agent 2
## 0.0000000
## T-Shirt Vendor
## 0.0000000
## Tucker
## 0.0000000
## Tugger
## 0.0000000
## Tuong
## 0.0000000
## Tuong Lu Kim
## 0.0000000
## Tupac's Hologram
## 0.0000000
## TupperWear
## 0.0000000
## Turd Sandwich
## 0.0000000
## TV
## 0.0000000
## TV Announcer
## 0.0000000
## TV Crew Director
## 0.0000000
## TV Newscaster
## 0.0000000
## TV Voice
## 0.0000000
## Tweek
## 0.0000000
## Tweek, Craig
## 0.0000000
## Tweek's Mom
## 0.0000000
## Twirler 1
## 0.0000000
## Twirler 2
## 0.0000000
## Twirler 3
## 0.0000000
## Twirler 4
## 0.0000000
## Two Elders
## 0.0000000
## Two Girls
## 0.0000000
## Two Guys
## 0.0000000
## Two kids
## 0.0000000
## Two Small Voices
## 0.0000000
## Two SWAT men
## 0.0000000
## Tyler
## 0.0000000
## Tyler Perry
## 0.0000000
## UAA 1
## 0.0000000
## UAA 2
## 0.0000000
## UAA 3
## 0.0000000
## UAA Leader
## 0.0000000
## UAA Member 1
## 0.0000000
## UAA Member 2
## 0.0000000
## UAA Woman
## 0.0000000
## UAL 1
## 0.0000000
## UAL 2
## 0.0000000
## UAL 3
## 0.0000000
## UAL Aide
## 0.0000000
## UAL Leader
## 0.0000000
## UAL Member 1
## 0.0000000
## Ugly Bob
## 0.0000000
## Ugly Girl
## 0.0000000
## Umpire
## 0.0000000
## Umpire 2
## 0.0000000
## Uncle
## 0.0000000
## Uncle Budd
## 0.0000000
## Uncle Corey
## 0.0000000
## Uncle Howard
## 0.0000000
## Uncle Jimbo
## 0.0000000
## Uncle Murray
## 0.0000000
## Uncle Stinky
## 0.0000000
## Union Reenactors
## 0.0000000
## Unkempt Garrison
## 0.0000000
## U.N. Leader
## 0.0000000
## UPS Man
## 0.0000000
## Uriel
## 0.0000000
## U.S. Army Official
## 0.0000000
## Usher
## 0.0000000
## Vacationer 1
## 0.0000000
## Vampir
## 0.0000000
## Vamps
## 0.0000000
## Vanessa
## 0.0000000
## Van Gelder
## 0.0000000
## Van Gelder, Mr. Mackey
## 0.0000000
## Vanity
## 0.0000000
## Varashnu
## 0.0000000
## Various Folk
## 0.0000000
## Vendor
## 0.0000000
## Vernon
## 0.0000000
## Veronica
## 0.0000000
## Vet
## 0.0000000
## Veteran Guard
## 0.0000000
## Vice President
## 0.0000000
## Viewer 1
## 0.0000000
## Viewer 2
## 0.0000000
## Viewer 3
## 0.0000000
## Vince
## 0.0000000
## Violet Hare
## 0.0000000
## Visitor Driver
## 0.0000000
## Vivian
## 0.0000000
## VJ
## 0.0000000
## Vladimir
## 0.0000000
## Vocalist
## 0.0000000
## Voguing Skier
## 0.0000000
## Voguing Skier 2
## 0.0000000
## Voice
## 0.0000000
## Voice 1
## 0.0000000
## Voice 2
## 0.0000000
## Voice Notification
## 0.0000000
## Voice over
## 0.0000000
## Voice-over
## 0.0000000
## Voice-Over
## 0.0000000
## Voices
## 0.0000000
## Volunteer
## 0.0000000
## Volunteer 1
## 0.0000000
## Volunteer 2
## 0.0000000
## Volunteer 3
## 0.0000000
## Volunteer 4
## 0.0000000
## Waiter
## 0.0000000
## Waitress
## 0.0000000
## Wall-Mart
## 0.0000000
## Wally B.
## 0.0000000
## Walsky
## 0.0000000
## Walter
## 0.0000000
## Walter Cronkite
## 0.0000000
## Warden
## 0.0000000
## War Protester
## 0.0000000
## Water Tester
## 0.0000000
## Wayne D
## 0.0000000
## WCB President
## 0.0000000
## Weasel
## 0.0000000
## Webber
## 0.0000000
## Ween
## 0.0000000
## Weird Hat Guy
## 0.0000000
## Weird Man
## 0.0000000
## Wendy
## 0.0000000
## Wendy, Cartman
## 0.0000000
## Whispers
## 0.0000000
## Whistle
## 0.0000000
## Whistlin' Willy
## 0.0000000
## White Bailiff
## 0.0000000
## White Bitch
## 0.0000000
## White Bouncer
## 0.0000000
## White Chef
## 0.0000000
## White Hare
## 0.0000000
## White Official
## 0.0000000
## Whoopi
## 0.0000000
## Wife
## 0.0000000
## Wigger
## 0.0000000
## William
## 0.0000000
## Will Smith
## 0.0000000
## Willy
## 0.0000000
## Wing
## 0.0000000
## Winner
## 0.0000000
## Wise Man
## 0.0000000
## Witches
## 0.0000000
## With boys
## 0.0000000
## With Boys
## 0.0000000
## With Choir
## 0.0000000
## With Demons
## 0.0000000
## With Females
## 0.0000000
## With Males
## 0.0000000
## With the Damned
## 0.0000000
## With the Kennedys
## 0.0000000
## Wolf Blitzer
## 0.0000000
## Woman
## 0.0000000
## Woman 1
## 0.0000000
## Woman 2
## 0.0000000
## Woman 3
## 0.0000000
## Woman 4
## 0.0000000
## Woman 5
## 0.0000000
## Woman 6
## 0.0000000
## Woman 7
## 0.0000000
## Woman 8
## 0.0000000
## Woman Supporter 1
## 0.0000000
## Woman Supporter 2
## 0.0000000
## Woman With Brown Hair
## 0.0000000
## Women
## 0.0000000
## Wonder Woman
## 0.0000000
## Woodland Critters
## 0.0000000
## Woodpeckery
## 0.0000000
## Woodsy Owl
## 0.0000000
## Worker
## 0.0000000
## Worker 1
## 0.0000000
## Worker 2
## 0.0000000
## Worker 3
## 0.0000000
## Worker 4
## 0.0000000
## Worm
## 0.0000000
## Wrangler
## 0.0000000
## Wrestler
## 0.0000000
## Wyoming Coach
## 0.0000000
## Xenu
## 0.0000000
## Xerxes
## 0.0000000
## Yamal
## 0.0000000
## Yanogapa
## 0.0000000
## Yanogapa 1
## 0.0000000
## Yanogapa 2
## 0.0000000
## Yao
## 0.0000000
## Yates
## 0.0000000
## Yimenez
## 0.0000000
## Yo Gabba Gabba
## 0.0000000
## Yoko Ono
## 0.0000000
## Yolanda
## 0.0000000
## You And Me, Girl
## 0.0000000
## Younger Boy
## 0.0000000
## Younger Daughter
## 0.0000000
## Younger man
## 0.0000000
## Younger Man
## 0.0000000
## Young Worker
## 0.0000000
## Zazul
## 0.0000000
## Zeus
## 0.0000000
## Zipliner
## 0.0000000
## Zombie
## 0.0000000
## Zombie Mortician
## 0.0000000
## Zytar
## 0.0000000
prop.table(table(south_park_test_labels))
## south_park_test_labels
## AAA Leader
## 0.0000000
## Aaron Brown
## 0.0000000
## AARP leader
## 0.0000000
## AARP lookout
## 0.0000000
## AARP member
## 0.0000000
## AARP member 1
## 0.0000000
## AARP member 2
## 0.0000000
## AARP member 3
## 0.0000000
## AARP Members
## 0.0000000
## AA Speaker
## 0.0000000
## A Banana
## 0.0000000
## A bishop
## 0.0000000
## A Bishop
## 0.0000000
## A bodyguard
## 0.0000000
## A boy
## 0.0000000
## A Boy
## 0.0000000
## Abraham Lincoln
## 0.0000000
## A British person
## 0.0000000
## A British Person
## 0.0000000
## A caller
## 0.0000000
## A cat
## 0.0000000
## A Catfish
## 0.0000000
## Accordionist
## 0.0000000
## A Congressman
## 0.0000000
## A Council Member
## 0.0000000
## A counselor
## 0.0000000
## A Cowboy
## 0.0000000
## A crewman
## 0.0000000
## Actors
## 0.0000000
## Adams
## 0.0000000
## Adam Sandler
## 0.0000000
## Adams County
## 0.0000000
## A Dentist
## 0.0000000
## A Diner
## 0.0000000
## A director
## 0.0000000
## A Doctor
## 0.0000000
## Adolf
## 0.0000000
## A Driver
## 0.0000000
## Adults
## 0.0000000
## Advisor
## 0.0000000
## A fan
## 0.0000000
## A Fan
## 0.0000000
## A Fangirl
## 0.0000000
## A few Congressmen
## 0.0000000
## A few others
## 0.0000000
## A few people
## 0.0000000
## A Few People
## 0.0000000
## Afghan Boys
## 0.0000000
## African-American
## 0.0000000
## Afro Ninja
## 0.0000000
## Agent
## 0.0000000
## Agent 1
## 0.0000000
## Agent 10
## 0.0000000
## Agent 11
## 0.0000000
## Agent 12
## 0.0000000
## Agent 2
## 0.0000000
## Agent 3
## 0.0000000
## Agent 4
## 0.0000000
## Agent 5
## 0.0000000
## Agent 6
## 0.0000000
## Agent 7
## 0.0000000
## Agent 8
## 0.0000000
## Agent 9
## 0.0000000
## Agent Clark
## 0.0000000
## Agent Keen
## 0.0000000
## Agent Marx
## 0.0000000
## Agents
## 0.0000000
## Agent Sharp
## 0.0000000
## Aging Hippie Liberal Douche
## 0.0000000
## A Girl
## 0.0000000
## A Guard
## 0.0000000
## A guest
## 0.0000000
## A Guest
## 0.0000000
## A Hall Monitor
## 0.0000000
## A hippie
## 0.0000000
## Aide
## 0.0000000
## Aide 1
## 0.0000000
## Aide 2
## 0.0000000
## Aide 3
## 0.0000000
## Akmarh
## 0.0000000
## Al
## 0.0000000
## Alan
## 0.0000000
## Alanis Morissette
## 0.0000000
## Alan Jackson
## 0.0000000
## Alarm
## 0.0000000
## Alarm: Alert.
## 0.0000000
## Alec Baldwin
## 0.0000000
## Alex
## 0.0000000
## Alex Spanos
## 0.0000000
## ALF Leader
## 0.0000000
## ALF Member
## 0.0000000
## Al Gore
## 0.0000000
## Alias 1
## 0.0000000
## Alias 2
## 0.0000000
## Alias 3
## 0.0000000
## Alias 4
## 0.0000000
## Alice
## 0.0000000
## Alien
## 0.0000000
## Alien 1
## 0.0000000
## Alien 2
## 0.0000000
## Alien 3
## 0.0000000
## Alien Carl
## 0.0000000
## Alien Man
## 0.0000000
## Aliens
## 0.0000000
## All
## 0.0000000
## All Celebrities
## 0.0000000
## All five quints in unison
## 0.0000000
## All Gingers
## 0.0000000
## All the boys
## 0.0000000
## All the kids
## 0.0000000
## All three
## 0.0000000
## All Three
## 0.0000000
## All three men
## 0.0000000
## Allyson
## 0.0000000
## Alone
## 0.0000000
## Al Roker
## 0.0000000
## Alton Brown
## 0.0000000
## Alvin
## 0.0000000
## al-Zawahri
## 0.0000000
## Al-Zawahri
## 0.0000000
## A man
## 0.0000000
## A Man
## 0.0000000
## Amanda
## 0.0000000
## Ambassador
## 0.0000000
## Amber
## 0.0000000
## A Melvin
## 0.0000000
## A Member
## 0.0000000
## American
## 0.0000000
## American Female
## 0.0000000
## American Male 1
## 0.0000000
## American Male 2
## 0.0000000
## American Male 3
## 0.0000000
## Amir
## 0.0000000
## A Musician
## 0.0000000
## An Aged Voice
## 0.0000000
## An Agent
## 0.0000000
## Analyst
## 0.0000000
## An Anchorman
## 0.0000000
## Anchor
## 0.0000000
## Anchor 2
## 0.0000000
## Anchorman
## 0.0000000
## Anchor Man
## 0.0000000
## Anchorman 2
## 0.0000000
## Anchorman Tom
## 0.0000000
## Anchor Tom
## 0.0000000
## Anchorwoman
## 0.0000000
## Anderson Cooper
## 0.0000000
## An Elderly Man
## 0.0000000
## An Elderly Woman
## 0.0000000
## An Expert
## 0.0000000
## Angel
## 0.0000000
## Angel 1
## 0.0000000
## Angel 10
## 0.0000000
## Angel 11
## 0.0000000
## Angel 12
## 0.0000000
## Angel 2
## 0.0000000
## Angel 3
## 0.0000000
## Angel 4
## 0.0000000
## Angel 5
## 0.0000000
## Angel 6
## 0.0000000
## Angel 7
## 0.0000000
## Angel 9
## 0.0000000
## Angela Merkel
## 0.0000000
## Angelina Jolie
## 0.0000000
## Angels
## 0.0000000
## Anne
## 0.0000000
## Annie
## 0.0000000
## Annoncer
## 0.0000000
## Annoucer
## 0.0000000
## Announcer
## 0.0000000
## Announcer 1
## 0.0000000
## Announcer 2
## 0.0000000
## Announcer 3
## 0.0000000
## An officer
## 0.0000000
## An Officer
## 0.0000000
## An Official
## 0.0000000
## An Older Girl
## 0.0000000
## An old farmer
## 0.0000000
## Another addict
## 0.0000000
## Another Ambassador
## 0.0000000
## Another boy
## 0.0000000
## Another Cardinal
## 0.0000000
## Another fan
## 0.0000000
## Another kid
## 0.0000000
## Another kindergartner
## 0.0000000
## Another Man
## 0.0000000
## Another Mayor
## 0.0000000
## Anthropologist
## 0.0000000
## A Nun
## 0.0000000
## A Nurse
## 0.0000000
## A Page
## 0.0000000
## A pilot
## 0.0000000
## A Politician
## 0.0000000
## Apple Man 1
## 0.0000000
## Apple Man 2
## 0.0000000
## Apple Man 4
## 0.0000000
## Apple Tech
## 0.0000000
## A Protester
## 0.0000000
## A Quarantine
## 0.0000000
## A Quint
## 0.0000000
## Arab
## 0.0000000
## Archangel
## 0.0000000
## A Red Wing
## 0.0000000
## A ring tone
## 0.0000000
## Army Doctor
## 0.0000000
## Army Official
## 0.0000000
## Artist
## 0.0000000
## Artsy Man
## 0.0000000
## A Santa
## 0.0000000
## Ashley
## 0.0000000
## Asian Reporter
## 0.0000000
## A Sign-Holder
## 0.0000000
## A singer
## 0.0000000
## A singer, Goth Kids (singing)
## 0.0000000
## A skier
## 0.0000000
## Aslan
## 0.0000000
## Assembly
## 0.0000000
## Assemblyman 1
## 0.0000000
## Assemblyman 2
## 0.0000000
## Assemblyman 3
## 0.0000000
## Assemblyman 4
## 0.0000000
## Assemblywoman 1
## 0.0000000
## Assemblywoman 2
## 0.0000000
## Assistant
## 0.0000000
## Assistant 1
## 0.0000000
## Associate
## 0.0000000
## Astronaut 1
## 0.0000000
## Astronaut 2
## 0.0000000
## A Teacher
## 0.0000000
## A Teen Boy
## 0.0000000
## A Terrorist
## 0.0000000
## ATF agent
## 0.0000000
## ATF lead
## 0.0000000
## ATF Leader
## 0.0000000
## Athlete
## 0.0000000
## Attendant
## 0.0000000
## Attendant 1
## 0.0000000
## Attorney
## 0.0000000
## Audience
## 0.0000000
## Audience Member
## 0.0000000
## Audience members
## 0.0000000
## Audience Members
## 0.0000000
## Aunt Flo
## 0.0000000
## Aunt Jemima
## 0.0000000
## Aunt Nellie
## 0.0000000
## Aussie
## 0.0000000
## Aussie Crewman
## 0.0000000
## Australia
## 0.0000000
## Autumn
## 0.0000000
## Av 1
## 0.0000000
## Av 2
## 0.0000000
## Av 3
## 0.0000000
## A voice
## 0.0000000
## A Voice
## 0.0000000
## A woman
## 0.0000000
## A Woman
## 0.0000000
## Baahir
## 0.0000000
## Bab
## 0.0000000
## Babrady
## 0.0000000
## Baby
## 0.0000000
## Background Singers
## 0.0000000
## Backup Singers
## 0.0000000
## Badger
## 0.0000000
## Bailey
## 0.0000000
## Bailiff
## 0.0000000
## Baker 2
## 0.0000000
## Bald Convict
## 0.0000000
## Bald Guy
## 0.0000000
## Balding Man
## 0.0000000
## Bald Knight
## 0.0000000
## Ballmer
## 0.0000000
## Band
## 0.0000000
## Band Member 1
## 0.0000000
## Band Member 2
## 0.0000000
## Band Member 3
## 0.0000000
## Banker
## 0.0000000
## Barack Obama
## 0.0000000
## Barbardy
## 0.0000000
## Barber
## 0.0000000
## Barbrady
## 0.0000000
## Barbrady Actor
## 0.0000000
## Barbra Streisand
## 0.0000000
## Barkeep
## 0.0000000
## Barker
## 0.0000000
## Barkley
## 0.0000000
## Barky
## 0.0000000
## Barnaby Jones
## 0.0000000
## Bar Patron
## 0.0000000
## Bar Patron 1
## 0.0000000
## Bar Patron 2
## 0.0000000
## Bar Patrons
## 0.0000000
## Bart
## 0.0000000
## Bartender
## 0.0000000
## Bat dad
## 0.0000000
## Bat Dad
## 0.0000000
## BBC Anchor
## 0.0000000
## BBC Announcer
## 0.0000000
## BB Founder
## 0.0000000
## Bea Arthur
## 0.0000000
## Bear
## 0.0000000
## Bear cub
## 0.0000000
## Bearded man
## 0.0000000
## Bearded Man
## 0.0000000
## Bearded PeTA Member
## 0.0000000
## Beary
## 0.0000000
## Beary Bear
## 0.0000000
## Beast
## 0.0000000
## Beat-up Boy
## 0.0000000
## Beavery
## 0.0000000
## Beavery Beaver
## 0.0000000
## Bebe
## 0.0000000
## Bebe, New Kid
## 0.0000000
## Bebe's Mom
## 0.0000000
## Becker
## 0.0000000
## Bee Alien
## 0.0000000
## Beefcake
## 0.0000000
## Beelzeboot
## 0.0000000
## Bellboy
## 0.0000000
## Ben
## 0.0000000
## Ben Affleck
## 0.0000000
## Benedict XVI
## 0.0000000
## Benjamin
## 0.0000000
## Bennigan's Chef
## 0.0000000
## Ben Roethlisberger
## 0.0000000
## Ben Rothlisberger
## 0.0000000
## Bertha
## 0.0000000
## Best Buy President
## 0.0000000
## Best Buy Rep
## 0.0000000
## Betsy
## 0.0000000
## Betsy MacIntosh
## 0.0000000
## BHI President
## 0.0000000
## Bible Vendor
## 0.0000000
## Big Blonde
## 0.0000000
## Big-Eared Boy
## 0.0000000
## Big Gay Al
## 0.0000000
## Biggie Smalls
## 0.0000000
## Big Harry
## 0.0000000
## Big Man
## 0.0000000
## Big Stan
## 0.0000000
## Big Woman
## 0.0000000
## Biker 10
## 0.0000000
## Biker 11
## 0.0000000
## Biker 12
## 0.0000000
## Biker 13
## 0.0000000
## Biker 14
## 0.0000000
## Biker 15
## 0.0000000
## Biker 2
## 0.0000000
## Biker 3
## 0.0000000
## Biker 4
## 0.0000000
## Biker 5
## 0.0000000
## Biker 6
## 0.0000000
## Biker 7
## 0.0000000
## Biker 8
## 0.0000000
## Biker 9
## 0.0000000
## Bikers
## 0.0000000
## Bill
## 0.0000000
## Bill Clinton
## 0.0000000
## Bill Cosby
## 0.0000000
## Bill Gates
## 0.0000000
## Bill O'Reilly
## 0.0000000
## Bill's hologram
## 0.0000000
## Billy
## 0.0000000
## Billy Mays
## 0.0000000
## Billy's Mom
## 0.0000000
## Bishop
## 0.0000000
## Bishop 1
## 0.0000000
## Bishop 2
## 0.0000000
## Bishop 3
## 0.0000000
## Black Bailiff
## 0.0000000
## Black Bitch
## 0.0000000
## Black Bouncer
## 0.0000000
## Black boy
## 0.0000000
## Blackjack Dealer
## 0.0000000
## Black kid
## 0.0000000
## Black Man
## 0.0000000
## Black Man 2
## 0.0000000
## Black Man 3
## 0.0000000
## Black Member
## 0.0000000
## Black Officer
## 0.0000000
## Black Official
## 0.0000000
## Black Player
## 0.0000000
## Black Plumber
## 0.0000000
## Blacksmith
## 0.0000000
## Black Vamp
## 0.0000000
## Black Vamp, Mike, and Pete
## 0.0000000
## Black Woman
## 0.0000000
## Black Woman 2
## 0.0000000
## Blaine
## 0.0000000
## Blaintologist
## 0.0000000
## Blanket
## 0.0000000
## Blavius
## 0.0000000
## Blind Man
## 0.0000000
## Blond
## 0.0000000
## Blond agent
## 0.0000000
## Blond Agent
## 0.0000000
## Blond Boy
## 0.0000000
## Blond Cop
## 0.0000000
## Blonde
## 0.0000000
## Blonde 2
## 0.0000000
## Blonde 3
## 0.0000000
## Blonde Boy
## 0.0000000
## Blonde Girl
## 0.0000000
## Blonde Judge
## 0.0000000
## Blonde Mother
## 0.0000000
## Blonde Nurse
## 0.0000000
## Blonde PeTA Member
## 0.0000000
## Blonde PeTA Member 2
## 0.0000000
## Blonde PeTA Woman
## 0.0000000
## Blonde Protester
## 0.0000000
## Blonde Russian
## 0.0000000
## Blond Girl
## 0.0000000
## Blond Knight
## 0.0000000
## Blond man
## 0.0000000
## Blond Man
## 0.0000000
## Blond Member
## 0.0000000
## Blond Officer
## 0.0000000
## Blond Russian
## 0.0000000
## Blond Trekker
## 0.0000000
## Blood
## 0.0000000
## Blood 1
## 0.0000000
## Blood 2
## 0.0000000
## Blood 3
## 0.0000000
## Blood 4
## 0.0000000
## Blood 5
## 0.0000000
## Blood 6
## 0.0000000
## Bloodrayne
## 0.0000000
## Blue Team
## 0.0000000
## Board Member
## 0.0000000
## Board Rep
## 0.0000000
## Board Rep 1
## 0.0000000
## Board Rep 2
## 0.0000000
## Boat Ride Singers
## 0.0000000
## Bob
## 0.0000000
## Bobby Flay
## 0.0000000
## Bob Dole
## 0.0000000
## Bobo
## 0.0000000
## Bob Saget
## 0.0000000
## Bob Summers
## 0.0000000
## Bob Thomas
## 0.0000000
## Bodybuilder
## 0.0000000
## Bodyguard
## 0.0000000
## Bonds
## 0.0000000
## Bono
## 0.0000000
## Bookie
## 0.0000000
## Boombox
## 0.0000000
## Border Guard
## 0.0000000
## Border Officer 1
## 0.0000000
## Border Officer 2
## 0.0000000
## Border Officer 3
## 0.0000000
## Border Officer 4
## 0.0000000
## Border Officer 5
## 0.0000000
## Boss
## 0.0000000
## Both
## 0.0000000
## Both Cartmans
## 0.0000000
## Both Kyles
## 0.0000000
## Both men
## 0.0000000
## Both parents
## 0.0000000
## Both Parents
## 0.0000000
## Both sides
## 0.0000000
## Bouncer
## 0.0000000
## Boy
## 0.0000000
## Boy 1
## 0.0000000
## Boy #1
## 0.0000000
## Boy #1*
## 0.0000000
## Boy 2
## 0.0000000
## Boy #2
## 0.0000000
## Boy 3
## 0.0000000
## Boy 4
## 0.0000000
## Boy 5
## 0.0000000
## Boy Announcer
## 0.0000000
## Boyfriend
## 0.0000000
## Boy in Blue Vest
## 0.0000000
## Boy in glasses
## 0.0000000
## Boy in Green Shirt
## 0.0000000
## Boy In The Red Shirt
## 0.0000000
## Boys
## 0.0000000
## Boys 1/2
## 0.0000000
## Boys, Hankeys
## 0.0000000
## Boy Slave
## 0.0000000
## Boy Sledders
## 0.0000000
## Boy with Red Scarf
## 0.0000000
## BP Man 1
## 0.0000000
## BP Man 2
## 0.0000000
## BP Man 3
## 0.0000000
## BP Man 4
## 0.0000000
## Brad
## 0.0000000
## Bradley
## 0.0000000
## Bradley Biggle
## 0.0000000
## Brad Morgan
## 0.0000000
## Brad Paisley
## 0.0000000
## Braided Crip
## 0.0000000
## Brandon Carlile
## 0.0000000
## Brandy's Mom
## 0.0000000
## Brazil
## 0.0000000
## Breeder
## 0.0000000
## Brent Musberger
## 0.0000000
## Brett
## 0.0000000
## Brett Favre
## 0.0000000
## Brian
## 0.0000000
## Bridon
## 0.0000000
## Bridon, Wendy
## 0.0000000
## Britain
## 0.0000000
## British Cardinal
## 0.0000000
## British Delegate
## 0.0000000
## Britney
## 0.0000000
## Brobee
## 0.0000000
## Broderick
## 0.0000000
## Broker
## 0.0000000
## Broloff
## 0.0000000
## Bronco 1
## 0.0000000
## Bronco 2
## 0.0000000
## Broncos
## 0.0000000
## Bros
## 0.0000000
## Brother Anderson
## 0.0000000
## Brown Hare
## 0.0000000
## Brunet
## 0.0000000
## Brunet Boy
## 0.0000000
## Brunet Man
## 0.0000000
## Brunet Member
## 0.0000000
## Brunette
## 0.0000000
## Brunette 2
## 0.0000000
## Brunette 3
## 0.0000000
## Brunette Nurse
## 0.0000000
## Brunet Trekker
## 0.0000000
## BSM-471
## 0.0000000
## Bucky Bailey
## 0.0000000
## Buddha
## 0.0000000
## Buddy 1
## 0.0000000
## Buddy 2
## 0.0000000
## BUDS Man
## 0.0000000
## Buff Crip
## 0.0000000
## Bulter
## 0.0000000
## Bum
## 0.0000000
## Bum 1
## 0.0000000
## Bum 10
## 0.0000000
## Bum 11
## 0.0000000
## Bum 12
## 0.0000000
## Bum 13
## 0.0000000
## Bum 14
## 0.0000000
## Bum 15
## 0.0000000
## Bum 16
## 0.0000000
## Bum 17
## 0.0000000
## Bum 18
## 0.0000000
## Bum 2
## 0.0000000
## Bum 3
## 0.0000000
## Bum 4
## 0.0000000
## Bum 5
## 0.0000000
## Bum 6
## 0.0000000
## Bum 7
## 0.0000000
## Bum 8
## 0.0000000
## Bum 9
## 0.0000000
## Bums
## 0.0000000
## Bundy
## 0.0000000
## Burger King Exec
## 0.0000000
## Burly man
## 0.0000000
## Burns
## 0.0000000
## Bus Driver
## 0.0000000
## Bush
## 0.0000000
## Bushy Eyebrows Boy
## 0.0000000
## Businessman
## 0.0000000
## Butler
## 0.0000000
## Butters
## 0.0000000
## Butters and the Freaks
## 0.0000000
## Butters, Cartman
## 0.0000000
## Butters' profile
## 0.0000000
## Butter's Voice
## 0.0000000
## Butt Out!
## 0.0000000
## Butt Out! Lady
## 0.0000000
## Butt Out! Man 1
## 0.0000000
## Butt Out! Man 2
## 0.0000000
## Butt Out! Man 3
## 0.0000000
## Butt Out!'s Kyle
## 0.0000000
## Cabbie
## 0.0000000
## Cable Guy
## 0.0000000
## Café 180 Patron
## 0.0000000
## Café Monet diner
## 0.0000000
## Cajun Shrimper
## 0.0000000
## Caller
## 0.0000000
## Caller 1
## 0.0000000
## Caller 2
## 0.0000000
## Caller 3
## 0.0000000
## Cameraman
## 0.0000000
## Campers
## 0.0000000
## Camp Soldier
## 0.0000000
## Camp Warden
## 0.0000000
## Canadian
## 0.0000000
## Canadian 1
## 0.0000000
## Canadian 2
## 0.0000000
## Canadian 3
## 0.0000000
## Canadian Man
## 0.0000000
## Canadian Paparazzo
## 0.0000000
## Canadian PM
## 0.0000000
## Canadians
## 0.0000000
## Candice
## 0.0000000
## Cantor
## 0.0000000
## Canyoner
## 0.0000000
## Captain
## 0.0000000
## Captain Bly
## 0.0000000
## Captain Hindsight
## 0.0000000
## Captain Paul Watson
## 0.0000000
## Cardinal
## 0.0000000
## Cardinal Mahoney
## 0.0000000
## Cardinal Mallory
## 0.0000000
## Carl
## 0.0000000
## Carlos
## 0.0000000
## Carlos Mencia
## 0.0000000
## Carlos Ramirez
## 0.0000000
## Carol
## 0.0000000
## Caroline
## 0.0000000
## Carrot Ass
## 0.0000000
## Car Salesman
## 0.0000000
## Carson
## 0.0000000
## Carson replica
## 0.0000000
## Cartamn
## 0.0000000
## Carter
## 0.0000000
## Cartman
## 0.5787394
## Cartman and Kyle
## 0.0000000
## Cartman and the Gingers
## 0.0000000
## Cartman (Butters)
## 0.0000000
## Cartman, Butters
## 0.0000000
## Cartman, Choir
## 0.0000000
## Cartman/ Kenny
## 0.0000000
## Cartman, Kyle
## 0.0000000
## Cartman, Kyle, Kenny
## 0.0000000
## Cartman on Left
## 0.0000000
## Cartman on Right
## 0.0000000
## Cartman's Bad Side
## 0.0000000
## Cartmans/Boys
## 0.0000000
## Cartman's Conscience
## 0.0000000
## Cartman's Good Side
## 0.0000000
## Cartman Smurf
## 0.0000000
## Cartman's Side
## 0.0000000
## Cartman, Stan
## 0.0000000
## Cartman's voice
## 0.0000000
## Cartmen
## 0.0000000
## Case Worker
## 0.0000000
## Casey
## 0.0000000
## Cashier
## 0.0000000
## Cast
## 0.0000000
## Castro
## 0.0000000
## Cat
## 0.0000000
## Catatafish
## 0.0000000
## Cat Burglar
## 0.0000000
## Cavity Creeps
## 0.0000000
## CD
## 0.0000000
## Cee Lo Green
## 0.0000000
## Celine
## 0.0000000
## Celine Dion
## 0.0000000
## Celine, Terrance, Bob, Phillip, and people on the field
## 0.0000000
## Center
## 0.0000000
## Center 1
## 0.0000000
## Center 2
## 0.0000000
## Center Gnome
## 0.0000000
## Center Judge
## 0.0000000
## Centers
## 0.0000000
## Centers and Right
## 0.0000000
## CEO
## 0.0000000
## Cesar
## 0.0000000
## Chad
## 0.0000000
## Chad's Dad
## 0.0000000
## Chairman
## 0.0000000
## Chamber of Farts Operator
## 0.0000000
## Character
## 0.0000000
## Charise
## 0.0000000
## Charles Biggens
## 0.0000000
## Charlie
## 0.0000000
## Charlie Brown
## 0.0000000
## Charlie Rose
## 0.0000000
## Charlie Sheen
## 0.0000000
## Charlotte Poll Worker
## 0.0000000
## Chase
## 0.0000000
## Chauffeur
## 0.0000000
## Cheerleader 1
## 0.0000000
## Cheerleader 2
## 0.0000000
## Cheerleaders
## 0.0000000
## Cheesy Poof Cartman
## 0.0000000
## Cheesy Poofs Commercial
## 0.0000000
## Cheetara
## 0.0000000
## Chef
## 0.0000000
## Chef Actor
## 0.0000000
## Chef and James Taylor
## 0.0000000
## Chef and Principle Victoria
## 0.0000000
## Chef (falsetto)
## 0.0000000
## Chef (recording)
## 0.0000000
## Chef's dad
## 0.0000000
## Chef's mom
## 0.0000000
## Chef, Veronica
## 0.0000000
## Chef, Victoria, Mackey
## 0.0000000
## Cheney
## 0.0000000
## Cher
## 0.0000000
## Chet
## 0.0000000
## Chickadee-y
## 0.0000000
## Chief
## 0.0000000
## Chief Aide
## 0.0000000
## Chief David
## 0.0000000
## Chief elder
## 0.0000000
## Chief Elder
## 0.0000000
## Chief Joe
## 0.0000000
## Chief Justice
## 0.0000000
## Chief of Security
## 0.0000000
## Chief Running Pinto
## 0.0000000
## Chief Running Pinto (Tommy Chong in his stoner voice)
## 0.0000000
## Chief Running Water
## 0.0000000
## Chief Stevens
## 0.0000000
## Child
## 0.0000000
## Child singers
## 0.0000000
## China
## 0.0000000
## Chinese Commentator
## 0.0000000
## Chinese kid
## 0.0000000
## Chinese Officer
## 0.0000000
## Chip
## 0.0000000
## Chocolate Rain Guy
## 0.0000000
## Choir
## 0.0000000
## Choir Boy
## 0.0000000
## Choir Girl
## 0.0000000
## Choir Teacher
## 0.0000000
## Chorus
## 0.0000000
## Chris
## 0.0000000
## Chris Crocker
## 0.0000000
## Chris Holt
## 0.0000000
## Chris Martin
## 0.0000000
## Chris/Saddam
## 0.0000000
## Chris Swollenballs
## 0.0000000
## Christina Aguilera monster
## 0.0000000
## Christina Naylon
## 0.0000000
## Christine
## 0.0000000
## Chubby Official
## 0.0000000
## CIA Leader 2
## 0.0000000
## CIA Vice Head
## 0.0000000
## Cinderella
## 0.0000000
## Cipac
## 0.0000000
## Citizen
## 0.0000000
## Citizen 2
## 0.0000000
## City Wok Owner
## 0.0000000
## Class
## 0.0000000
## Classmates
## 0.0000000
## Clean Garrison
## 0.0000000
## Cleric 1
## 0.0000000
## Cleric 2
## 0.0000000
## Cleric 3
## 0.0000000
## Clerk
## 0.0000000
## Clerk 1
## 0.0000000
## Clerk 2
## 0.0000000
## Clerk 3
## 0.0000000
## Clerk 4
## 0.0000000
## Cliff
## 0.0000000
## Clinic Doctor
## 0.0000000
## Clinton
## 0.0000000
## Clown
## 0.0000000
## Club Members
## 0.0000000
## Clyde
## 0.0000000
## Clyde Frog
## 0.0000000
## Clyde, Ike
## 0.0000000
## Clyde, Kenny
## 0.0000000
## CNN Anchor
## 0.0000000
## CNN Reporter
## 0.0000000
## Coach
## 0.0000000
## Coach 2
## 0.0000000
## Coach Connors
## 0.0000000
## Cochran
## 0.0000000
## COCKA-3
## 0.0000000
## Cody
## 0.0000000
## Colin
## 0.0000000
## Colleague
## 0.0000000
## Colleague 1
## 0.0000000
## Colleague 2
## 0.0000000
## Collector
## 0.0000000
## Collins
## 0.0000000
## Comedian
## 0.0000000
## Commander
## 0.0000000
## Commentator
## 0.0000000
## Commentator 1
## 0.0000000
## Commentator 2
## 0.0000000
## Commissioner
## 0.0000000
## Company rep
## 0.0000000
## Computer
## 0.0000000
## Computer Voice
## 0.0000000
## Comrade 1
## 0.0000000
## Comrade 2
## 0.0000000
## Conan O'Brien
## 0.0000000
## Conductor
## 0.0000000
## Confederate 1
## 0.0000000
## Confederate 2
## 0.0000000
## Confederate Reenactors
## 0.0000000
## Confederates
## 0.0000000
## Congregants
## 0.0000000
## Congregation
## 0.0000000
## Congressman
## 0.0000000
## Congressman 1
## 0.0000000
## Congressman 1, Cartman
## 0.0000000
## Congressman 2
## 0.0000000
## Congressman 3
## 0.0000000
## Congressmen
## 0.0000000
## Connelly
## 0.0000000
## Conner
## 0.0000000
## Connor
## 0.0000000
## Constance
## 0.0000000
## Construction Worker
## 0.0000000
## Contestant
## 0.0000000
## Contestant 2
## 0.0000000
## Controller 1
## 0.0000000
## Controller 2
## 0.0000000
## Convict 2
## 0.0000000
## Coon
## 0.0000000
## Coon's Friends
## 0.0000000
## Coordinator
## 0.0000000
## Cop
## 0.0000000
## Cop 1
## 0.0000000
## Cop 2
## 0.0000000
## Copilot
## 0.0000000
## Cops
## 0.0000000
## Corey
## 0.0000000
## Cornwallis
## 0.0000000
## Corporate Head
## 0.0000000
## Coucilman
## 0.0000000
## Counselor
## 0.0000000
## Counselor Steve
## 0.0000000
## Country Singer
## 0.0000000
## Cous-Cous
## 0.0000000
## Cow
## 0.0000000
## Cowboy
## 0.0000000
## Cowboy 1
## 0.0000000
## Cowboy 2
## 0.0000000
## Cowboys
## 0.0000000
## Cowlick Vamp
## 0.0000000
## Cowlick Vampire
## 0.0000000
## Coworker
## 0.0000000
## Co-Worker
## 0.0000000
## Cows
## 0.0000000
## Cpt. Gabriel
## 0.0000000
## Cpt. Taylor
## 0.0000000
## Crab Leader
## 0.0000000
## Crab Man 2
## 0.0000000
## Crab Man 3
## 0.0000000
## Crab People
## 0.0000000
## Crab Solo
## 0.0000000
## Craig
## 0.0000000
## Craig's father
## 0.0000000
## Craig's Father
## 0.0000000
## Craig's father, Tom
## 0.0000000
## Creamy Goodness
## 0.0000000
## Creature
## 0.0000000
## Creature from the Black Lagoon
## 0.0000000
## Crew
## 0.0000000
## Crewman
## 0.0000000
## Crewman 1
## 0.0000000
## Crewman 2
## 0.0000000
## Crewman 3
## 0.0000000
## Crewman 4
## 0.0000000
## Crewman 5
## 0.0000000
## Crewman 6
## 0.0000000
## Crew, Stan
## 0.0000000
## Crip
## 0.0000000
## Crip 1
## 0.0000000
## Crip 2
## 0.0000000
## Crips
## 0.0000000
## Critter
## 0.0000000
## Critters
## 0.0000000
## Crowd
## 0.0000000
## Crowd Member
## 0.0000000
## Crowd members
## 0.0000000
## Crowd Members
## 0.0000000
## Crowd outside
## 0.0000000
## Cruise
## 0.0000000
## Cruise Attendant
## 0.0000000
## Cruise, Travolta
## 0.0000000
## Cult Leader
## 0.0000000
## Cupid Me
## 0.0000000
## Customer
## 0.0000000
## Customer 2
## 0.0000000
## Customers
## 0.0000000
## DA
## 0.0000000
## Dad
## 0.0000000
## Dahmer
## 0.0000000
## Dahmer, Gacy
## 0.0000000
## Dale
## 0.0000000
## Dale Earnhardt, Jr.
## 0.0000000
## Damanta Unit 5
## 0.0000000
## Damien
## 0.0000000
## Damla
## 0.0000000
## Damned Soul
## 0.0000000
## Dan
## 0.0000000
## Dan Akawa
## 0.0000000
## Danica Patrick
## 0.0000000
## Daniel
## 0.0000000
## Danish Man
## 0.0000000
## Danish Woman
## 0.0000000
## Dan Snyder
## 0.0000000
## Dark Cub
## 0.0000000
## Darryl
## 0.0000000
## Darryl Weathers
## 0.0000000
## Darth Chef
## 0.0000000
## Date
## 0.0000000
## Daughter
## 0.0000000
## Dave
## 0.0000000
## David
## 0.0000000
## David Carradine
## 0.0000000
## David Duchovny
## 0.0000000
## David Lee Roth
## 0.0000000
## David Letterman
## 0.0000000
## Davis
## 0.0000000
## Dawkins
## 0.0000000
## Dawson
## 0.0000000
## DC Captain
## 0.0000000
## DC Crew
## 0.0000000
## DC Crewman
## 0.0000000
## DC Crewmen
## 0.0000000
## Dean
## 0.0000000
## Dean Howland
## 0.0000000
## Death
## 0.0000000
## Deckhand
## 0.0000000
## Deck Hand
## 0.0000000
## Deery
## 0.0000000
## Deery Deer
## 0.0000000
## Delivery Man
## 0.0000000
## Demon
## 0.0000000
## Demon 1
## 0.0000000
## Demon 2
## 0.0000000
## Demon 3
## 0.0000000
## Demonius
## 0.0000000
## Dennis
## 0.0000000
## Dental Floss
## 0.0000000
## Dentist
## 0.0000000
## Dentists
## 0.0000000
## Denver Catcher
## 0.0000000
## Denver citizens
## 0.0000000
## Denver Cop
## 0.0000000
## Denver Fans
## 0.0000000
## Denver Goalie
## 0.0000000
## Denver Guard
## 0.0000000
## Denver Pitcher
## 0.0000000
## Denver Player
## 0.0000000
## Denver Player 2
## 0.0000000
## Denver Player 3
## 0.0000000
## Denver Player 4
## 0.0000000
## Denver Poll Worker
## 0.0000000
## Denver Team
## 0.0000000
## Deputy 1
## 0.0000000
## Deputy 2
## 0.0000000
## Derek
## 0.0000000
## Designer
## 0.0000000
## Desk Officer
## 0.0000000
## Detective
## 0.0000000
## Detective 3
## 0.0000000
## Detective 4
## 0.0000000
## Det. Harris
## 0.0000000
## Det. Jarvis
## 0.0000000
## Det. Yates
## 0.0000000
## Devil
## 0.0000000
## DiCaprio
## 0.0000000
## Dick Cheney
## 0.0000000
## Dick Dastardly
## 0.0000000
## Dickinson
## 0.0000000
## Dimitri
## 0.0000000
## Diner 1
## 0.0000000
## Diner 2
## 0.0000000
## Diner 3
## 0.0000000
## Diner 4
## 0.0000000
## Diners
## 0.0000000
## Dio
## 0.0000000
## Director
## 0.0000000
## Director 1
## 0.0000000
## Director 10
## 0.0000000
## Director 2
## 0.0000000
## Director 3
## 0.0000000
## Director 4
## 0.0000000
## Director 5
## 0.0000000
## Director 6
## 0.0000000
## Director 7
## 0.0000000
## Director 8
## 0.0000000
## Director 9
## 0.0000000
## Disciples vocalist
## 0.0000000
## Disfigured Country Singer
## 0.0000000
## Disney Exec 1
## 0.0000000
## Disney Exec 2
## 0.0000000
## Disney Exec 3
## 0.0000000
## Dispatcher
## 0.0000000
## Dispatcher 1
## 0.0000000
## Dispatcher 2
## 0.0000000
## Dispatcher 3
## 0.0000000
## DJ
## 0.0000000
## DJ AM
## 0.0000000
## DMV Official
## 0.0000000
## Doctor
## 0.0000000
## Doctor 1
## 0.0000000
## Doctor 2
## 0.0000000
## Doctor Pal
## 0.0000000
## Doctor's assistant
## 0.0000000
## DogPoo
## 0.0000000
## DOI 1
## 0.0000000
## DOI 2
## 0.0000000
## DOI 3
## 0.0000000
## Dominique and Zizi
## 0.0000000
## Domino
## 0.0000000
## Don
## 0.0000000
## Donald
## 0.0000000
## Donald Rumsfeld
## 0.0000000
## Donald T. Brown
## 0.0000000
## Donald Trump
## 0.0000000
## Don King
## 0.0000000
## Donna
## 0.0000000
## Doorman
## 0.0000000
## Dora
## 0.0000000
## Dougie
## 0.0000000
## Douglas
## 0.0000000
## DP Executive 1
## 0.0000000
## DP Executive 2
## 0.0000000
## DP Executive 3
## 0.0000000
## DP Executive 4
## 0.0000000
## DP Executive 5
## 0.0000000
## DP Executive 6
## 0.0000000
## DP Executives
## 0.0000000
## Draco
## 0.0000000
## Dr Adams
## 0.0000000
## Dr. Adams
## 0.0000000
## Dr. Biber
## 0.0000000
## Dr. Carroll
## 0.0000000
## Dr. Chinstrap
## 0.0000000
## Dr. Doctor
## 0.0000000
## Dr. Doom
## 0.0000000
## Dreadlocked PeTA man
## 0.0000000
## Dreadlocked PeTA Man
## 0.0000000
## Dream Estella
## 0.0000000
## Drew
## 0.0000000
## Dr. Hallis
## 0.0000000
## Driver
## 0.0000000
## Driver 1
## 0.0000000
## Driver 2
## 0.0000000
## Driver 3
## 0.0000000
## Driver 3's Passenger
## 0.0000000
## Driver 4
## 0.0000000
## Driver 5
## 0.0000000
## Dr. Janus
## 0.0000000
## Dr. Katz
## 0.0000000
## Dr. Land
## 0.0000000
## Dr. Lott
## 0.0000000
## Dr. Mephesto
## 0.0000000
## Dr. Neeland
## 0.0000000
## Dr. Oz
## 0.0000000
## Dr. Phil
## 0.0000000
## Dr. Phillips
## 0.0000000
## Dr. Roberts
## 0.0000000
## Dr. Schwartz
## 0.0000000
## Dr. Shay
## 0.0000000
## Dr. Spookalot
## 0.0000000
## Dr. Tonton
## 0.0000000
## Drummer
## 0.0000000
## Dude
## 0.0000000
## Duncan
## 0.0000000
## Duncan Everton
## 0.0000000
## DVDA
## 0.0000000
## Dylan
## 0.0000000
## Eager Man
## 0.0000000
## Earl
## 0.0000000
## Ed
## 0.0000000
## Edge
## 0.0000000
## Editor
## 0.0000000
## Ed McMahon
## 0.0000000
## Ed Sullivan
## 0.0000000
## EFSM President
## 0.0000000
## Elder
## 0.0000000
## Elder 1
## 0.0000000
## Elder 2
## 0.0000000
## Elder 3
## 0.0000000
## Elder Carn
## 0.0000000
## Elder Garth
## 0.0000000
## Elder Harris
## 0.0000000
## Elderlay man
## 0.0000000
## Elderly Driver
## 0.0000000
## Elderly Lady
## 0.0000000
## Elderly man
## 0.0000000
## Elderly Man
## 0.0000000
## Elderly Man 1
## 0.0000000
## Elderly Man 10
## 0.0000000
## Elderly Man 11
## 0.0000000
## Elderly Man 2
## 0.0000000
## Elderly Man 3
## 0.0000000
## Elderly Man 4
## 0.0000000
## Elderly Man 5
## 0.0000000
## Elderly Man 6
## 0.0000000
## Elderly Man 7
## 0.0000000
## Elderly Man 8
## 0.0000000
## Elderly Man 9
## 0.0000000
## Elderly Passenger
## 0.0000000
## Elderly Priest
## 0.0000000
## Elderly Tree Hugger
## 0.0000000
## Elderly Voice
## 0.0000000
## Elderly woman
## 0.0000000
## Elderly Woman
## 0.0000000
## Elderly Woman 1
## 0.0000000
## Elderly Woman 2
## 0.0000000
## Elderly Woman 3
## 0.0000000
## Elderly Woman 4
## 0.0000000
## Elderly Woman 6
## 0.0000000
## Elderly Woman 7
## 0.0000000
## Elders
## 0.0000000
## Elder Schwartz
## 0.0000000
## Electronic Head
## 0.0000000
## Elephant Man
## 0.0000000
## Elin
## 0.0000000
## Elise
## 0.0000000
## Ellen
## 0.0000000
## Ellen DeGeneres
## 0.0000000
## Elmo
## 0.0000000
## Elon Musk
## 0.0000000
## El Presidente
## 0.0000000
## Elton
## 0.0000000
## Elton John
## 0.0000000
## Elvin
## 0.0000000
## Elvis' Hologram
## 0.0000000
## Emcee
## 0.0000000
## Emily
## 0.0000000
## Emir
## 0.0000000
## Emmanuel Lewis
## 0.0000000
## Emmett
## 0.0000000
## Emo Boy
## 0.0000000
## Emo Boy 1
## 0.0000000
## Emo Boy 2
## 0.0000000
## Emo Girl
## 0.0000000
## Emperor Akihito
## 0.0000000
## Emperor Hirohito
## 0.0000000
## Employee
## 0.0000000
## Employee 1
## 0.0000000
## Employee 2
## 0.0000000
## Employee 3
## 0.0000000
## Engineer
## 0.0000000
## Enrique
## 0.0000000
## Enrique Iglesias
## 0.0000000
## Ensign
## 0.0000000
## EOD Leader
## 0.0000000
## Eric
## 0.0000000
## Eric Cartman
## 0.0000000
## Eric Roberts
## 0.0000000
## Eric Roberts (as Kevin!)
## 0.0000000
## ESPN Announcer
## 0.0000000
## ESPN Host
## 0.0000000
## Estella
## 0.0000000
## Esther
## 0.0000000
## Ethiopian
## 0.0000000
## Ethiopians
## 0.0000000
## Ethiopian Woman
## 0.0000000
## ET Reporter
## 0.0000000
## Eugene Levy
## 0.0000000
## Evan Stone
## 0.0000000
## Everybody
## 0.0000000
## Everyone
## 0.0000000
## Everyone Else
## 0.0000000
## EVGames Clerk
## 0.0000000
## Evil Cartman
## 0.0000000
## Evil Kyle
## 0.0000000
## Evil Stan
## 0.0000000
## Ex-Convict
## 0.0000000
## Exec. 1
## 0.0000000
## Exec. 2
## 0.0000000
## Exec. 3
## 0.0000000
## Exec. 4
## 0.0000000
## Executive
## 0.0000000
## Executive 1
## 0.0000000
## Executives
## 0.0000000
## Executor
## 0.0000000
## Expert 1
## 0.0000000
## Expert 10
## 0.0000000
## Expert 11
## 0.0000000
## Expert 2
## 0.0000000
## Expert 3
## 0.0000000
## Expert 4
## 0.0000000
## Expert 5
## 0.0000000
## Expert 6
## 0.0000000
## Expert 7
## 0.0000000
## Expert 8
## 0.0000000
## Expert 9
## 0.0000000
## Factory workers
## 0.0000000
## Falcon
## 0.0000000
## Falsetto
## 0.0000000
## Family
## 0.0000000
## Fan
## 0.0000000
## Fan 1
## 0.0000000
## Fan 2
## 0.0000000
## Fanciful Mayor
## 0.0000000
## Fangirls
## 0.0000000
## Fans
## 0.0000000
## Fan wearing #3
## 0.0000000
## Fan wearing #74
## 0.0000000
## Fan wearing #82
## 0.0000000
## Fan wearing a blue star
## 0.0000000
## Farmer
## 0.0000000
## Farmer 2
## 0.0000000
## Farmer Carl
## 0.0000000
## Farmer Friend 2
## 0.0000000
## Farmers
## 0.0000000
## Farrah Fawcett
## 0.0000000
## Fat Abbot
## 0.0000000
## Fat Boy
## 0.0000000
## Fat Cop
## 0.0000000
## Fat Girl
## 0.0000000
## Father
## 0.0000000
## Father Barnes
## 0.0000000
## Father Maxi
## 0.0000000
## Fat Man
## 0.0000000
## Fat Plumber
## 0.0000000
## Fat Priest
## 0.0000000
## FBI agent
## 0.0000000
## FBI Agent
## 0.0000000
## FBI Agents
## 0.0000000
## FBI Leader
## 0.0000000
## FBI Negotiator
## 0.0000000
## FC Announcer
## 0.0000000
## FC Batter
## 0.0000000
## FC Batter 1
## 0.0000000
## FC Catcher
## 0.0000000
## FC Fat Player
## 0.0000000
## FC Pitcher
## 0.0000000
## FC Team
## 0.0000000
## FDA Agent 1
## 0.0000000
## Fed
## 0.0000000
## Felipe
## 0.0000000
## Female
## 0.0000000
## Female Activist
## 0.0000000
## Female Agent
## 0.0000000
## Female Agent 2
## 0.0000000
## Female Aide
## 0.0000000
## Female Anchor
## 0.0000000
## Female announcer
## 0.0000000
## Female CPS Agent
## 0.0000000
## Female Detective
## 0.0000000
## Female director
## 0.0000000
## Female director 2
## 0.0000000
## Female fan
## 0.0000000
## Female Gambler 1
## 0.0000000
## Female Gambler 2
## 0.0000000
## Female hippie
## 0.0000000
## Female Host
## 0.0000000
## Female Nurse
## 0.0000000
## Female passenger
## 0.0000000
## Female Psychic
## 0.0000000
## Female Reporter
## 0.0000000
## Female Reporter 2
## 0.0000000
## Females
## 0.0000000
## Female Sailor
## 0.0000000
## Female singer
## 0.0000000
## Female Staffer
## 0.0000000
## Female voice
## 0.0000000
## Female Voice
## 0.0000000
## Ferrari
## 0.0000000
## Fiancée
## 0.0000000
## Field Reporter
## 0.0000000
## Field Reporter 1
## 0.0000000
## Field Reporter 2
## 0.0000000
## Field Reporter 3
## 0.0000000
## Fields
## 0.0000000
## Fieldy
## 0.0000000
## Fifth Grader
## 0.0000000
## Fifth Graders
## 0.0000000
## Figure 1
## 0.0000000
## Fillmore
## 0.0000000
## Fillmore and Friend
## 0.0000000
## Filmore
## 0.0000000
## Filmore*
## 0.0000000
## Filmore's Supporters
## 0.0000000
## Fingerbang
## 0.0000000
## Finland
## 0.0000000
## Fire Captain
## 0.0000000
## Fire Chief
## 0.0000000
## Firefighter
## 0.0000000
## Fireman
## 0.0000000
## Fireman 1
## 0.0000000
## Fireman 2
## 0.0000000
## Fireman 3
## 0.0000000
## Fire Marshal
## 0.0000000
## Firkle
## 0.0000000
## First Mate
## 0.0000000
## Fisherman
## 0.0000000
## Flannagan
## 0.0000000
## Fleetwood Mac
## 0.0000000
## Flight attendant
## 0.0000000
## Flight Attendant
## 0.0000000
## Flight Attendant 1
## 0.0000000
## Flight Attendant 2
## 0.0000000
## Flight Attendant 3
## 0.0000000
## Floating Man
## 0.0000000
## Flora
## 0.0000000
## Florence
## 0.0000000
## Foley
## 0.0000000
## Followers
## 0.0000000
## Fonzie
## 0.0000000
## Foofa
## 0.0000000
## Foreman
## 0.0000000
## Formena
## 0.0000000
## Former Coach
## 0.0000000
## Fosse
## 0.0000000
## FOX 11 Anchor
## 0.0000000
## FOX President
## 0.0000000
## Foxy
## 0.0000000
## Frakes
## 0.0000000
## France
## 0.0000000
## Frances
## 0.0000000
## Francis
## 0.0000000
## Francis Ford Coppola
## 0.0000000
## Frank
## 0.0000000
## Frankenstein Alien
## 0.0000000
## Frank Hammond
## 0.0000000
## Franklin
## 0.0000000
## Frank Sinatra
## 0.0000000
## Frans
## 0.0000000
## Frat Boy 1
## 0.0000000
## Frat Boy 2
## 0.0000000
## Frat Boy 3
## 0.0000000
## Frat Boys
## 0.0000000
## Freddy Krueger
## 0.0000000
## Frederick
## 0.0000000
## Fred Savage
## 0.0000000
## French Canadians
## 0.0000000
## French Captain
## 0.0000000
## French Cardinal
## 0.0000000
## French Delegate
## 0.0000000
## Frida
## 0.0000000
## Fr. Maxi
## 0.0000000
## Frog King
## 0.0000000
## Front Desk Officer
## 0.0000000
## Frothgar
## 0.0000000
## Fuhrman
## 0.0000000
## Funbot
## 0.0000000
## Funnybot
## 0.0000000
## Future Butters
## 0.0000000
## Future Cartman
## 0.0000000
## Future Stan
## 0.0000000
## Gabriel
## 0.0000000
## Gacy
## 0.0000000
## Gail
## 0.0000000
## Galeed
## 0.0000000
## Gambler 1
## 0.0000000
## Gambler 2
## 0.0000000
## Gambler 3
## 0.0000000
## Gambler 4
## 0.0000000
## Game Voice
## 0.0000000
## Gandalf
## 0.0000000
## Gang Members
## 0.0000000
## Ganz
## 0.0000000
## Gardener
## 0.0000000
## Garrison
## 0.0000000
## Garrison 1
## 0.0000000
## Garrison 2
## 0.0000000
## Garrison Actor
## 0.0000000
## Garrison's profile
## 0.0000000
## Garth
## 0.0000000
## Gary
## 0.0000000
## Gary Coleman
## 0.0000000
## Gary Condit
## 0.0000000
## Gary Johnson's profile
## 0.0000000
## Gary Nelson
## 0.0000000
## Gary Sr
## 0.0000000
## Gary Sr.
## 0.0000000
## Gary Sr., Karen
## 0.0000000
## Gas Mask PeTA Member
## 0.0000000
## Gates
## 0.0000000
## Gavin
## 0.0000000
## Gay Lion
## 0.0000000
## Geddy Lee
## 0.0000000
## Geldon
## 0.0000000
## Gelgamek Cardinal
## 0.0000000
## Gene
## 0.0000000
## General
## 0.0000000
## General Disarray
## 0.0000000
## General Tso
## 0.0000000
## Gene Siskel
## 0.0000000
## Geoff
## 0.0000000
## Geoff Hamill
## 0.0000000
## Geologist 1
## 0.0000000
## Geologist 2
## 0.0000000
## George Bailey
## 0.0000000
## George Burns
## 0.0000000
## George Bush
## 0.0000000
## George Lucas
## 0.0000000
## George Zimmerman
## 0.0000000
## Gerald
## 0.0000000
## Gerald and Sheila
## 0.0000000
## Gerald Broflovski
## 0.0000000
## Gerald/Chris
## 0.0000000
## Gerald, Kyle
## 0.0000000
## Geraldo
## 0.0000000
## Gerald, Sheila
## 0.0000000
## German 1
## 0.0000000
## German 2
## 0.0000000
## Germany
## 0.0000000
## Gerry
## 0.0000000
## Gerry's Daughters
## 0.0000000
## Ghandi
## 0.0000000
## Ghetto Avenue Boys
## 0.0000000
## Ghost
## 0.0000000
## Ghost 2
## 0.0000000
## Giant Douche
## 0.0000000
## Gil
## 0.0000000
## Ginger 1
## 0.0000000
## Ginger 2
## 0.0000000
## Ginger 3
## 0.0000000
## Ginger 4
## 0.0000000
## Ginger Boy
## 0.0000000
## Ginger Boy 2
## 0.0000000
## Ginger Girl
## 0.0000000
## Gingers
## 0.0000000
## Gino
## 0.0000000
## Girl
## 0.0000000
## Girl 1
## 0.0000000
## Girl 2
## 0.0000000
## Girl 2's Father
## 0.0000000
## Girl 3
## 0.0000000
## Girlfriend
## 0.0000000
## Girl in O T-shirt
## 0.0000000
## Girl in Pink
## 0.0000000
## Girl In Pink
## 0.0000000
## Girl in Puppy T-shirt
## 0.0000000
## Girls
## 0.0000000
## Girls' Table
## 0.0000000
## Girl with Blue Vest
## 0.0000000
## Girl with Brown Coat
## 0.0000000
## Glen
## 0.0000000
## Glen Dumont
## 0.0000000
## Glinda
## 0.0000000
## Gloria Allred
## 0.0000000
## Gnome
## 0.0000000
## Gnome 1
## 0.0000000
## Gnome 2
## 0.0000000
## Gnome 3
## 0.0000000
## Gnome 4
## 0.0000000
## Gnome 5
## 0.0000000
## Gnomes
## 0.0000000
## Goat
## 0.0000000
## Goateed man
## 0.0000000
## Goat leader
## 0.0000000
## God
## 0.0000000
## Goodell
## 0.0000000
## Goodly
## 0.0000000
## Gordon
## 0.0000000
## Gordon Stoltski
## 0.0000000
## Goths
## 0.0000000
## Goth Voice
## 0.0000000
## Governor
## 0.0000000
## Gram'ma
## 0.0000000
## Grammy
## 0.0000000
## Grampa
## 0.0000000
## Grandma
## 0.0000000
## Grandmama
## 0.0000000
## Grandma Marsh's profile
## 0.0000000
## Grandma Obama
## 0.0000000
## Grandmother Mother
## 0.0000000
## Grandpa
## 0.0000000
## Grandpa Marvin
## 0.0000000
## Grant
## 0.0000000
## Gray Hare
## 0.0000000
## Great-Great-Grampa
## 0.0000000
## Greeley Batter
## 0.0000000
## Greeley Man
## 0.0000000
## Greeley Officer 1
## 0.0000000
## Greeley Officer 2
## 0.0000000
## Greeley Officer 3
## 0.0000000
## Greeley Team
## 0.0000000
## Greenfield
## 0.0000000
## Greeter
## 0.0000000
## Greg Nimins
## 0.0000000
## Gretchen
## 0.0000000
## Grey Hat
## 0.0000000
## Grizzled Man
## 0.0000000
## Groundskeeper
## 0.0000000
## Group
## 0.0000000
## Groupie
## 0.0000000
## GRRM
## 0.0000000
## GS-401
## 0.0000000
## Guard
## 0.0000000
## Guard 1
## 0.0000000
## Guard 2
## 0.0000000
## Guard 3
## 0.0000000
## Guard 4
## 0.0000000
## Guard 5
## 0.0000000
## Guard 6
## 0.0000000
## Guard 7
## 0.0000000
## Guard 8
## 0.0000000
## Guard 9
## 0.0000000
## Guard on Right
## 0.0000000
## Guest
## 0.0000000
## Guest 1
## 0.0000000
## Guest 2
## 0.0000000
## Guest 3
## 0.0000000
## Guest 4
## 0.0000000
## Guests
## 0.0000000
## Guests in line
## 0.0000000
## Guest Speaker
## 0.0000000
## Guide
## 0.0000000
## Guide 1
## 0.0000000
## Gunsmith
## 0.0000000
## Guy 1
## 0.0000000
## Guy 2
## 0.0000000
## Guy Fieri
## 0.0000000
## Guy in Audience
## 0.0000000
## Guy in flat top
## 0.0000000
## Guy in Leather Jacket
## 0.0000000
## Guy with Long Hair
## 0.0000000
## Hackman
## 0.0000000
## Halfy
## 0.0000000
## Hall Monitor
## 0.0000000
## Haman
## 0.0000000
## Hamlet
## 0.0000000
## Hammerhead Man
## 0.0000000
## Hancock
## 0.0000000
## Hankey Elf
## 0.0000000
## Hansen
## 0.0000000
## Hard Candy
## 0.0000000
## Hare 1
## 0.0000000
## Hare 2
## 0.0000000
## Hare 3
## 0.0000000
## Hare 4
## 0.0000000
## Hare 5
## 0.0000000
## Hare 6
## 0.0000000
## Hare 7
## 0.0000000
## Hares
## 0.0000000
## Harold
## 0.0000000
## Harris
## 0.0000000
## Harrison Moore
## 0.0000000
## Harry
## 0.0000000
## Harvey Brown
## 0.0000000
## Hasselback
## 0.0000000
## Hat McCollough
## 0.0000000
## Hatoyama
## 0.0000000
## Hazmat man
## 0.0000000
## HazMat official
## 0.0000000
## HBC President
## 0.0000000
## HBC Reporter
## 0.0000000
## HC Driver 1
## 0.0000000
## HC Driver 2
## 0.0000000
## HC Driver 3
## 0.0000000
## HC Driver 4
## 0.0000000
## HC Driver 5
## 0.0000000
## HC Driver 6
## 0.0000000
## HC Driver 7
## 0.0000000
## HC drivers
## 0.0000000
## Head
## 0.0000000
## Head Adventurer
## 0.0000000
## Head Agent
## 0.0000000
## Head Baker
## 0.0000000
## Head Concierge
## 0.0000000
## Headless Horseman
## 0.0000000
## Head nurse
## 0.0000000
## Head of Programming
## 0.0000000
## Head of Public Safety
## 0.0000000
## Head Scoutmaster
## 0.0000000
## Head Waiter
## 0.0000000
## Heather
## 0.0000000
## Heidi
## 0.0000000
## Heidi, Millie
## 0.0000000
## Heidi's Mom
## 0.0000000
## Helen
## 0.0000000
## Hell Director
## 0.0000000
## Hemorrhoid
## 0.0000000
## Henchman
## 0.0000000
## Henrietta
## 0.0000000
## Henrietta's Mom
## 0.0000000
## Herbert Garrison
## 0.0000000
## Her Blossom
## 0.0000000
## Her crotch
## 0.0000000
## Hildog Fan
## 0.0000000
## Hillary
## 0.0000000
## Hillary Clinton
## 0.0000000
## Hippie
## 0.0000000
## Hippie 1
## 0.0000000
## Hippie 2
## 0.0000000
## Hippie 3
## 0.0000000
## Hippie 4
## 0.0000000
## Hippie 5
## 0.0000000
## Hippie 6
## 0.0000000
## Hippies
## 0.0000000
## Hippies and Kyle
## 0.0000000
## His Date
## 0.0000000
## Hispanic Reporter
## 0.0000000
## Hitler
## 0.0000000
## Ho
## 0.0000000
## Hobo
## 0.0000000
## Hockey Player
## 0.0000000
## Hollis
## 0.0000000
## Homeless Advisor
## 0.0000000
## Homeowner
## 0.0000000
## Honey Boo Boo
## 0.0000000
## Hooded Figure
## 0.0000000
## Hooker
## 0.0000000
## Hopkins
## 0.0000000
## Horace
## 0.0000000
## Horatio
## 0.0000000
## Host
## 0.0000000
## Host 1
## 0.0000000
## Host 2
## 0.0000000
## HotForBoys219
## 0.0000000
## Hotline Man
## 0.0000000
## Hotline Voice
## 0.0000000
## House
## 0.0000000
## Howard
## 0.0000000
## Howard Stern
## 0.0000000
## Huddle
## 0.0000000
## Hula Dancers
## 0.0000000
## Human Kite
## 0.0000000
## Human Wendy
## 0.0000000
## Husband
## 0.0000000
## Hyde
## 0.0000000
## Icarus
## 0.0000000
## Iggy
## 0.0000000
## Iggy's Ass
## 0.0000000
## Ike
## 0.0000000
## Ike Supporter
## 0.0000000
## Incredibly Obese Black Man
## 0.0000000
## Indian 1
## 0.0000000
## Indian Ambassador
## 0.0000000
## Indian Chief
## 0.0000000
## Indiglo Girls singer
## 0.0000000
## Individual in crowd
## 0.0000000
## Inductee
## 0.0000000
## Inductee 1
## 0.0000000
## Inductee 2
## 0.0000000
## Inductees
## 0.0000000
## Indy
## 0.0000000
## Injured Man
## 0.0000000
## Inmate
## 0.0000000
## Inmates
## 0.0000000
## Installer
## 0.0000000
## Instructor
## 0.0000000
## Instructors
## 0.0000000
## Intruder
## 0.0000000
## Iraqi
## 0.0000000
## Iraqi General
## 0.0000000
## Iraqi Man 1
## 0.0000000
## Iraqi Man 2
## 0.0000000
## Iron Maiden
## 0.0000000
## Ishmael
## 0.0000000
## Isiah
## 0.0000000
## ISIS Spokesman
## 0.0000000
## Israeli
## 0.0000000
## Israeli 2
## 0.0000000
## Italian Cardinal
## 0.0000000
## Italy
## 0.0000000
## Jabs
## 0.0000000
## Jack
## 0.0000000
## Jack Brolin
## 0.0000000
## Jacqueline
## 0.0000000
## Jada Pinkett Smith
## 0.0000000
## Jai
## 0.0000000
## Jakartha
## 0.0000000
## Jake
## 0.0000000
## Jakov
## 0.0000000
## Jakovasaur
## 0.0000000
## Jakovasaur Boy
## 0.0000000
## Jakovasaur Girl
## 0.0000000
## Jakovasaur Kid 1
## 0.0000000
## Jakovasaur Kid 2
## 0.0000000
## Jakovasaur Kid 3
## 0.0000000
## Jakovasaur Kid 4
## 0.0000000
## Jakovasaur Kid 5
## 0.0000000
## Jakovasaurs
## 0.0000000
## Jambu
## 0.0000000
## James Cameron
## 0.0000000
## James Hetfield
## 0.0000000
## James Taylor
## 0.0000000
## Jamie
## 0.0000000
## Jamie Oliver
## 0.0000000
## Janet
## 0.0000000
## Janet Reno
## 0.0000000
## Janitor
## 0.0000000
## Janitor 2
## 0.0000000
## Janitor/Farmer 1
## 0.0000000
## Japan
## 0.0000000
## Japanese Delegate
## 0.0000000
## Japanese Man 1
## 0.0000000
## Japanese Man 2
## 0.0000000
## Japanese Man 3
## 0.0000000
## Japanese Man 4
## 0.0000000
## Japanese Man 5
## 0.0000000
## Japanese Pilot
## 0.0000000
## Japanese Sailor
## 0.0000000
## Japanese woman
## 0.0000000
## Japanese Woman
## 0.0000000
## Jared
## 0.0000000
## Jared Fogle
## 0.0000000
## Jarvis
## 0.0000000
## Jason
## 0.0000000
## Jason, Craig, Tweek, Token
## 0.0000000
## Jason Voorhees
## 0.0000000
## Jay
## 0.0000000
## Jay Leno
## 0.0000000
## Jeff
## 0.0000000
## Jeff Arrando
## 0.0000000
## Jefferson
## 0.0000000
## Jeff Gordon
## 0.0000000
## Jeffrey
## 0.0000000
## Jeffrey Maynard
## 0.0000000
## Jeff VanVonderen
## 0.0000000
## Jeff White
## 0.0000000
## Jenkins
## 0.0000000
## Jennifer Lopez
## 0.0000000
## Jenny
## 0.0000000
## Jenny, Mark
## 0.0000000
## Jenny's Mother
## 0.0000000
## Jerry
## 0.0000000
## Jerry Jones
## 0.0000000
## Jerry Sanders
## 0.0000000
## Jersey Man
## 0.0000000
## Jersey Man 2
## 0.0000000
## Jersey People
## 0.0000000
## Jersey Woman
## 0.0000000
## Jesse Jackson
## 0.0000000
## Jessica
## 0.0000000
## Jessica's Mom
## 0.0000000
## Jessie
## 0.0000000
## Jesus
## 0.0000000
## Jesus' Producer
## 0.0000000
## Jill
## 0.0000000
## Jim
## 0.0000000
## Jimbo
## 0.0000000
## Jimbo Kern
## 0.0000000
## Jimbo, Ned
## 0.0000000
## Jim Brown-ish
## 0.0000000
## Jim Irsay
## 0.0000000
## Jim Lehrer
## 0.0000000
## Jimmie Johnson
## 0.0000000
## Jimmy
## 0.0000000
## Jimmy Buffet
## 0.0000000
## Jimmy Buffett
## 0.0000000
## Jimmy Kimmel
## 0.0000000
## Jim Rome
## 0.0000000
## Jinbo
## 0.0000000
## Jo
## 0.0000000
## Joanie
## 0.0000000
## Joanie Cunningham
## 0.0000000
## Joe
## 0.0000000
## Joe Jonas
## 0.0000000
## Joe Strummer
## 0.0000000
## Jogger
## 0.0000000
## John
## 0.0000000
## John Cena
## 0.0000000
## John Edward
## 0.0000000
## John Elway
## 0.0000000
## John Garner
## 0.0000000
## Johnny
## 0.0000000
## Johnny Knoxville
## 0.0000000
## John Ramsey
## 0.0000000
## Johnson
## 0.0000000
## John Travolta
## 0.0000000
## John Walsh
## 0.0000000
## John Warzog
## 0.0000000
## Joint
## 0.0000000
## Joline
## 0.0000000
## Jonas Brothers
## 0.0000000
## Jonathan
## 0.0000000
## Jonesy
## 0.0000000
## Joozian 1
## 0.0000000
## Joozian 2
## 0.0000000
## Jordan
## 0.0000000
## Joseph
## 0.0000000
## Joseph Smith
## 0.0000000
## Josh
## 0.0000000
## Judge
## 0.0000000
## Judge 1
## 0.0000000
## Judge 2
## 0.0000000
## Judge 3
## 0.0000000
## Judge 4
## 0.0000000
## Judge Julie
## 0.0000000
## Judge Moses
## 0.0000000
## Jukebox
## 0.0000000
## Junichi
## 0.0000000
## Junjun
## 0.0000000
## Justin Bieber
## 0.0000000
## K-10
## 0.0000000
## Kal
## 0.0000000
## Kale
## 0.0000000
## Kansas
## 0.0000000
## Kanye
## 0.0000000
## Kanye (backup singers)
## 0.0000000
## Kanye West
## 0.0000000
## Karen
## 0.0000000
## Karin
## 0.0000000
## Karl Rove
## 0.0000000
## Katherine
## 0.0000000
## Kathie Lee
## 0.0000000
## Katie
## 0.0000000
## Keenan
## 0.0000000
## Kelly
## 0.0000000
## Kelly Menskin
## 0.0000000
## Kelly Pinkertonstinfurter
## 0.0000000
## Kelly Rutherfordmenskin
## 0.0000000
## Kenny
## 0.0000000
## Kenny G
## 0.0000000
## Kenny G.
## 0.0000000
## Kenny's Mom
## 0.0000000
## Kenny, Stan
## 0.0000000
## Kenny, Stan, Cartman
## 0.0000000
## Kenya
## 0.0000000
## Kevern Zaksor
## 0.0000000
## Kevin
## 0.0000000
## Kevin Donahue's profile
## 0.0000000
## Kevin Harris
## 0.0000000
## Kevin Jonas
## 0.0000000
## KFC Exec
## 0.0000000
## Kid
## 0.0000000
## Kid 1
## 0.0000000
## Kid 2
## 0.0000000
## Kid #2
## 0.0000000
## Kid 3
## 0.0000000
## Kid 4
## 0.0000000
## Kid 5
## 0.0000000
## Kid Magician
## 0.0000000
## Kids
## 0.0000000
## Kids around Kenny
## 0.0000000
## Kids around Timmy
## 0.0000000
## Kids at Finish Line
## 0.0000000
## Kids, Chef
## 0.0000000
## Kids in Class
## 0.0000000
## Kid's Mom
## 0.0000000
## Kim
## 0.0000000
## Kindergarten boy
## 0.0000000
## Kindergartner
## 0.0000000
## Kindergartners
## 0.0000000
## Kindergoth
## 0.0000000
## King
## 0.0000000
## King Claudius
## 0.0000000
## Kip
## 0.0000000
## Kip's Dad
## 0.0000000
## Kip's Mom
## 0.0000000
## KIT-9
## 0.0000000
## Kitty
## 0.0000000
## KKK Leader
## 0.0000000
## KKK Members
## 0.0000000
## Kobe Bryant
## 0.0000000
## Korashki
## 0.0000000
## KoRn
## 0.0000000
## Kris
## 0.0000000
## Krishna
## 0.0000000
## Kurt Loder
## 0.0000000
## Kurt Russell
## 0.0000000
## Kurt's hologram
## 0.0000000
## Kyan
## 0.0000000
## Kyle
## 0.4212606
## Kyle.
## 0.0000000
## Kyle 1
## 0.0000000
## Kyle Broflovski
## 0.0000000
## Kyle, Butters
## 0.0000000
## Kyle, Butters, Tweek
## 0.0000000
## Kyle, Cartman
## 0.0000000
## Kyle/Cartman
## 0.0000000
## Kyle, Kenny
## 0.0000000
## Kyle, Ms. Crabtree
## 0.0000000
## Kyles
## 0.0000000
## Kyle Schwartz
## 0.0000000
## Kyle's Side
## 0.0000000
## Kyle, Stan
## 0.0000000
## Kyle/Stan
## 0.0000000
## Kyle, Stan, Butters
## 0.0000000
## Kyle, Stan, Cartman
## 0.0000000
## Kyle's Team
## 0.0000000
## Kyle, Towelie
## 0.0000000
## Kyle Two
## 0.0000000
## Kylie
## 0.0000000
## Kylie's Mom
## 0.0000000
## Laborer 1
## 0.0000000
## Laborer 2
## 0.0000000
## Laborer 3
## 0.0000000
## Laborer 4
## 0.0000000
## Laborer 5
## 0.0000000
## Laborers
## 0.0000000
## Lab Tech
## 0.0000000
## Lab Tech 1
## 0.0000000
## Lab Tech 2
## 0.0000000
## Lab Tech 3
## 0.0000000
## Ladies
## 0.0000000
## Lady
## 0.0000000
## Lady 1
## 0.0000000
## Lady 2
## 0.0000000
## Lady Judge
## 0.0000000
## Lady Member
## 0.0000000
## Lady Member 2
## 0.0000000
## Lady Protester
## 0.0000000
## Laertes
## 0.0000000
## Lamb Chop
## 0.0000000
## Lambtor
## 0.0000000
## Lambtron
## 0.0000000
## Lamond
## 0.0000000
## Lamont
## 0.0000000
## Landlord
## 0.0000000
## Lao Tse
## 0.0000000
## Lao Tzu
## 0.0000000
## Large Crip
## 0.0000000
## Larger Group
## 0.0000000
## Large woman
## 0.0000000
## Large Woman
## 0.0000000
## Larry
## 0.0000000
## Larry King
## 0.0000000
## Lars
## 0.0000000
## Larsen
## 0.0000000
## Larson
## 0.0000000
## Lars Ulrich
## 0.0000000
## Latino Protesters
## 0.0000000
## Laura
## 0.0000000
## Laura Tucker
## 0.0000000
## Lawrence
## 0.0000000
## Lawyer
## 0.0000000
## Layman
## 0.0000000
## Lead Agent
## 0.0000000
## Lead Agent Collins
## 0.0000000
## Lead Alien
## 0.0000000
## Lead Biker
## 0.0000000
## Lead Convict
## 0.0000000
## Leader
## 0.0000000
## Leader Turkey
## 0.0000000
## Lead FBI agent
## 0.0000000
## Lead Ginger
## 0.0000000
## Lead Knight
## 0.0000000
## Lead Referee
## 0.0000000
## Lead Scientist
## 0.0000000
## Lead Screener
## 0.0000000
## Lead Soldier
## 0.0000000
## Lead tech
## 0.0000000
## Lead Vampire
## 0.0000000
## Leeroy
## 0.0000000
## Left
## 0.0000000
## Left Breast
## 0.0000000
## Left Creature
## 0.0000000
## Legless Boy
## 0.0000000
## Lenora
## 0.0000000
## Leonard Maltin
## 0.0000000
## Leonardo DiCaprio
## 0.0000000
## Leprechaun
## 0.0000000
## Leroy
## 0.0000000
## Lesbian 10
## 0.0000000
## Lesbian 11
## 0.0000000
## Lesbian 4
## 0.0000000
## Lesbian 5
## 0.0000000
## Lesbian 6
## 0.0000000
## Lesbian 7
## 0.0000000
## Lesbian 8
## 0.0000000
## Lesbian 9
## 0.0000000
## Lesbians
## 0.0000000
## Les Claypool
## 0.0000000
## Leslie
## 0.0000000
## Lexus
## 0.0000000
## Liane
## 0.0000000
## Liane and Cartman
## 0.0000000
## Liane and Eric
## 0.0000000
## Librarian
## 0.0000000
## Lice
## 0.0000000
## Lieutenant
## 0.0000000
## Lift Operator
## 0.0000000
## Lil Kathie Lee
## 0.0000000
## Lil Kim
## 0.0000000
## Lil Mr. Garrison
## 0.0000000
## Lincoln
## 0.0000000
## Linda
## 0.0000000
## Linda Black
## 0.0000000
## Linda Stotch
## 0.0000000
## Line Ride Operator
## 0.0000000
## Lion 1
## 0.0000000
## Lion 2
## 0.0000000
## Lion Cub 1
## 0.0000000
## Lion Cub 2
## 0.0000000
## Lion Cub 3
## 0.0000000
## Lion-head Alien
## 0.0000000
## Lisa
## 0.0000000
## Little Boy
## 0.0000000
## Little Chef
## 0.0000000
## Little Girl
## 0.0000000
## Little Slave
## 0.0000000
## Little Vamp
## 0.0000000
## Loa Tse
## 0.0000000
## Local Announcer 1
## 0.0000000
## Lois
## 0.0000000
## Lola
## 0.0000000
## Lola, Jenny, Red, and Wendy
## 0.0000000
## Lollipop King
## 0.0000000
## Lolly
## 0.0000000
## Loogie
## 0.0000000
## Looter 1
## 0.0000000
## Looter 2
## 0.0000000
## Looter 3
## 0.0000000
## Looter 4
## 0.0000000
## Lorraine
## 0.0000000
## Lou
## 0.0000000
## Louse 1
## 0.0000000
## Louse 10
## 0.0000000
## Louse 11
## 0.0000000
## Louse 12
## 0.0000000
## Louse 13
## 0.0000000
## Louse 2
## 0.0000000
## Louse 3
## 0.0000000
## Louse 4
## 0.0000000
## Louse 5
## 0.0000000
## Louse 6
## 0.0000000
## Louse 7
## 0.0000000
## Louse 8
## 0.0000000
## Louse 9
## 0.0000000
## Lowes Pit Boss
## 0.0000000
## LSX Reporter
## 0.0000000
## Lt. Nelson
## 0.0000000
## Lucas
## 0.0000000
## Lucy
## 0.0000000
## Luke
## 0.0000000
## Luke Skywalker
## 0.0000000
## Lumberjack
## 0.0000000
## M
## 0.0000000
## Ma'am
## 0.0000000
## Mackey
## 0.0000000
## Madame Foreperson
## 0.0000000
## Madman
## 0.0000000
## Madonna
## 0.0000000
## Maggie
## 0.0000000
## Magic
## 0.0000000
## Magician
## 0.0000000
## Mailman
## 0.0000000
## Mailman and Kids
## 0.0000000
## Maintenance Guy
## 0.0000000
## Maitre D
## 0.0000000
## Male
## 0.0000000
## Male 1
## 0.0000000
## Male 2
## 0.0000000
## Male Activist
## 0.0000000
## Male Aide
## 0.0000000
## Male Anchor
## 0.0000000
## Male Counselor
## 0.0000000
## Male CPS Agent
## 0.0000000
## Male Crew 1
## 0.0000000
## Male Diner
## 0.0000000
## Male Guest
## 0.0000000
## Male hippie
## 0.0000000
## Male Host
## 0.0000000
## Male Louse
## 0.0000000
## Male Member
## 0.0000000
## Male Nurse
## 0.0000000
## Male passenger
## 0.0000000
## Male Psychic 1
## 0.0000000
## Male Psychic 2
## 0.0000000
## Males
## 0.0000000
## Male Sailor 1
## 0.0000000
## Male Sailor 2
## 0.0000000
## Male Staffer
## 0.0000000
## Male voice
## 0.0000000
## Male Voice
## 0.0000000
## Mall Bunny
## 0.0000000
## Mall Hankey
## 0.0000000
## Mama
## 0.0000000
## Mamsie
## 0.0000000
## Man
## 0.0000000
## Man 1
## 0.0000000
## Man 10
## 0.0000000
## Man 11
## 0.0000000
## Man 12
## 0.0000000
## Man 13
## 0.0000000
## Man 14
## 0.0000000
## Man 15
## 0.0000000
## Man 16
## 0.0000000
## Man 17
## 0.0000000
## Man 18
## 0.0000000
## Man 19
## 0.0000000
## Man 2
## 0.0000000
## Man 20
## 0.0000000
## Man 21
## 0.0000000
## Man 22
## 0.0000000
## Man 23
## 0.0000000
## Man 24
## 0.0000000
## Man 25
## 0.0000000
## Man 26
## 0.0000000
## Man 27
## 0.0000000
## Man 28
## 0.0000000
## Man 29
## 0.0000000
## Man 2 in Crowd
## 0.0000000
## Man 2, Woman 2
## 0.0000000
## Man 3
## 0.0000000
## Man 30
## 0.0000000
## Man 31
## 0.0000000
## Man 32
## 0.0000000
## Man 4
## 0.0000000
## Man 5
## 0.0000000
## Man 6
## 0.0000000
## Man 7
## 0.0000000
## Man 8
## 0.0000000
## Man 9
## 0.0000000
## Manager
## 0.0000000
## ManBearPig
## 0.0000000
## Mandy
## 0.0000000
## Man in audience
## 0.0000000
## Man in Back
## 0.0000000
## Man in background
## 0.0000000
## Man in Barrel
## 0.0000000
## Man in briefs
## 0.0000000
## Man in Brown Shirt
## 0.0000000
## Man in crowd
## 0.0000000
## Man in Crowd
## 0.0000000
## Man in foreground
## 0.0000000
## Man In Middle
## 0.0000000
## Man in Shorts
## 0.0000000
## Man in Vest
## 0.0000000
## Man in Wheelchair
## 0.0000000
## Man In Wheelchair
## 0.0000000
## Man In Yellow Jacket
## 0.0000000
## Manning
## 0.0000000
## Man On Crutches
## 0.0000000
## Man on Porto Potty
## 0.0000000
## Manson
## 0.0000000
## Manuel
## 0.0000000
## Man with Afro
## 0.0000000
## Man with Foot on Head
## 0.0000000
## Man With Grey Hair
## 0.0000000
## Man with Mustache
## 0.0000000
## Man With No Face
## 0.0000000
## Man with No Limbs
## 0.0000000
## Man With No Limbs
## 0.0000000
## Man With Picket Sign
## 0.0000000
## Man with Terrible Skin Condition
## 0.0000000
## Many Men
## 0.0000000
## Manymoons
## 0.0000000
## Marc
## 0.0000000
## Marcia
## 0.0000000
## Marcus
## 0.0000000
## Marilyn Manson
## 0.0000000
## Marine
## 0.0000000
## Mark
## 0.0000000
## Mark, Jenny
## 0.0000000
## Marklar
## 0.0000000
## Marklar dispatcher
## 0.0000000
## Marklar Leader
## 0.0000000
## Marksman
## 0.0000000
## Marsha
## 0.0000000
## Marsh Family
## 0.0000000
## Martha
## 0.0000000
## Martha Stewart
## 0.0000000
## Martin
## 0.0000000
## Marty
## 0.0000000
## Marvin
## 0.0000000
## Marvin Marsh
## 0.0000000
## Mary
## 0.0000000
## Master
## 0.0000000
## Matt
## 0.0000000
## Matthew
## 0.0000000
## Matthew McConaughey
## 0.0000000
## Matt Lauer
## 0.0000000
## Matt Stone
## 0.0000000
## Maury
## 0.0000000
## Mayor
## 0.0000000
## Mayor McDaniels
## 0.0000000
## Mayor McDaniels.
## 0.0000000
## MC
## 0.0000000
## M.C
## 0.0000000
## M. C.
## 0.0000000
## M.C.
## 0.0000000
## McCain
## 0.0000000
## McCain, Obama
## 0.0000000
## McCormick Parents
## 0.0000000
## McDaniels
## 0.0000000
## McDonald's Exec
## 0.0000000
## McGee-zax
## 0.0000000
## McGillicuddy
## 0.0000000
## McGuire
## 0.0000000
## Meat Loaf
## 0.0000000
## Mechanic
## 0.0000000
## Mediator
## 0.0000000
## Medic
## 0.0000000
## Medicine Man
## 0.0000000
## Megan
## 0.0000000
## Mel
## 0.0000000
## Mel Gibson
## 0.0000000
## Melissa
## 0.0000000
## Melita
## 0.0000000
## Melvin 1
## 0.0000000
## Melvin 2
## 0.0000000
## Melvin 3
## 0.0000000
## Melvin 4
## 0.0000000
## Melvins
## 0.0000000
## Member
## 0.0000000
## Member 1
## 0.0000000
## Member 2
## 0.0000000
## Member 3
## 0.0000000
## Member 4
## 0.0000000
## Member 5
## 0.0000000
## Member 6
## 0.0000000
## Member 7
## 0.0000000
## Members
## 0.0000000
## Men
## 0.0000000
## Mencia
## 0.0000000
## Mepehsto
## 0.0000000
## Mephesto
## 0.0000000
## Mephesto Actor
## 0.0000000
## Mephesto Tryout
## 0.0000000
## Mercedes
## 0.0000000
## Meredith
## 0.0000000
## Meredith Vieira
## 0.0000000
## Mexicans
## 0.0000000
## Michael
## 0.0000000
## Michael Bay
## 0.0000000
## Michael Buffer
## 0.0000000
## Michael Chertoff
## 0.0000000
## Michael Collins
## 0.0000000
## Michael Deets
## 0.0000000
## Michael Dorn
## 0.0000000
## Michael Douglas
## 0.0000000
## Michael Jackson
## 0.0000000
## Michael Moore
## 0.0000000
## Michael Richards
## 0.0000000
## Michael Taylor
## 0.0000000
## Michelle
## 0.0000000
## Michelle Obama
## 0.0000000
## Mick
## 0.0000000
## Mickey
## 0.0000000
## Mickey Mouse
## 0.0000000
## Middle Dwarf
## 0.0000000
## Middle Prostitute
## 0.0000000
## Middling Group
## 0.0000000
## Midget
## 0.0000000
## Midnight Vampire
## 0.0000000
## Mike
## 0.0000000
## Mike, Michael, and Pete
## 0.0000000
## Miles
## 0.0000000
## Miley Cyrus
## 0.0000000
## Miller
## 0.0000000
## Millie
## 0.0000000
## Millionaire
## 0.0000000
## Millionaire 1
## 0.0000000
## Millionaire Protesters
## 0.0000000
## Millionaires
## 0.0000000
## Milly
## 0.0000000
## Milo
## 0.0000000
## Mime
## 0.0000000
## Mimi
## 0.0000000
## Mimsy
## 0.0000000
## Miner 1
## 0.0000000
## Miner 2
## 0.0000000
## Miner 3
## 0.0000000
## Miner 4
## 0.0000000
## Mingie
## 0.0000000
## Minister
## 0.0000000
## Minister of Sports
## 0.0000000
## Minstrel
## 0.0000000
## Mint-Berry Crunch
## 0.0000000
## Miss Aliton
## 0.0000000
## Miss Information
## 0.0000000
## Miss Stevens
## 0.0000000
## Miss Stevenson
## 0.0000000
## Miss Travis
## 0.0000000
## Missy
## 0.0000000
## Mitch
## 0.0000000
## Mitch Conner
## 0.0000000
## Mitchell
## 0.0000000
## Mitch Harris
## 0.0000000
## Mitt
## 0.0000000
## MJ Hologram
## 0.0000000
## MJ's hologram
## 0.0000000
## MJ's Hologram
## 0.0000000
## M. Night Shyalaman
## 0.0000000
## Mob
## 0.0000000
## Moderator
## 0.0000000
## Mohammad
## 0.0000000
## Mohawk Vamp
## 0.0000000
## Molly
## 0.0000000
## Mom
## 0.0000000
## Mona
## 0.0000000
## Mongolian
## 0.0000000
## Monitor Man
## 0.0000000
## Monk
## 0.0000000
## Monkey
## 0.0000000
## More Voices
## 0.0000000
## Morgan
## 0.0000000
## Morgan Freeman
## 0.0000000
## Mormon 1
## 0.0000000
## Mormon 2
## 0.0000000
## Mormon 3
## 0.0000000
## Mormon 4
## 0.0000000
## Mormon 5
## 0.0000000
## Mormon 6
## 0.0000000
## Mormons
## 0.0000000
## Moroccan Cardinal
## 0.0000000
## Moroni
## 0.0000000
## Morpheus
## 0.0000000
## Mortician
## 0.0000000
## Moses
## 0.0000000
## Mosquito
## 0.0000000
## Most Senators
## 0.0000000
## Motel Clerk
## 0.0000000
## Mother
## 0.0000000
## Mother 1
## 0.0000000
## Mother 2
## 0.0000000
## Mother Lion
## 0.0000000
## Motorcycle Driver
## 0.0000000
## Motorcyclist
## 0.0000000
## Mountie
## 0.0000000
## Mouse
## 0.0000000
## Mousey
## 0.0000000
## Mover
## 0.0000000
## Moviegoer
## 0.0000000
## Mr. Adams
## 0.0000000
## Mr. Adler
## 0.0000000
## Mr. Allens
## 0.0000000
## Mr. Appleby
## 0.0000000
## Mr. Bell
## 0.0000000
## Mr. Biggle
## 0.0000000
## Mr. Billings
## 0.0000000
## Mr. Black
## 0.0000000
## Mr. Brooks
## 0.0000000
## Mr. Brown
## 0.0000000
## Mr. Casher
## 0.0000000
## Mr. Circlovich
## 0.0000000
## Mr. Connolly
## 0.0000000
## Mr. Cotswolds
## 0.0000000
## Mr. Dawkins
## 0.0000000
## Mr. Denkins
## 0.0000000
## Mr. Derp
## 0.0000000
## Mr. Donaldson
## 0.0000000
## Mr. Donovan
## 0.0000000
## Mr. Evans
## 0.0000000
## Mr. Farkle
## 0.0000000
## Mr. Farnickle
## 0.0000000
## Mr. Feegan
## 0.0000000
## Mr. Foley
## 0.0000000
## Mr. Freely
## 0.0000000
## Mr. Fun
## 0.0000000
## Mr. Garrett
## 0.0000000
## Mr Garrison
## 0.0000000
## Mr. Garrison
## 0.0000000
## Mr. Garrison Sr.
## 0.0000000
## Mr. Geiger
## 0.0000000
## Mr. Glughgogawk
## 0.0000000
## Mr. Grazier
## 0.0000000
## Mr. Gueermo
## 0.0000000
## Mr. Hakeem
## 0.0000000
## Mr. Hammerhead
## 0.0000000
## Mr. Hankey
## 0.0000000
## Mr. Hankey, Cornwallis
## 0.0000000
## Mr. Hardly
## 0.0000000
## Mr. Harris
## 0.0000000
## Mr. Harrison
## 0.0000000
## Mr. Hart
## 0.0000000
## Mr. Hat
## 0.0000000
## Mr. Hat 1
## 0.0000000
## Mr. Hat 2
## 0.0000000
## Mr. Hat Actor (!)
## 0.0000000
## Mr. Hollis
## 0.0000000
## Mr. Jabs
## 0.0000000
## Mr. Jarvis
## 0.0000000
## Mr. Jefferson
## 0.0000000
## Mr. Johnson
## 0.0000000
## Mr. Kim
## 0.0000000
## Mr. Kincade
## 0.0000000
## Mr. Kitty
## 0.0000000
## Mr. Leon
## 0.0000000
## Mr Mackey
## 0.0000000
## Mr.Mackey
## 0.0000000
## Mr. Mackey
## 0.0000000
## Mr. Mackey, Principal Victoria
## 0.0000000
## Mr. Mackey's Father
## 0.0000000
## Mr. Mathers
## 0.0000000
## Mr. Meryl
## 0.0000000
## Mr. Needlebaum
## 0.0000000
## Mr. Nelson
## 0.0000000
## Mr. Ose
## 0.0000000
## Mr. Peters
## 0.0000000
## Mr. Pirrip
## 0.0000000
## Mr. Pratt
## 0.0000000
## Mr. Sanders
## 0.0000000
## Mrs. Appleby
## 0.0000000
## Mrs. Applegate
## 0.0000000
## Mrs. Biggle
## 0.0000000
## Mrs. Brooks
## 0.0000000
## Mrs. Brown
## 0.0000000
## Mrs. Campbell
## 0.0000000
## Mrs Cartman
## 0.0000000
## Mrs. Cartman
## 0.0000000
## Mrs, Circlovich
## 0.0000000
## Mrs. Cotswolds
## 0.0000000
## Mrs. Crabtree
## 0.0000000
## Mrs. Donovan
## 0.0000000
## Mrs. Farnickle
## 0.0000000
## Mrs. Feegan
## 0.0000000
## Mrs. Garrison
## 0.0000000
## Mrs. Garrison Sr.
## 0.0000000
## Mrs. Garrsion
## 0.0000000
## Mrs. Garthunk
## 0.0000000
## Mrs. Gueermo
## 0.0000000
## Mrs. Hakeem
## 0.0000000
## Mrs. Harris
## 0.0000000
## Mrs. Hollis
## 0.0000000
## Mrs. Joe
## 0.0000000
## Mrs. Landis
## 0.0000000
## Mr. Slave
## 0.0000000
## Mrs.McCormick
## 0.0000000
## Mrs. McCormick
## 0.0000000
## Mrs. Melman
## 0.0000000
## Mrs. Miller
## 0.0000000
## Mrs. Polk
## 0.0000000
## Mrs. Sanders
## 0.0000000
## Mrs. Stevens
## 0.0000000
## Mrs. Streibel
## 0.0000000
## Mrs. Streible
## 0.0000000
## Mrs. Tenorman
## 0.0000000
## Mrs. Testaburger
## 0.0000000
## Mr. Stevens
## 0.0000000
## Mr. Stevenson
## 0.0000000
## Mr. Streible
## 0.0000000
## Mrs.Tucker
## 0.0000000
## Mrs. Tucker
## 0.0000000
## Mrs. Turner
## 0.0000000
## Mrs. Tweak
## 0.0000000
## Mrs. Tweek
## 0.0000000
## Mrs. Weatherhead
## 0.0000000
## Mrs. Wyland
## 0.0000000
## Mr. T
## 0.0000000
## Mr. Takiyama
## 0.0000000
## Mr. Tenorman
## 0.0000000
## Mr. Testaburger
## 0.0000000
## Mr. Thompson
## 0.0000000
## Mr. Torres
## 0.0000000
## Mr. Triscotti
## 0.0000000
## Mr. Tucker
## 0.0000000
## Mr. Tumnus
## 0.0000000
## Mr. Tuong
## 0.0000000
## Mr. Turner
## 0.0000000
## Mr. Tweek
## 0.0000000
## Mr. Twig
## 0.0000000
## Mr. Valmer
## 0.0000000
## Mr. Varcas
## 0.0000000
## Mr. Vladchick
## 0.0000000
## Mr. Waters
## 0.0000000
## Mr. Weatherhead
## 0.0000000
## Mr. Williams
## 0.0000000
## Mr. Wyland
## 0.0000000
## Mr. Yelman
## 0.0000000
## Ms. Choksondik
## 0.0000000
## Ms. Crabtree
## 0.0000000
## Ms. Ellen
## 0.0000000
## Ms. Garrison
## 0.0000000
## Ms. Havisham
## 0.0000000
## Ms.McCormick
## 0.0000000
## Ms. McCormick
## 0.0000000
## Ms. Sanders
## 0.0000000
## Ms. Turnod
## 0.0000000
## Ms. Williams
## 0.0000000
## Muhammad
## 0.0000000
## Munky
## 0.0000000
## Muno
## 0.0000000
## Murderin' Murphy
## 0.0000000
## Murphy
## 0.0000000
## Muscleman Marc
## 0.0000000
## Musician 2
## 0.0000000
## Musician 3
## 0.0000000
## Music Instructor
## 0.0000000
## Muslim
## 0.0000000
## Muslim 2
## 0.0000000
## Mysterion
## 0.0000000
## Mysterion, the Coon
## 0.0000000
## Nadia
## 0.0000000
## Nagix
## 0.0000000
## Naked Man
## 0.0000000
## NAMBLA leader
## 0.0000000
## NAMBLA Leader
## 0.0000000
## NAMBLA Member
## 0.0000000
## Nancy
## 0.0000000
## Nancy Kerrigan
## 0.0000000
## Narrator
## 0.0000000
## Natalie
## 0.0000000
## Nathan
## 0.0000000
## Nathan's Dad
## 0.0000000
## Nathan's Mom
## 0.0000000
## Native American Chief
## 0.0000000
## Native paddler in vest
## 0.0000000
## Natsako Semu
## 0.0000000
## NC 9 Reporter
## 0.0000000
## Ned
## 0.0000000
## Neely
## 0.0000000
## Neely, Davis
## 0.0000000
## Neighbors
## 0.0000000
## Nellie
## 0.0000000
## Nelly
## 0.0000000
## Nelson
## 0.0000000
## Neo
## 0.0000000
## Neo 2
## 0.0000000
## Nerd #1
## 0.0000000
## Nerd #2
## 0.0000000
## Network Anchor
## 0.0000000
## Network President
## 0.0000000
## Netzel
## 0.0000000
## New Cartman
## 0.0000000
## New Director
## 0.0000000
## New Kenny
## 0.0000000
## New kid
## 0.0000000
## New Mormon
## 0.0000000
## News 4 Anchor
## 0.0000000
## News 4 Reporter
## 0.0000000
## News Anchor
## 0.0000000
## News Anchor 2
## 0.0000000
## News Announcer
## 0.0000000
## Newscaster
## 0.0000000
## News Reporter
## 0.0000000
## Newt
## 0.0000000
## New Teacher
## 0.0000000
## New Yorker
## 0.0000000
## New Yorker 1
## 0.0000000
## New Yorker 2
## 0.0000000
## New Yorkers
## 0.0000000
## Nibblet
## 0.0000000
## Nichole
## 0.0000000
## Nick
## 0.0000000
## Nicki
## 0.0000000
## Nick Jabs
## 0.0000000
## Nick Jonas
## 0.0000000
## Nick Nolte
## 0.0000000
## Nicole
## 0.0000000
## Nicole, Lola, Annie
## 0.0000000
## Niles
## 0.0000000
## Ninja 1
## 0.0000000
## Ninja 2
## 0.0000000
## Nobunaga
## 0.0000000
## Numa Numa
## 0.0000000
## Numa Numa Guy
## 0.0000000
## Number 17
## 0.0000000
## Number 24
## 0.0000000
## Number 37
## 0.0000000
## Nun
## 0.0000000
## Nurse
## 0.0000000
## Nurse 1
## 0.0000000
## Nurse 2
## 0.0000000
## Nurse Bronski
## 0.0000000
## Nurse Gollum
## 0.0000000
## Nurse Goodly
## 0.0000000
## Nut Gobbler
## 0.0000000
## Obama
## 0.0000000
## Obese Lady
## 0.0000000
## Obese Man
## 0.0000000
## Obese Man 2
## 0.0000000
## Obese woman
## 0.0000000
## Obese Woman
## 0.0000000
## OC
## 0.0000000
## Occupant
## 0.0000000
## OC Girl
## 0.0000000
## OC Leader
## 0.0000000
## OC Member
## 0.0000000
## OC Member 1
## 0.0000000
## OC Member 2
## 0.0000000
## OC Member 3
## 0.0000000
## OC Members
## 0.0000000
## Odd Boy
## 0.0000000
## Officer
## 0.0000000
## Officer 1
## 0.0000000
## Officer 10
## 0.0000000
## Officer 2
## 0.0000000
## Officer 3
## 0.0000000
## Officer 4
## 0.0000000
## Officer 5
## 0.0000000
## Officer 6
## 0.0000000
## Officer 7
## 0.0000000
## Officer 8
## 0.0000000
## Officer 9
## 0.0000000
## Officer Barbardy
## 0.0000000
## Officer Barbrady
## 0.0000000
## Officer Bob
## 0.0000000
## Officer Harris
## 0.0000000
## Officers
## 0.0000000
## Official
## 0.0000000
## Official 1
## 0.0000000
## Official 2
## 0.0000000
## Official 3
## 0.0000000
## Ohrlich
## 0.0000000
## O.J. Simpson
## 0.0000000
## Old Cap
## 0.0000000
## Older Boy
## 0.0000000
## Older brother
## 0.0000000
## Older Daughter
## 0.0000000
## Older Girl
## 0.0000000
## Older kid
## 0.0000000
## Older Louse
## 0.0000000
## Older man
## 0.0000000
## Older Man
## 0.0000000
## Older sister
## 0.0000000
## Older Woman
## 0.0000000
## Older Worker
## 0.0000000
## Old Folks
## 0.0000000
## Old Man
## 0.0000000
## Old Man 2
## 0.0000000
## Old Monk
## 0.0000000
## Old-Timer
## 0.0000000
## Old Woman
## 0.0000000
## Old Woman 2
## 0.0000000
## One of the Cubs
## 0.0000000
## Operative
## 0.0000000
## Operator
## 0.0000000
## Oprah
## 0.0000000
## Oprah Winfrey
## 0.0000000
## Optometrist
## 0.0000000
## Oragne cat
## 0.0000000
## Orator 1
## 0.0000000
## Orator 2
## 0.0000000
## Orc
## 0.0000000
## O'Reilly
## 0.0000000
## Osama and the Taliban Soldiers
## 0.0000000
## Osama bin Laden
## 0.0000000
## Osric
## 0.0000000
## Ostrich-baby
## 0.0000000
## Other acts
## 0.0000000
## Other Bikers
## 0.0000000
## Other boys
## 0.0000000
## Other campers
## 0.0000000
## Other Cardinals
## 0.0000000
## Other classmates
## 0.0000000
## Other Execs
## 0.0000000
## Other fans
## 0.0000000
## Other girls
## 0.0000000
## Other Girls
## 0.0000000
## Other Goths
## 0.0000000
## Other kids
## 0.0000000
## Other Kids
## 0.0000000
## Other man
## 0.0000000
## Other Members
## 0.0000000
## Other men
## 0.0000000
## Other Men
## 0.0000000
## Other mothers
## 0.0000000
## Other Musicians
## 0.0000000
## Other NAMBLA Men
## 0.0000000
## Other Officers
## 0.0000000
## Other People
## 0.0000000
## Other priests
## 0.0000000
## Other psychics
## 0.0000000
## Others
## 0.0000000
## Other Seniors
## 0.0000000
## Other Sixth Graders
## 0.0000000
## Other Soldiers
## 0.0000000
## Other students
## 0.0000000
## Other Students
## 0.0000000
## Other Townsfolk
## 0.0000000
## Other Vampires
## 0.0000000
## Other Vamps
## 0.0000000
## Other Women
## 0.0000000
## Otis
## 0.0000000
## Otter 1
## 0.0000000
## Otter 2
## 0.0000000
## Otter 3
## 0.0000000
## Otter Leader
## 0.0000000
## Otters
## 0.0000000
## Otter Soldier
## 0.0000000
## Owner
## 0.0000000
## Owners
## 0.0000000
## Ozzy
## 0.0000000
## Pablo
## 0.0000000
## Page
## 0.0000000
## Palin
## 0.0000000
## Pam
## 0.0000000
## Pamphleteer
## 0.0000000
## Pan
## 0.0000000
## Paolo Captain
## 0.0000000
## Paparazzo
## 0.0000000
## Paparazzo 10
## 0.0000000
## Paparazzo 11
## 0.0000000
## Paparazzo 12
## 0.0000000
## Paparazzo 2
## 0.0000000
## Paparazzo 3
## 0.0000000
## Paparazzo 5
## 0.0000000
## Paparazzo 6
## 0.0000000
## Paparazzo 7
## 0.0000000
## Paparazzo 8
## 0.0000000
## Paparazzo 9
## 0.0000000
## Paramedic
## 0.0000000
## Paramedic 1
## 0.0000000
## Paratrooper
## 0.0000000
## Parents
## 0.0000000
## Paris
## 0.0000000
## Paris Hilton
## 0.0000000
## Park County
## 0.0000000
## Partner
## 0.0000000
## Passenger
## 0.0000000
## Passenger 1
## 0.0000000
## Passenger 2
## 0.0000000
## Passenger 3
## 0.0000000
## Passenger 4
## 0.0000000
## Passengers
## 0.0000000
## Passer-by
## 0.0000000
## Pastor Phillips
## 0.0000000
## PA System
## 0.0000000
## Pat
## 0.0000000
## Patient
## 0.0000000
## Pat O'Brien
## 0.0000000
## Patricia
## 0.0000000
## Patrick
## 0.0000000
## Patrick Duffy
## 0.0000000
## Patrick Swayze
## 0.0000000
## Patron
## 0.0000000
## Patron 1
## 0.0000000
## Patron 10
## 0.0000000
## Patron 2
## 0.0000000
## Patron 3
## 0.0000000
## Patron 4
## 0.0000000
## Patron 5
## 0.0000000
## Patron 6
## 0.0000000
## Patron 7
## 0.0000000
## Patron 8
## 0.0000000
## Patron 9
## 0.0000000
## Patrons
## 0.0000000
## Patron with hat
## 0.0000000
## Pat Sajak
## 0.0000000
## Patsy Ramsey
## 0.0000000
## Pat the Hammer
## 0.0000000
## Patty
## 0.0000000
## Paul
## 0.0000000
## Paula Deen
## 0.0000000
## Paul Allen
## 0.0000000
## Paul Harris
## 0.0000000
## Paul Shaffer
## 0.0000000
## Paul Stanley
## 0.0000000
## Pearl
## 0.0000000
## Pedo 2
## 0.0000000
## Pedo 3
## 0.0000000
## Pedo 4
## 0.0000000
## Pedo 5
## 0.0000000
## Pedo 6
## 0.0000000
## Pedo 7
## 0.0000000
## Peg-leg
## 0.0000000
## Penis
## 0.0000000
## Penis, Mouse
## 0.0000000
## People
## 0.0000000
## People in Audience
## 0.0000000
## People in Crowd
## 0.0000000
## People's Army Leader
## 0.0000000
## Performer
## 0.0000000
## Perseus
## 0.0000000
## Persian
## 0.0000000
## Persian 2
## 0.0000000
## Persians
## 0.0000000
## Person
## 0.0000000
## Personnel
## 0.0000000
## PeTA Man
## 0.0000000
## Pete
## 0.0000000
## Peter
## 0.0000000
## Peter Griffin
## 0.0000000
## Peter Panda
## 0.0000000
## Peters
## 0.0000000
## Peterson
## 0.0000000
## Petey
## 0.0000000
## Petey/Boys
## 0.0000000
## PewDiePie
## 0.0000000
## P.F. Pityef
## 0.0000000
## Pharaoh
## 0.0000000
## Pharmacist
## 0.0000000
## Phil
## 0.0000000
## Phil Collins
## 0.0000000
## Phillip
## 0.0000000
## Phillip Stand-in
## 0.0000000
## Phl
## 0.0000000
## Phlllip
## 0.0000000
## Photographer
## 0.0000000
## Photographer 1
## 0.0000000
## Photographer 2
## 0.0000000
## Photographer 3
## 0.0000000
## Photographer 4
## 0.0000000
## Photo Seller
## 0.0000000
## Phyllis
## 0.0000000
## Pianist
## 0.0000000
## Pig
## 0.0000000
## Pilgrim
## 0.0000000
## Pilgrim Girl
## 0.0000000
## Pilgrim King
## 0.0000000
## Pilot
## 0.0000000
## Pimp
## 0.0000000
## Pimp 2
## 0.0000000
## Pinkerton
## 0.0000000
## Pink Hare
## 0.0000000
## Pink Monster
## 0.0000000
## Pioneer Paul
## 0.0000000
## Pip
## 0.0000000
## Pi Pi
## 0.0000000
## Pirate
## 0.0000000
## Pirate 1
## 0.0000000
## Pirate 2
## 0.0000000
## Pirate 3
## 0.0000000
## Pirate 4
## 0.0000000
## Pirate 5
## 0.0000000
## Pirate 6
## 0.0000000
## Pirate 7
## 0.0000000
## Pirate 8
## 0.0000000
## Pirate Choir
## 0.0000000
## Pirate Ghost 2
## 0.0000000
## Pirate Ghost cutout
## 0.0000000
## Pirate Ghosts
## 0.0000000
## Pirates
## 0.0000000
## Pirate voice
## 0.0000000
## Pirate Voice
## 0.0000000
## Pit Crewman
## 0.0000000
## Pizza Hut Exec
## 0.0000000
## Pizza Man
## 0.0000000
## Player
## 0.0000000
## Player 1
## 0.0000000
## Player 2
## 0.0000000
## Player 3
## 0.0000000
## Player 4
## 0.0000000
## Player 6
## 0.0000000
## Player 70
## 0.0000000
## Players
## 0.0000000
## Plex
## 0.0000000
## Pocket
## 0.0000000
## Poe
## 0.0000000
## Police Captain
## 0.0000000
## Police Chief
## 0.0000000
## Police Chief Stevens
## 0.0000000
## Police Commissioner
## 0.0000000
## Police drone
## 0.0000000
## Policeman 1
## 0.0000000
## Policeman Brown
## 0.0000000
## Police Officer
## 0.0000000
## Police Officer 1
## 0.0000000
## Police Officer 2
## 0.0000000
## Police Radio
## 0.0000000
## Polly
## 0.0000000
## Polly Prissypants
## 0.0000000
## Polly Prissy Pants
## 0.0000000
## Poodle
## 0.0000000
## Poor Girl
## 0.0000000
## Poor Mom
## 0.0000000
## Pope Benedict
## 0.0000000
## Pope Francis
## 0.0000000
## Popeye
## 0.0000000
## Pops
## 0.0000000
## Porcupiney
## 0.0000000
## Porsche
## 0.0000000
## Posse
## 0.0000000
## Postem
## 0.0000000
## Postman
## 0.0000000
## Postmaster
## 0.0000000
## Postum
## 0.0000000
## Preacher
## 0.0000000
## Predator
## 0.0000000
## Premise Running Thin
## 0.0000000
## Prerecorded Voice
## 0.0000000
## President
## 0.0000000
## President Bush
## 0.0000000
## President Calderón
## 0.0000000
## President Clinton
## 0.0000000
## President Hirohito
## 0.0000000
## President Obama
## 0.0000000
## President Wulff
## 0.0000000
## Press Coordinator
## 0.0000000
## Pricipal Victoria
## 0.0000000
## Priest
## 0.0000000
## Priest 1
## 0.0000000
## Priest 2
## 0.0000000
## Priest 3
## 0.0000000
## Priest 4
## 0.0000000
## Priest Maxi
## 0.0000000
## Priests
## 0.0000000
## Prime Minister
## 0.0000000
## Prince
## 0.0000000
## Princess
## 0.0000000
## Princess Diana
## 0.0000000
## Princesses
## 0.0000000
## Principal
## 0.0000000
## Principal Victoria
## 0.0000000
## Principa Victoria
## 0.0000000
## Print Reporter
## 0.0000000
## Proctologist
## 0.0000000
## Producer
## 0.0000000
## Professor Chaos
## 0.0000000
## Profile 1
## 0.0000000
## Profile 2
## 0.0000000
## Profile 3
## 0.0000000
## Profile 4
## 0.0000000
## Profile 5
## 0.0000000
## Profile 6
## 0.0000000
## Profile Stan Marsh
## 0.0000000
## Prof. Thomas
## 0.0000000
## Programmer
## 0.0000000
## Programmer 1
## 0.0000000
## Programmer 2
## 0.0000000
## Programmer 3
## 0.0000000
## Programmer 4
## 0.0000000
## Programmer 5
## 0.0000000
## Promoter
## 0.0000000
## Prop. 10 Supporter
## 0.0000000
## Proprietor
## 0.0000000
## Prosecutor
## 0.0000000
## Prostitute
## 0.0000000
## Protester
## 0.0000000
## Protester 1
## 0.0000000
## Protester 2
## 0.0000000
## Protester 3
## 0.0000000
## Protester 4
## 0.0000000
## Protester 5
## 0.0000000
## Protester 6
## 0.0000000
## Protester 7
## 0.0000000
## Protesters
## 0.0000000
## Protestor #1
## 0.0000000
## Protestor #2
## 0.0000000
## Protestor #3
## 0.0000000
## Protestor #4
## 0.0000000
## Protestor #5
## 0.0000000
## PS4 Army
## 0.0000000
## P. Sanchez
## 0.0000000
## Psychic
## 0.0000000
## Psycho Janus
## 0.0000000
## P-Train
## 0.0000000
## Publisher
## 0.0000000
## Publisher 1
## 0.0000000
## Publisher 2
## 0.0000000
## Pueblo Dad
## 0.0000000
## Pueblo Team
## 0.0000000
## Puerto Rican Player
## 0.0000000
## Puff Daddy
## 0.0000000
## Puffy the Bear
## 0.0000000
## Punk
## 0.0000000
## Purity Boy 1
## 0.0000000
## Purity Boy 2
## 0.0000000
## Purity Boy 3
## 0.0000000
## Purple Hare
## 0.0000000
## Purple Hare 2
## 0.0000000
## Purry
## 0.0000000
## Putin
## 0.0000000
## Q Money
## 0.0000000
## Quadraplegic Swiss man
## 0.0000000
## Queen Elizabeth II
## 0.0000000
## Queen Gertrude
## 0.0000000
## Queen Spider
## 0.0000000
## Quincy
## 0.0000000
## Quint 1
## 0.0000000
## Quint 2
## 0.0000000
## Quint #2
## 0.0000000
## Quint 3
## 0.0000000
## Quint 4
## 0.0000000
## Quint 5
## 0.0000000
## Rabbi
## 0.0000000
## Rabbi 1
## 0.0000000
## Rabbi 2
## 0.0000000
## Rabbi 3
## 0.0000000
## Rabbi 4
## 0.0000000
## Rabbi 5
## 0.0000000
## Rabbity
## 0.0000000
## Rabbity Rabbit
## 0.0000000
## Raccoony
## 0.0000000
## Rachel
## 0.0000000
## Radio Host
## 0.0000000
## Radio Talk Show Host
## 0.0000000
## Raisins Girl
## 0.0000000
## Raisins Girls
## 0.0000000
## Ralph
## 0.0000000
## Ramdu
## 0.0000000
## Rancher
## 0.0000000
## Rancher Bob
## 0.0000000
## Rancid
## 0.0000000
## Random Voices
## 0.0000000
## Randy
## 0.0000000
## Randy and the Boys
## 0.0000000
## Randy, Gerald
## 0.0000000
## Randy Marsh
## 0.0000000
## Randy Newman
## 0.0000000
## Randy's Boss
## 0.0000000
## Randy, Sharon
## 0.0000000
## Randy Singing
## 0.0000000
## Randy's profile
## 0.0000000
## Randy, Stan
## 0.0000000
## Ranger
## 0.0000000
## Ranger McFriendly
## 0.0000000
## Ranger Pete
## 0.0000000
## R. Booth
## 0.0000000
## Really Shocked Man
## 0.0000000
## Real Mackey
## 0.0000000
## Rebecca
## 0.0000000
## Rebecca Turnod
## 0.0000000
## Receptionist
## 0.0000000
## Receptionist 2
## 0.0000000
## Record Executive
## 0.0000000
## Record Producer
## 0.0000000
## Recruiter
## 0.0000000
## Recruits
## 0.0000000
## Red
## 0.0000000
## Red, Annie
## 0.0000000
## Red Cross Chick
## 0.0000000
## Red Cross Dude
## 0.0000000
## Red Goth
## 0.0000000
## Red-Haired Woman
## 0.0000000
## Redhead
## 0.0000000
## Redheaded Prostitute
## 0.0000000
## Redneck
## 0.0000000
## Redneck 1
## 0.0000000
## Redneck 10
## 0.0000000
## Redneck 11
## 0.0000000
## Redneck 12
## 0.0000000
## Redneck 13
## 0.0000000
## Redneck 14
## 0.0000000
## Redneck 15
## 0.0000000
## Redneck 16
## 0.0000000
## Redneck 17
## 0.0000000
## Redneck 18
## 0.0000000
## Redneck 19
## 0.0000000
## Redneck 2
## 0.0000000
## Redneck 20
## 0.0000000
## Redneck 21
## 0.0000000
## Redneck 22
## 0.0000000
## Redneck 23
## 0.0000000
## Redneck 24
## 0.0000000
## Redneck 25
## 0.0000000
## Redneck 26
## 0.0000000
## Redneck 27
## 0.0000000
## Redneck 28
## 0.0000000
## Redneck 29
## 0.0000000
## Redneck 3
## 0.0000000
## Redneck 30
## 0.0000000
## Redneck 4
## 0.0000000
## Redneck 5
## 0.0000000
## Redneck 6
## 0.0000000
## Redneck 7
## 0.0000000
## Redneck 8
## 0.0000000
## Redneck 9
## 0.0000000
## Red Wings Coach
## 0.0000000
## Reenactor
## 0.0000000
## Reenactor 1
## 0.0000000
## Reenactor 2
## 0.0000000
## Reenactor 3
## 0.0000000
## Reenactor 4
## 0.0000000
## Reenactors
## 0.0000000
## Reeve
## 0.0000000
## Referee
## 0.0000000
## Referee 2
## 0.0000000
## Refugee Man 1
## 0.0000000
## Refugee Man 2
## 0.0000000
## Refugee Man 3
## 0.0000000
## Refugee Man 4
## 0.0000000
## Refugee Man 5
## 0.0000000
## Refugees
## 0.0000000
## Reginald
## 0.0000000
## Regis
## 0.0000000
## Registrar
## 0.0000000
## REO Speedwagon
## 0.0000000
## Rep
## 0.0000000
## Replacement Friend
## 0.0000000
## Reporter
## 0.0000000
## Reporter 1
## 0.0000000
## Reporter 2
## 0.0000000
## Reporter 3
## 0.0000000
## Reporter 4
## 0.0000000
## Reporter 5
## 0.0000000
## Reporter 6
## 0.0000000
## Reporter Chris
## 0.0000000
## Reporters
## 0.0000000
## Representative
## 0.0000000
## Rescuer
## 0.0000000
## Rescuer 1
## 0.0000000
## Rescuer 2
## 0.0000000
## Rescuer 3
## 0.0000000
## Rescuer 4
## 0.0000000
## Rescuer 5
## 0.0000000
## Rescuer 6
## 0.0000000
## Researcher
## 0.0000000
## Researcher 1
## 0.0000000
## Researcher 2
## 0.0000000
## Researcher 3
## 0.0000000
## Research Leader
## 0.0000000
## Resident 1
## 0.0000000
## Resident 10
## 0.0000000
## Resident 11
## 0.0000000
## Resident 12
## 0.0000000
## Resident 13
## 0.0000000
## Resident 14
## 0.0000000
## Resident 15
## 0.0000000
## Resident 2
## 0.0000000
## Resident 3
## 0.0000000
## Resident 4
## 0.0000000
## Resident 5
## 0.0000000
## Resident 6
## 0.0000000
## Resident 7
## 0.0000000
## Resident 8
## 0.0000000
## Resident 9
## 0.0000000
## Resident Bishop
## 0.0000000
## Residents
## 0.0000000
## Retarded Fish
## 0.0000000
## Reveler
## 0.0000000
## Reveler 1
## 0.0000000
## Reveler 2
## 0.0000000
## Reveler 3
## 0.0000000
## Reveler 4
## 0.0000000
## Reveler 5
## 0.0000000
## Revelers
## 0.0000000
## Rex
## 0.0000000
## Richard
## 0.0000000
## Richards
## 0.0000000
## Richardson
## 0.0000000
## Richard Tweak
## 0.0000000
## Richard Tweek
## 0.0000000
## Richie
## 0.0000000
## Rich kid
## 0.0000000
## Rick
## 0.0000000
## Rick...
## 0.0000000
## Rick James
## 0.0000000
## Rick Watts
## 0.0000000
## Ride operator
## 0.0000000
## Ride Operator
## 0.0000000
## Rider 1
## 0.0000000
## Rider 2
## 0.0000000
## Right
## 0.0000000
## Right Breast
## 0.0000000
## Right Creature
## 0.0000000
## Riley
## 0.0000000
## Ringtone
## 0.0000000
## R. Kelly
## 0.0000000
## Roadie
## 0.0000000
## Roadie 2
## 0.0000000
## Road Warrior Queef
## 0.0000000
## Road Workers
## 0.0000000
## Robber 1
## 0.0000000
## Robber 2
## 0.0000000
## Robber 3
## 0.0000000
## Robber 4
## 0.0000000
## Robert
## 0.0000000
## Robert Pooner
## 0.0000000
## Robert Redford
## 0.0000000
## Robert Smith
## 0.0000000
## Robin Hood
## 0.0000000
## Robot
## 0.0000000
## Robot Guard
## 0.0000000
## Robot Monkey
## 0.0000000
## Rob Reiner
## 0.0000000
## Rob Schneider
## 0.0000000
## Rockety Rocket
## 0.0000000
## Rod
## 0.0000000
## Roger
## 0.0000000
## Roland
## 0.0000000
## Roma
## 0.0000000
## Romanian official
## 0.0000000
## Romanian Official
## 0.0000000
## Romanian Protesters
## 0.0000000
## Romper Stomper
## 0.0000000
## Ron
## 0.0000000
## Rookie Guard
## 0.0000000
## Roostor
## 0.0000000
## Rosemary
## 0.0000000
## Rosie
## 0.0000000
## Rosie O'Donnell
## 0.0000000
## Roulette Dealer
## 0.0000000
## Roy
## 0.0000000
## Ruby Tucker
## 0.0000000
## Rudy
## 0.0000000
## Rumpertumskin
## 0.0000000
## Rumsfeld
## 0.0000000
## Runs with Premise
## 0.0000000
## Runs With Premise
## 0.0000000
## Russel Crowe
## 0.0000000
## Russell Crowe
## 0.0000000
## Russell Crowe (off-screen)
## 0.0000000
## Russia
## 0.0000000
## Russian
## 0.0000000
## R. West
## 0.0000000
## R. Wiley
## 0.0000000
## Ryan
## 0.0000000
## Saddam
## 0.0000000
## Saddam/Chris
## 0.0000000
## Saddam Hussein
## 0.0000000
## Sailor
## 0.0000000
## Salesman
## 0.0000000
## Sally
## 0.0000000
## Sally Struthers
## 0.0000000
## Salon Girl
## 0.0000000
## Sam
## 0.0000000
## Sandy Cervix
## 0.0000000
## Santa
## 0.0000000
## Sarah
## 0.0000000
## Sarah McLachlan
## 0.0000000
## Sarah's Mom
## 0.0000000
## Sarah Valmer
## 0.0000000
## Satan
## 0.0000000
## Satan and Males
## 0.0000000
## Satan, Chris
## 0.0000000
## Satan/Chris
## 0.0000000
## Sawitsky
## 0.0000000
## Sawitzky
## 0.0000000
## Scary Assistant
## 0.0000000
## Schlomo
## 0.0000000
## Schroeder
## 0.0000000
## Schwartz
## 0.0000000
## Schwarzenegger
## 0.0000000
## Scientist
## 0.0000000
## Scientist 1
## 0.0000000
## Scientist 2
## 0.0000000
## Scientist 3
## 0.0000000
## Scientist 4
## 0.0000000
## Scientist 5
## 0.0000000
## Scott
## 0.0000000
## Scott Tenorman
## 0.0000000
## Scott, Tyler
## 0.0000000
## Scout
## 0.0000000
## Scout Leader
## 0.0000000
## Scoutmaster 1
## 0.0000000
## Scoutmaster 2
## 0.0000000
## Scouts
## 0.0000000
## Scuzzlebutt
## 0.0000000
## Seaman
## 0.0000000
## Sea Otters
## 0.0000000
## Second Baseman
## 0.0000000
## Secretary
## 0.0000000
## Secretary 1
## 0.0000000
## Secret Service Agent
## 0.0000000
## Secret Service Leader
## 0.0000000
## Secure group
## 0.0000000
## Secure Group
## 0.0000000
## Security Agent
## 0.0000000
## Security Guard
## 0.0000000
## Security Guard 1
## 0.0000000
## Selena Gomez
## 0.0000000
## Senator
## 0.0000000
## Senator 1
## 0.0000000
## Senator 2
## 0.0000000
## Senator 3
## 0.0000000
## Senator 4
## 0.0000000
## Seniors
## 0.0000000
## Señor Lopez
## 0.0000000
## Sergeant
## 0.0000000
## Sergeant Yates
## 0.0000000
## Sgt. Boll
## 0.0000000
## Sgt. Larsen
## 0.0000000
## Sgt. Masters
## 0.0000000
## Sgt. Yates
## 0.0000000
## Shades Vamp
## 0.0000000
## Shake Weight
## 0.0000000
## Shari
## 0.0000000
## Sharon
## 0.0000000
## Shawna
## 0.0000000
## Sheep
## 0.0000000
## Sheila
## 0.0000000
## Sheila Broflovski
## 0.0000000
## Sheila, Gerald
## 0.0000000
## Shelley
## 0.0000000
## Shelly
## 0.0000000
## Sheriff
## 0.0000000
## Shlomo
## 0.0000000
## Shoe Salesman
## 0.0000000
## Shopper
## 0.0000000
## Shopper 1
## 0.0000000
## Shopper 10
## 0.0000000
## Shopper 11
## 0.0000000
## Shopper 12
## 0.0000000
## Shopper 13
## 0.0000000
## Shopper 2
## 0.0000000
## Shopper 3
## 0.0000000
## Shopper 4
## 0.0000000
## Shopper 5
## 0.0000000
## Shopper 6
## 0.0000000
## Shopper 7
## 0.0000000
## Shopper 8
## 0.0000000
## Shopper 9
## 0.0000000
## Shoppers
## 0.0000000
## Short Man
## 0.0000000
## Short Reporter
## 0.0000000
## Show Announcer
## 0.0000000
## Shvek
## 0.0000000
## Sia
## 0.0000000
## Sid
## 0.0000000
## Side Judge
## 0.0000000
## Sidney Poitier
## 0.0000000
## Siimon
## 0.0000000
## Simon
## 0.0000000
## Sinéad
## 0.0000000
## Singer
## 0.0000000
## Singer (and backup singers)
## 0.0000000
## Singer (background singers)
## 0.0000000
## Singers
## 0.0000000
## Singers (Widelife)
## 0.0000000
## Sir 1
## 0.0000000
## Sir Harrington
## 0.0000000
## Sister Anne
## 0.0000000
## Sixth Grade Leader
## 0.0000000
## Sixth Grader
## 0.0000000
## Sixth Grader 1
## 0.0000000
## Sixth Grader 2
## 0.0000000
## Sixth Grader 3
## 0.0000000
## Sixth Grader 4
## 0.0000000
## Sixth Grader 5
## 0.0000000
## Sixth Grader 6
## 0.0000000
## Sixth Grader 8
## 0.0000000
## Sixth Grader 9
## 0.0000000
## Sixth Graders
## 0.0000000
## Sixth Graders 2/3
## 0.0000000
## Skeeter
## 0.0000000
## Skid Row
## 0.0000000
## Skier
## 0.0000000
## Skunky
## 0.0000000
## Sky-fi Reporter
## 0.0000000
## Skyler
## 0.0000000
## Skynard Man
## 0.0000000
## Sledders
## 0.0000000
## Slim Reporter
## 0.0000000
## Small Group
## 0.0000000
## Smalls
## 0.0000000
## Smith
## 0.0000000
## Smithy
## 0.0000000
## Smoker
## 0.0000000
## Snarf
## 0.0000000
## Snetzl
## 0.0000000
## Sniper
## 0.0000000
## SNN anchor
## 0.0000000
## SNN Anchor
## 0.0000000
## SNN Correspondent
## 0.0000000
## SNN reporter
## 0.0000000
## SNN Reporter
## 0.0000000
## Snooki
## 0.0000000
## Snoop Dogg
## 0.0000000
## Soccer Captain
## 0.0000000
## Social Worker
## 0.0000000
## Solders
## 0.0000000
## Soldier
## 0.0000000
## Soldier 1
## 0.0000000
## Soldier 2
## 0.0000000
## Soldier 3
## 0.0000000
## Soldier 4
## 0.0000000
## Soldier 5
## 0.0000000
## Soldier 6
## 0.0000000
## Soldier 7
## 0.0000000
## Soldiers
## 0.0000000
## Soloist
## 0.0000000
## Somali 1
## 0.0000000
## Somali 2
## 0.0000000
## Some adults
## 0.0000000
## Some audience members
## 0.0000000
## Somebody
## 0.0000000
## Some boys
## 0.0000000
## Some Folks
## 0.0000000
## Some Guy
## 0.0000000
## Some Kids
## 0.0000000
## Some KKK members
## 0.0000000
## Some men
## 0.0000000
## Someone
## 0.0000000
## Someone in the crowd
## 0.0000000
## Some people
## 0.0000000
## Some People
## 0.0000000
## Some Townsfolk
## 0.0000000
## Sondheim
## 0.0000000
## Sonny
## 0.0000000
## Sony President
## 0.0000000
## Sorcerer
## 0.0000000
## Sound Engineer
## 0.0000000
## Sound man
## 0.0000000
## Sound Man
## 0.0000000
## South Korea
## 0.0000000
## South Park Men
## 0.0000000
## SP Adults
## 0.0000000
## Sparkly Vampire
## 0.0000000
## Sparky
## 0.0000000
## Sparrow Prince
## 0.0000000
## SP Cabbie
## 0.0000000
## Speaker
## 0.0000000
## Specialist
## 0.0000000
## Specialist 1
## 0.0000000
## Specialist 2
## 0.0000000
## Specialist 3
## 0.0000000
## Specialist 4
## 0.0000000
## Spectator
## 0.0000000
## Spectator 1
## 0.0000000
## Spectator 2
## 0.0000000
## Spectator 3
## 0.0000000
## Spectators
## 0.0000000
## Sphinx
## 0.0000000
## Spielberg
## 0.0000000
## Spiky Vamp
## 0.0000000
## Spiky Vampire
## 0.0000000
## Spirit
## 0.0000000
## Spirit 2
## 0.0000000
## Spokesman
## 0.0000000
## Spontaneous Bootay
## 0.0000000
## Sports Reporter
## 0.0000000
## Springer
## 0.0000000
## SP Team
## 0.0000000
## Spy Angel
## 0.0000000
## Squirrelly Squirrel
## 0.0000000
## Squirrely
## 0.0000000
## Squirt
## 0.0000000
## Squirt 1
## 0.0000000
## Squirt 2
## 0.0000000
## Squirt leader
## 0.0000000
## SS Agent
## 0.0000000
## SS Agent 2
## 0.0000000
## Stab
## 0.0000000
## Stacy
## 0.0000000
## Staff
## 0.0000000
## Staffer
## 0.0000000
## Staffer 1
## 0.0000000
## Staffer 2
## 0.0000000
## Staffer 3
## 0.0000000
## Stagehand
## 0.0000000
## Stage hand
## 0.0000000
## Stage Hand
## 0.0000000
## Stallone
## 0.0000000
## Stan
## 0.0000000
## Stan and Jesus
## 0.0000000
## Stan and Kenny
## 0.0000000
## Stan and Kyle
## 0.0000000
## Stan, Cartman
## 0.0000000
## Stan, Cartman, Kenny
## 0.0000000
## Standing Patron
## 0.0000000
## Stan, Jesus
## 0.0000000
## Stan/Kenny/ Cartman
## 0.0000000
## Stan, Kenny, Kyle
## 0.0000000
## Stan, Kyle
## 0.0000000
## Stan/Kyle
## 0.0000000
## Stan, Kyle, Blanket
## 0.0000000
## Stan, Kyle, Butters
## 0.0000000
## Stan, Kyle, Butters, Token
## 0.0000000
## Stan, Kyle, Cartman
## 0.0000000
## Stan/Kyle/ Cartman
## 0.0000000
## Stan, Kyle, Cartman, Kenny
## 0.0000000
## Stan, Kyle, Kenny
## 0.0000000
## Stan/Kyle/ Kenny
## 0.0000000
## Stan, Kyle, Kenny, Cartman
## 0.0000000
## Stanley
## 0.0000000
## Stan Marsh
## 0.0000000
## Star Wars Kid
## 0.0000000
## Steamy Nicks
## 0.0000000
## Stella
## 0.0000000
## Stephen
## 0.0000000
## Stephen Abootman
## 0.0000000
## Stephen, Butters
## 0.0000000
## Stephen Stotch
## 0.0000000
## Stephen Tamil
## 0.0000000
## Steve
## 0.0000000
## Steve Bischiotti
## 0.0000000
## Steve Black
## 0.0000000
## Steve Forbes
## 0.0000000
## Steve Irwin
## 0.0000000
## Steve Jobs
## 0.0000000
## Steve "Last Call"
## 0.0000000
## Steven
## 0.0000000
## Steve Nelson
## 0.0000000
## Stevens
## 0.0000000
## Steven Spielberg
## 0.0000000
## Stewart
## 0.0000000
## Stewie
## 0.0000000
## Stingray Announcer
## 0.0000000
## Stinky
## 0.0000000
## Stockbroker
## 0.0000000
## Stormtrooper
## 0.0000000
## Storm Trooper
## 0.0000000
## Stout Man
## 0.0000000
## Stranger
## 0.0000000
## Strawberry Shortcake
## 0.0000000
## Stripper
## 0.0000000
## Strummer
## 0.0000000
## Stu
## 0.0000000
## Stuart
## 0.0000000
## Stuart and Mrs. McCormick
## 0.0000000
## Stuart and wife, and Receptionist
## 0.0000000
## Student
## 0.0000000
## Student 1
## 0.0000000
## Student 2
## 0.0000000
## Student 3
## 0.0000000
## Students
## 0.0000000
## Studio Audience
## 0.0000000
## Subway Rep 2
## 0.0000000
## Subway Rep 3
## 0.0000000
## Subway Representative
## 0.0000000
## Suicide 1
## 0.0000000
## Suicide 2
## 0.0000000
## Suicide 3
## 0.0000000
## Suicide 4
## 0.0000000
## Suicide 5
## 0.0000000
## Suicide 6
## 0.0000000
## Suicide 7
## 0.0000000
## Suitcase
## 0.0000000
## Summit Host
## 0.0000000
## Superman
## 0.0000000
## Supporter
## 0.0000000
## Supporter 1
## 0.0000000
## Supporter 2
## 0.0000000
## Supporter 3
## 0.0000000
## Supporter 4
## 0.0000000
## Supporter 5
## 0.0000000
## Supporters
## 0.0000000
## Surgeon-General
## 0.0000000
## Susan
## 0.0000000
## Susan92's profile
## 0.0000000
## Sussan
## 0.0000000
## Suzanne
## 0.0000000
## Suzette
## 0.0000000
## SWAT Hansen
## 0.0000000
## SWAT Officer
## 0.0000000
## SWAT Officer 1
## 0.0000000
## SWAT Officer 2
## 0.0000000
## SWAT Officer 3
## 0.0000000
## SWAT Officer 4
## 0.0000000
## SWAT Officer 5
## 0.0000000
## SWAT rescuer Hansen
## 0.0000000
## Swiss Delegate
## 0.0000000
## Sylvester
## 0.0000000
## Taco Bell Exec
## 0.0000000
## Tactical Officer
## 0.0000000
## Tad
## 0.0000000
## Tad and friends
## 0.0000000
## Tad's friends
## 0.0000000
## Talent Scout
## 0.0000000
## Talk Show Host
## 0.0000000
## Tall Crip
## 0.0000000
## Taller Boy
## 0.0000000
## Taller man
## 0.0000000
## Tall Goon
## 0.0000000
## Tall Goth
## 0.0000000
## Tammy
## 0.0000000
## Tan Jovi
## 0.0000000
## Tank Driver
## 0.0000000
## Tape
## 0.0000000
## TAPS
## 0.0000000
## Tardy Man
## 0.0000000
## Taylor
## 0.0000000
## TCO Reporter
## 0.0000000
## Teabag
## 0.0000000
## Tea Bag Participant
## 0.0000000
## Teacher
## 0.0000000
## Tech
## 0.0000000
## Tech 1
## 0.0000000
## Tech 2
## 0.0000000
## Tech 3
## 0.0000000
## Tech 4
## 0.0000000
## Tech 5
## 0.0000000
## Tech 7
## 0.0000000
## Techs
## 0.0000000
## Ted
## 0.0000000
## Ted Koppel
## 0.0000000
## Teen 1
## 0.0000000
## Teen 2
## 0.0000000
## Teen boy
## 0.0000000
## Teen Boy
## 0.0000000
## Teen Boy 1
## 0.0000000
## Teen Boy 2
## 0.0000000
## Teen Boy 3
## 0.0000000
## Teen Boy 4
## 0.0000000
## Teen Boy 5
## 0.0000000
## Teen Boy 6
## 0.0000000
## Teen Boy 7
## 0.0000000
## Teen Boy 8
## 0.0000000
## Teen girl
## 0.0000000
## Teen Girl
## 0.0000000
## Teen Girl 1
## 0.0000000
## Teen Girl 2
## 0.0000000
## Teen MC
## 0.0000000
## Teens
## 0.0000000
## Tele's Owner
## 0.0000000
## Televangelist
## 0.0000000
## Teller
## 0.0000000
## Teresa
## 0.0000000
## Terrance
## 0.0000000
## Terrance & Phillip
## 0.0000000
## Terrance/Phillip
## 0.0000000
## Terrorist #1
## 0.0000000
## Terrorists
## 0.0000000
## Terry
## 0.0000000
## Thad
## 0.0000000
## THC President
## 0.0000000
## The Adults
## 0.0000000
## The Avs
## 0.0000000
## The Boy
## 0.0000000
## The boys
## 0.0000000
## The Boys
## 0.0000000
## The Boys and The Brandos
## 0.0000000
## The Boys (except Cartman) and Dr. Phillips
## 0.0000000
## The Broflovskis
## 0.0000000
## The Broflovskis' Answering Machine
## 0.0000000
## The class
## 0.0000000
## The Class
## 0.0000000
## The Clergy
## 0.0000000
## The Colonel
## 0.0000000
## The Coon
## 0.0000000
## The Cotswolds
## 0.0000000
## The Crew
## 0.0000000
## The Cubs
## 0.0000000
## The Doctor
## 0.0000000
## The Dragon
## 0.0000000
## The Family
## 0.0000000
## The Freaks
## 0.0000000
## The Ghost of Human Kindness
## 0.0000000
## The Giant
## 0.0000000
## The Gintses
## 0.0000000
## The Girls
## 0.0000000
## The group
## 0.0000000
## The Guys
## 0.0000000
## The Harrisons
## 0.0000000
## The Human Kite
## 0.0000000
## The Japanese
## 0.0000000
## The Jonas Brothers
## 0.0000000
## The Kardashians
## 0.0000000
## The kids
## 0.0000000
## The Kids
## 0.0000000
## The Kids of South Park Elementary
## 0.0000000
## The King
## 0.0000000
## The KKK
## 0.0000000
## The Ladies
## 0.0000000
## The Lords
## 0.0000000
## The Males
## 0.0000000
## The Males (Randy)
## 0.0000000
## The Marshes' Answering Machine
## 0.0000000
## The Mayor
## 0.0000000
## Theme
## 0.0000000
## The men
## 0.0000000
## The Men
## 0.0000000
## The Minotaur
## 0.0000000
## The Nerds
## 0.0000000
## The New Lyrics
## 0.0000000
## The New Lyrics, part II
## 0.0000000
## The Nuggets
## 0.0000000
## The Office
## 0.0000000
## The other boys
## 0.0000000
## The Other Boys
## 0.0000000
## The other four
## 0.0000000
## The other kids
## 0.0000000
## The Other Kids
## 0.0000000
## The Other Members
## 0.0000000
## The other men
## 0.0000000
## The others
## 0.0000000
## The Others
## 0.0000000
## The Parents
## 0.0000000
## The Phantom
## 0.0000000
## The Pope
## 0.0000000
## The Queer Eye Guys
## 0.0000000
## The Ramseys
## 0.0000000
## The Ramseys and Condit
## 0.0000000
## The Ramseys, O.J., Condit
## 0.0000000
## Therapist
## 0.0000000
## The rest of the boys
## 0.0000000
## The Scenes
## 0.0000000
## The Situation
## 0.0000000
## The South Park boys
## 0.0000000
## The Streible Girls
## 0.0000000
## The Tape
## 0.0000000
## The Team
## 0.0000000
## The three adults
## 0.0000000
## The three men
## 0.0000000
## The Three Spirits
## 0.0000000
## The TV
## 0.0000000
## The Wise One
## 0.0000000
## The Wizard
## 0.0000000
## The Women
## 0.0000000
## Thin Cop
## 0.0000000
## Thin Plumber
## 0.0000000
## Third Graders
## 0.0000000
## Third Official
## 0.0000000
## Thom
## 0.0000000
## Thomas
## 0.0000000
## Thomas, Kyle
## 0.0000000
## Thomas McElroy
## 0.0000000
## Thompson
## 0.0000000
## Three kids
## 0.0000000
## Three Tortured Souls
## 0.0000000
## Thumper
## 0.0000000
## Ticket 2974 Holder
## 0.0000000
## Ticket agent
## 0.0000000
## Ticket Salesman
## 0.0000000
## Ticket Teller
## 0.0000000
## Tiger
## 0.0000000
## Tiger Woods
## 0.0000000
## Tim Burton
## 0.0000000
## Time Child
## 0.0000000
## Timmy
## 0.0000000
## TiVo
## 0.0000000
## Toby
## 0.0000000
## Together
## 0.0000000
## Token
## 0.0000000
## Token, Craig
## 0.0000000
## Token, Kyle, Stan
## 0.0000000
## Token's father
## 0.0000000
## Token's Father
## 0.0000000
## Token's Mother
## 0.0000000
## Tom
## 0.0000000
## Tom and Mary
## 0.0000000
## Tom Brady
## 0.0000000
## Tom Cruise
## 0.0000000
## Tom Davis
## 0.0000000
## Tom Green
## 0.0000000
## Tom Hanks
## 0.0000000
## Tom Johansen
## 0.0000000
## Tommy
## 0.0000000
## Tommy and His Dad
## 0.0000000
## Tom Nelson
## 0.0000000
## Tom Shane
## 0.0000000
## Tom Snyder
## 0.0000000
## Tom Vilsack
## 0.0000000
## Tong Leader
## 0.0000000
## Tony
## 0.0000000
## Tony Hayward
## 0.0000000
## Tony Kornheiser
## 0.0000000
## Toodee
## 0.0000000
## Toolshed
## 0.0000000
## Tooth
## 0.0000000
## Toothbrush
## 0.0000000
## Tooth Decay
## 0.0000000
## Toothpaste
## 0.0000000
## Top Girl
## 0.0000000
## Top Official
## 0.0000000
## Top Official 2
## 0.0000000
## Toss-a-Ball Operator
## 0.0000000
## Toss-A-Ball Operator
## 0.0000000
## Tough Boy 1
## 0.0000000
## Tough Boy 2
## 0.0000000
## Tough Boy 3
## 0.0000000
## Tough Guy 1
## 0.0000000
## Tough Guy 2
## 0.0000000
## Tour Guide
## 0.0000000
## Tour Guide 2
## 0.0000000
## Tourist
## 0.0000000
## Towel
## 0.0000000
## Towelie
## 0.0000000
## Towelie Clone
## 0.0000000
## Townsfolk
## 0.0000000
## Townsman
## 0.0000000
## Townsman 1
## 0.0000000
## Townsman 10
## 0.0000000
## Townsman 11
## 0.0000000
## Townsman 12
## 0.0000000
## Townsman 13
## 0.0000000
## Townsman 14
## 0.0000000
## Townsman 15
## 0.0000000
## Townsman 16
## 0.0000000
## Townsman 17
## 0.0000000
## Townsman 2
## 0.0000000
## Townsman 3
## 0.0000000
## Townsman 4
## 0.0000000
## Townsman 5
## 0.0000000
## Townsman 6
## 0.0000000
## Townsman 7
## 0.0000000
## Townsman 8
## 0.0000000
## Townsman 9
## 0.0000000
## Townspeople
## 0.0000000
## Townsperson 1
## 0.0000000
## Townsperson 2
## 0.0000000
## Townsperson 3
## 0.0000000
## Townswoman
## 0.0000000
## Townswoman 1
## 0.0000000
## Townswoman 2
## 0.0000000
## Tow Truck Driver
## 0.0000000
## Tracy
## 0.0000000
## Train Conductor
## 0.0000000
## Trainee Barbrady
## 0.0000000
## Trainer
## 0.0000000
## Trainer 1
## 0.0000000
## Trainer 2
## 0.0000000
## Trainer 3
## 0.0000000
## Transient Man 1
## 0.0000000
## Transient Man 2
## 0.0000000
## Transient Man 3
## 0.0000000
## Transient Man 4
## 0.0000000
## Transient Man 5
## 0.0000000
## Transient Man 6
## 0.0000000
## Translator
## 0.0000000
## Trapper Keeper
## 0.0000000
## Trashman
## 0.0000000
## Travis
## 0.0000000
## Travolta
## 0.0000000
## Treasurer 1
## 0.0000000
## Treasurer 2
## 0.0000000
## Treasurer 3
## 0.0000000
## Tree hugger
## 0.0000000
## Trent
## 0.0000000
## Trey Parker
## 0.0000000
## Trinity
## 0.0000000
## Tron Guy
## 0.0000000
## Tron Soldier
## 0.0000000
## Trooper
## 0.0000000
## Troupe
## 0.0000000
## Truck Driver
## 0.0000000
## Trucker
## 0.0000000
## TSA Agent 1
## 0.0000000
## TSA Agent 2
## 0.0000000
## T-Shirt Vendor
## 0.0000000
## Tucker
## 0.0000000
## Tugger
## 0.0000000
## Tuong
## 0.0000000
## Tuong Lu Kim
## 0.0000000
## Tupac's Hologram
## 0.0000000
## TupperWear
## 0.0000000
## Turd Sandwich
## 0.0000000
## TV
## 0.0000000
## TV Announcer
## 0.0000000
## TV Crew Director
## 0.0000000
## TV Newscaster
## 0.0000000
## TV Voice
## 0.0000000
## Tweek
## 0.0000000
## Tweek, Craig
## 0.0000000
## Tweek's Mom
## 0.0000000
## Twirler 1
## 0.0000000
## Twirler 2
## 0.0000000
## Twirler 3
## 0.0000000
## Twirler 4
## 0.0000000
## Two Elders
## 0.0000000
## Two Girls
## 0.0000000
## Two Guys
## 0.0000000
## Two kids
## 0.0000000
## Two Small Voices
## 0.0000000
## Two SWAT men
## 0.0000000
## Tyler
## 0.0000000
## Tyler Perry
## 0.0000000
## UAA 1
## 0.0000000
## UAA 2
## 0.0000000
## UAA 3
## 0.0000000
## UAA Leader
## 0.0000000
## UAA Member 1
## 0.0000000
## UAA Member 2
## 0.0000000
## UAA Woman
## 0.0000000
## UAL 1
## 0.0000000
## UAL 2
## 0.0000000
## UAL 3
## 0.0000000
## UAL Aide
## 0.0000000
## UAL Leader
## 0.0000000
## UAL Member 1
## 0.0000000
## Ugly Bob
## 0.0000000
## Ugly Girl
## 0.0000000
## Umpire
## 0.0000000
## Umpire 2
## 0.0000000
## Uncle
## 0.0000000
## Uncle Budd
## 0.0000000
## Uncle Corey
## 0.0000000
## Uncle Howard
## 0.0000000
## Uncle Jimbo
## 0.0000000
## Uncle Murray
## 0.0000000
## Uncle Stinky
## 0.0000000
## Union Reenactors
## 0.0000000
## Unkempt Garrison
## 0.0000000
## U.N. Leader
## 0.0000000
## UPS Man
## 0.0000000
## Uriel
## 0.0000000
## U.S. Army Official
## 0.0000000
## Usher
## 0.0000000
## Vacationer 1
## 0.0000000
## Vampir
## 0.0000000
## Vamps
## 0.0000000
## Vanessa
## 0.0000000
## Van Gelder
## 0.0000000
## Van Gelder, Mr. Mackey
## 0.0000000
## Vanity
## 0.0000000
## Varashnu
## 0.0000000
## Various Folk
## 0.0000000
## Vendor
## 0.0000000
## Vernon
## 0.0000000
## Veronica
## 0.0000000
## Vet
## 0.0000000
## Veteran Guard
## 0.0000000
## Vice President
## 0.0000000
## Viewer 1
## 0.0000000
## Viewer 2
## 0.0000000
## Viewer 3
## 0.0000000
## Vince
## 0.0000000
## Violet Hare
## 0.0000000
## Visitor Driver
## 0.0000000
## Vivian
## 0.0000000
## VJ
## 0.0000000
## Vladimir
## 0.0000000
## Vocalist
## 0.0000000
## Voguing Skier
## 0.0000000
## Voguing Skier 2
## 0.0000000
## Voice
## 0.0000000
## Voice 1
## 0.0000000
## Voice 2
## 0.0000000
## Voice Notification
## 0.0000000
## Voice over
## 0.0000000
## Voice-over
## 0.0000000
## Voice-Over
## 0.0000000
## Voices
## 0.0000000
## Volunteer
## 0.0000000
## Volunteer 1
## 0.0000000
## Volunteer 2
## 0.0000000
## Volunteer 3
## 0.0000000
## Volunteer 4
## 0.0000000
## Waiter
## 0.0000000
## Waitress
## 0.0000000
## Wall-Mart
## 0.0000000
## Wally B.
## 0.0000000
## Walsky
## 0.0000000
## Walter
## 0.0000000
## Walter Cronkite
## 0.0000000
## Warden
## 0.0000000
## War Protester
## 0.0000000
## Water Tester
## 0.0000000
## Wayne D
## 0.0000000
## WCB President
## 0.0000000
## Weasel
## 0.0000000
## Webber
## 0.0000000
## Ween
## 0.0000000
## Weird Hat Guy
## 0.0000000
## Weird Man
## 0.0000000
## Wendy
## 0.0000000
## Wendy, Cartman
## 0.0000000
## Whispers
## 0.0000000
## Whistle
## 0.0000000
## Whistlin' Willy
## 0.0000000
## White Bailiff
## 0.0000000
## White Bitch
## 0.0000000
## White Bouncer
## 0.0000000
## White Chef
## 0.0000000
## White Hare
## 0.0000000
## White Official
## 0.0000000
## Whoopi
## 0.0000000
## Wife
## 0.0000000
## Wigger
## 0.0000000
## William
## 0.0000000
## Will Smith
## 0.0000000
## Willy
## 0.0000000
## Wing
## 0.0000000
## Winner
## 0.0000000
## Wise Man
## 0.0000000
## Witches
## 0.0000000
## With boys
## 0.0000000
## With Boys
## 0.0000000
## With Choir
## 0.0000000
## With Demons
## 0.0000000
## With Females
## 0.0000000
## With Males
## 0.0000000
## With the Damned
## 0.0000000
## With the Kennedys
## 0.0000000
## Wolf Blitzer
## 0.0000000
## Woman
## 0.0000000
## Woman 1
## 0.0000000
## Woman 2
## 0.0000000
## Woman 3
## 0.0000000
## Woman 4
## 0.0000000
## Woman 5
## 0.0000000
## Woman 6
## 0.0000000
## Woman 7
## 0.0000000
## Woman 8
## 0.0000000
## Woman Supporter 1
## 0.0000000
## Woman Supporter 2
## 0.0000000
## Woman With Brown Hair
## 0.0000000
## Women
## 0.0000000
## Wonder Woman
## 0.0000000
## Woodland Critters
## 0.0000000
## Woodpeckery
## 0.0000000
## Woodsy Owl
## 0.0000000
## Worker
## 0.0000000
## Worker 1
## 0.0000000
## Worker 2
## 0.0000000
## Worker 3
## 0.0000000
## Worker 4
## 0.0000000
## Worm
## 0.0000000
## Wrangler
## 0.0000000
## Wrestler
## 0.0000000
## Wyoming Coach
## 0.0000000
## Xenu
## 0.0000000
## Xerxes
## 0.0000000
## Yamal
## 0.0000000
## Yanogapa
## 0.0000000
## Yanogapa 1
## 0.0000000
## Yanogapa 2
## 0.0000000
## Yao
## 0.0000000
## Yates
## 0.0000000
## Yimenez
## 0.0000000
## Yo Gabba Gabba
## 0.0000000
## Yoko Ono
## 0.0000000
## Yolanda
## 0.0000000
## You And Me, Girl
## 0.0000000
## Younger Boy
## 0.0000000
## Younger Daughter
## 0.0000000
## Younger man
## 0.0000000
## Younger Man
## 0.0000000
## Young Worker
## 0.0000000
## Zazul
## 0.0000000
## Zeus
## 0.0000000
## Zipliner
## 0.0000000
## Zombie
## 0.0000000
## Zombie Mortician
## 0.0000000
## Zytar
## 0.0000000
cartman <- subset(south_park_ds_final, Character == "Cartman")
kyle <- subset(south_park_ds_final, Character == "Kyle")
wordcloud(cartman$Line, max.words = 40, scale = c(3,0.5))
wordcloud(kyle$Line, max.words = 40, scale = c(3,0.5))
#Reducir a solo los que aparezcan en 5 mensajes
south_park_freq_words <- findFreqTerms(south_park_dtm_train, 10)
str(south_park_freq_words)
## chr [1:1033] "aaaah" "aaah" "abl" "abort" "about" "accept" "access" ...
south_park_dtm_freq_train <- south_park_dtm_train[, south_park_freq_words]
south_park_dtm_freq_test <- south_park_dtm_test[, south_park_freq_words]
convert_counts <- function(x){x <- ifelse(x > 0, "Yes", "No")}
south_park_train <- apply(south_park_dtm_freq_train, MARGIN = 2, convert_counts)
south_park_test <- apply(south_park_dtm_freq_test, MARGIN = 2, convert_counts)
library(e1071)
length(south_park_train)
## [1] 12201796
length(south_park_train_labels)
## [1] 11812
#Clasificador
library(gmodels)
south_park_classifier2 <- naiveBayes(south_park_train, south_park_train_labels, laplace = 1)
south_park_test_pred2 <- predict(south_park_classifier2, south_park_test)
CrossTable(south_park_test_pred2, south_park_test_labels, prop.chisq = FALSE, prop.t = FALSE, dnn = c(' predicted', 'actual'))
##
##
## Cell Contents
## |-------------------------|
## | N |
## | N / Row Total |
## | N / Col Total |
## |-------------------------|
##
##
## Total Observations in Table: 5061
##
##
## | actual
## predicted | Cartman | Kyle | Row Total |
## -------------|-----------|-----------|-----------|
## Cartman | 1780 | 743 | 2523 |
## | 0.706 | 0.294 | 0.499 |
## | 0.608 | 0.348 | |
## -------------|-----------|-----------|-----------|
## Kyle | 1149 | 1389 | 2538 |
## | 0.453 | 0.547 | 0.501 |
## | 0.392 | 0.652 | |
## -------------|-----------|-----------|-----------|
## Column Total | 2929 | 2132 | 5061 |
## | 0.579 | 0.421 | |
## -------------|-----------|-----------|-----------|
##
##