library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.2     ✔ readr     2.1.4
## ✔ forcats   1.0.0     ✔ stringr   1.5.0
## ✔ ggplot2   3.4.3     ✔ tibble    3.2.1
## ✔ lubridate 1.9.2     ✔ tidyr     1.3.0
## ✔ purrr     1.0.2     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(ggplot2)
library(pwr)
library(stats)
library(readr)
library(broom)

# Load your data
data <- read.csv("C:\\Users\\mansi\\Downloads\\news+popularity+in+multiple+social+media+platforms\\News_Popularity_in_Multiple_Social_Media_Platforms.csv")

# A numeric summary of data for at least 10 columns
summary(data)
##      IDLink          Title             Headline            Source         
##  Min.   :     1   Length:93239       Length:93239       Length:93239      
##  1st Qu.: 24302   Class :character   Class :character   Class :character  
##  Median : 52275   Mode  :character   Mode  :character   Mode  :character  
##  Mean   : 51561                                                           
##  3rd Qu.: 76586                                                           
##  Max.   :104802                                                           
##     Topic           PublishDate        SentimentTitle      SentimentHeadline 
##  Length:93239       Length:93239       Min.   :-0.950694   Min.   :-0.75543  
##  Class :character   Class :character   1st Qu.:-0.079057   1st Qu.:-0.11457  
##  Mode  :character   Mode  :character   Median : 0.000000   Median :-0.02606  
##                                        Mean   :-0.005411   Mean   :-0.02749  
##                                        3rd Qu.: 0.064255   3rd Qu.: 0.05971  
##                                        Max.   : 0.962354   Max.   : 0.96465  
##     Facebook         GooglePlus          LinkedIn       
##  Min.   :   -1.0   Min.   :  -1.000   Min.   :   -1.00  
##  1st Qu.:    0.0   1st Qu.:   0.000   1st Qu.:    0.00  
##  Median :    5.0   Median :   0.000   Median :    0.00  
##  Mean   :  113.1   Mean   :   3.888   Mean   :   16.55  
##  3rd Qu.:   33.0   3rd Qu.:   2.000   3rd Qu.:    4.00  
##  Max.   :49211.0   Max.   :1267.000   Max.   :20341.00

Part 1:

Select an interesting binary column of data, or one which can be reasonably converted into a binary variable

# Assuming 'SentimentTitle' is the interesting binary column, convert it into a binary variable
data$SentimentBinary <- ifelse(data$SentimentTitle > 0, 1, 0)

head(data)
##   IDLink
## 1  99248
## 2  10423
## 3  18828
## 4  27788
## 5  27789
## 6  27790
##                                                                           Title
## 1                              Obama Lays Wreath at Arlington National Cemetery
## 2                                   A Look at the Health of the Chinese Economy
## 3                              Nouriel Roubini: Global Economy Not Back to 2008
## 4                                                     Finland GDP Expands In Q4
## 5                          Tourism, govt spending buoys Thai economy in January
## 6 Intellitec Solutions to Host 13th Annual Spring Microsoft Dynamics User Group
##                                                                                                                                                                                               Headline
## 1                                                                      Obama Lays Wreath at Arlington National Cemetery. President Barack Obama has laid a wreath at the Tomb of the Unknowns to honor
## 2                                                            Tim Haywood, investment director business-unit head for fixed income at Gam, discusses the China beige book and the state of the economy.
## 3                                                            Nouriel Roubini, NYU professor and chairman at Roubini Global Economics, explains why the global economy isn't facing the same conditions
## 4                     Finland's economy expanded marginally in the three months ended December, after contracting in the previous quarter, preliminary figures from Statistics Finland showed Monday. 
## 5                          Tourism and public spending continued to boost the economy in January, in light of contraction in private consumption and exports, according to the Bank of Thailand data. 
## 6 Over 100 attendees expected to see latest version of Microsoft Dynamics SL and Dynamics GP (PRWeb February 29, 2016) Read the full story at http://www.prweb.com/releases/2016/03/prweb13238571.htm 
##                                     Source     Topic         PublishDate
## 1                                USA TODAY     obama 2002-04-02 00:00:00
## 2                                Bloomberg   economy 2008-09-20 00:00:00
## 3                                Bloomberg   economy 2012-01-28 00:00:00
## 4                                 RTT News   economy 2015-03-01 00:06:00
## 5 The Nation - Thailand&#39;s English news   economy 2015-03-01 00:11:00
## 6                                    PRWeb microsoft 2015-03-01 00:19:00
##   SentimentTitle SentimentHeadline Facebook GooglePlus LinkedIn SentimentBinary
## 1     0.00000000       -0.05330018       -1         -1       -1               0
## 2     0.20833333       -0.15638581       -1         -1       -1               1
## 3    -0.42521003        0.13975425       -1         -1       -1               0
## 4     0.00000000        0.02606430       -1         -1       -1               0
## 5     0.00000000        0.14108446       -1         -1       -1               0
## 6    -0.07537784        0.03677279       -1         -1       -1               0

Part 2:

Build a logistic regression model for this variable, using between 1-4 explanatory variables

# Convert categorical variables to one-hot encoding
encoded_data <- cbind(data["SentimentBinary"], model.matrix(~ Topic + Source - 1, data = data))

# Rename the 'SentimentBinary' column to avoid naming conflicts
names(encoded_data)[1] <- "SentimentBinary"

# Convert the encoded_data to a data.frame
encoded_data <- as.data.frame(encoded_data)
subset_data <- encoded_data[1:100, ] 

# Create a logistic regression model
model <- glm(SentimentBinary ~ ., data = subset_data, family = binomial)
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
# View the summary of the model
summary(model)
## 
## Call:
## glm(formula = SentimentBinary ~ ., family = binomial, data = subset_data)
## 
## Coefficients: (5688 not defined because of singularities)
##                                                                                                    Estimate
## (Intercept)                                                                                      -2.374e+01
## Topiceconomy                                                                                      2.324e+00
## Topicmicrosoft                                                                                    8.070e+00
## Topicobama                                                                                        4.504e+15
## Topicpalestine                                                                                           NA
## `Source `                                                                                                NA
## `Source/FILM`                                                                                            NA
## `Source+972 Magazine`                                                                                    NA
## `Source\\u009d\\u009d \\u009d\\u009d`                                                                    NA
## Source10News                                                                                             NA
## Source10TV                                                                                               NA
## Source11alive.com                                                                                        NA
## `Source12 News Phoenix`                                                                                  NA
## Source12news.com                                                                                         NA
## Source12NewsNow.Com                                                                                      NA
## `Source1340 WJOL`                                                                                        NA
## `Source13abc Action News`                                                                                NA
## Source13newsnow.com                                                                                      NA
## Source13WMAZ                                                                                             NA
## Source13WMAZ.com                                                                                         NA
## `Source14 News WFIE Evansville`                                                                          NA
## `Source14 WFIE Evansville`                                                                               NA
## `Source19 Action News Cleveland`                                                                         NA
## Source20minutes.fr                                                                                       NA
## Source21Alive                                                                                            NA
## `Source24/7 Wall St.`                                                                                    NA
## `Source24/7 Wall St. via Yahoo! Finance`                                                                 NA
## Source247Sports                                                                                          NA
## Source2paragraphs.com                                                                                    NA
## `Source3ders.org (blog)`                                                                                 NA
## Source3DPrint.com                                                                                        NA
## Source3news                                                                                              NA
## `Source3News NZ`                                                                                         NA
## `Source41 NBC News`                                                                                      NA
## Source4k                                                                                                 NA
## Source4NI                                                                                                NA
## `Source5 Eyewitness News St. Paul`                                                                       NA
## `Source550 KTSA`                                                                                         NA
## `Source570 News`                                                                                         NA
## `Source580 CFRA Radio`                                                                                   NA
## Source5newsonline.com                                                                                    NA
## `Source6 On Your Side`                                                                                   NA
## Source630ched.com                                                                                        NA
## `Source660 News`                                                                                         NA
## `Source680 News`                                                                                         NA
## Source6abc.com                                                                                           NA
## `Source7Online WSVN-TV`                                                                                  NA
## Source7sur7                                                                                              NA
## `Source88Nine Radio Milwaukee (blog)`                                                                    NA
## `Source89.3 KPCC`                                                                                        NA
## `Source89.3 WFPL`                                                                                        NA
## `Source9 News Denver`                                                                                    NA
## `Source9 to 5 Google`                                                                                    NA
## `Source9 to 5 Mac`                                                                                       NA
## `Source9 to 5 Mac (press release)`                                                                       NA
## `Source9&10 News`                                                                                        NA
## `Source93.1 WIBC Indianapolis`                                                                           NA
## Source9NEWS.com                                                                                          NA
## Source9news.com.au                                                                                       NA
## `SourceA.V. Club`                                                                                        NA
## `SourceA.V. Club (blog)`                                                                                 NA
## `SourceA.V. Club Denver/Boulder`                                                                         NA
## `SourceAaj Tv (press release) (blog)`                                                                    NA
## `SourceAAP via Yahoo! New Zealand Finance`                                                               NA
## `SourceAAP via Yahoo! New Zealand News`                                                                  NA
## `SourceAAP via Yahoo!7 Finance`                                                                          NA
## `SourceAAP via Yahoo!7 News`                                                                             NA
## `SourceAbbotsford News (registration) (blog)`                                                            NA
## `SourceABC 13 Houston`                                                                                   NA
## `SourceABC 15 Phoenix`                                                                                   NA
## `SourceABC 26 New Orleans`                                                                               NA
## `SourceABC 6 Providence`                                                                                 NA
## `SourceABC 7 Chicago`                                                                                    NA
## `SourceABC 7 Gulfshore News`                                                                             NA
## `SourceABC Action News Tampa Bay`                                                                        NA
## `SourceABC FOX Montana News`                                                                             NA
## `SourceABC Local`                                                                                        NA
## `SourceABC Montana`                                                                                      NA
## `SourceABC News`                                                                                         NA
## `SourceABC NEWS 4`                                                                                       NA
## `SourceABC News via Yahoo! News`                                                                         NA
## `SourceABC Online`                                                                                       NA
## `SourceABC Online (blog)`                                                                                NA
## SourceABC10.com                                                                                          NA
## `SourceABC11 Raleigh-Durham-Fayetteville`                                                                NA
## `SourceABC12 Mid-Michigan`                                                                               NA
## `SourceABC15 Arizona`                                                                                    NA
## SourceABC17News.com                                                                                      NA
## `SourceABC2 News`                                                                                        NA
## Sourceabc27                                                                                              NA
## SourceABC6OnYourSide.com                                                                                 NA
## Sourceabc7news.com                                                                                       NA
## `SourceAberdeen Press and Journal`                                                                       NA
## `SourceABI Research (press release) (subscription) (blog)`                                               NA
## `SourceAbove the Law`                                                                                    NA
## `SourceABP Live`                                                                                         NA
## `SourceABS-CBNNEWS.com`                                                                                  NA
## `SourceABS CBN News`                                                                                     NA
## `SourceAccess Hollywood`                                                                                 NA
## `SourceAccess Washington`                                                                                NA
## `SourceAccesswire via Yahoo! Finance`                                                                    NA
## `SourceAccounting Today`                                                                                 NA
## `SourceAccuracy in Academia`                                                                             NA
## `SourceAccuracy In Media`                                                                                NA
## `SourceAccuracy In Media (blog)`                                                                         NA
## `SourceACN Newswire via Yahoo! New Zealand Finance`                                                      NA
## `SourceACN Newswire via Yahoo!7 Finance`                                                                 NA
## `SourceAction Forex`                                                                                     NA
## SourceActionNewsJax.com                                                                                  NA
## SourceACTmedia                                                                                           NA
## `SourceActon Institute (blog)`                                                                           NA
## SourceAdAge.com                                                                                          NA
## `SourceAdAge.com (blog)`                                                                                 NA
## SourceAdExchanger                                                                                        NA
## SourceAdNews                                                                                             NA
## `SourceADT Magazine`                                                                                     NA
## `SourceAdvanced Television`                                                                              NA
## SourceAdvisor.ca                                                                                         NA
## SourceAdvocate.com                                                                                       NA
## SourceAdweek                                                                                             NA
## SourceAdWeek                                                                                             NA
## Sourceafaqs                                                                                              NA
## SourceAFKInsider                                                                                         NA
## `SourceAFL-CIO (blog)`                                                                                   NA
## `SourceAFP News via Yahoo! Philippines News`                                                             NA
## `SourceAFP News via Yahoo! Singapore News`                                                               NA
## `SourceAFP Relax News via Yahoo! News`                                                            5.370e+01
## `SourceAFP Relax via Yahoo! Philippines News`                                                     5.295e+01
## `SourceAFP Relax via Yahoo! Singapore News`                                                              NA
## `SourceAFP via Yahoo Maktoob News`                                                                       NA
## `SourceAFP via Yahoo UK & Ireland Finance`                                                               NA
## `SourceAFP via Yahoo UK & Ireland News`                                                                  NA
## `SourceAFP via Yahoo! Finance`                                                                           NA
## `SourceAFP via Yahoo! India News`                                                                 5.432e+01
## `SourceAFP via Yahoo! New Zealand News`                                                                  NA
## `SourceAFP via Yahoo! News`                                                                       2.131e+02
## `SourceAFP via Yahoo! Sports`                                                                            NA
## `SourceAFP via Yahoo!7 Finance`                                                                          NA
## `SourceAFP via Yahoo!7 News`                                                                             NA
## `SourceAfrica Middle East`                                                                               NA
## `SourceAfrican Arguments (registration)`                                                                 NA
## `SourceAfrican Manager (press release) (registration) (blog)`                                            NA
## SourceAfricanews                                                                                         NA
## SourceAfricaNews                                                                                         NA
## `SourceAfricanews (press release)`                                                                       NA
## SourceAfrik.com                                                                                          NA
## SourceAfterDawn                                                                                          NA
## `SourceAG Week`                                                                                          NA
## `SourceAgence France-Presse via Yahoo Canada News`                                                       NA
## SourceAgencySpy                                                                                          NA
## SourceAgenda.ge                                                                                          NA
## SourceAGERPRES                                                                                           NA
## SourceAgoraVox                                                                                           NA
## SourceAgriculture.com                                                                                    NA
## SourceAgriland                                                                                           NA
## SourceAgWeb                                                                                              NA
## `SourceAhlul Bayt News Agency (press release)`                                                           NA
## `SourceAhram Online`                                                                                     NA
## `SourceAir Force Link`                                                                                   NA
## `SourceAir Transport World`                                                                              NA
## `SourceAircraft Maintenance Technology`                                                                  NA
## SourceAirForceTimes.com                                                                                  NA
## `SourceAirline Reporter`                                                                                 NA
## `SourceAJIB.fr L'actualit\\u009d\\u009d de l'Islam et des musulmans en France`                           NA
## `SourceAkron Beacon Journal`                                                                             NA
## `SourceAl-Ahram Weekly`                                                                                  NA
## `SourceAl-Arabiya`                                                                                       NA
## `SourceAl-Arabiya (blog)`                                                                                NA
## `SourceAl-Bawaba`                                                                                        NA
## `SourceAl-Fanar Media`                                                                                   NA
## `SourceAl-Jazeerah.info`                                                                                 NA
## `SourceAl-Manar TV`                                                                                      NA
## `SourceAl-Monitor`                                                                                       NA
## `SourceAl-Resalah`                                                                                       NA
## `SourceAl Bawaba`                                                                                        NA
## `SourceAl Huffington Post`                                                                               NA
## `SourceAl Jazeera America`                                                                               NA
## `SourceAl Jazeera via Yahoo Maktoob News`                                                                NA
## `SourceAl Jazeera via Yahoo UK & Ireland News`                                                           NA
## SourceAL.com                                                                                             NA
## `SourceAlabama's News Leader`                                                                            NA
## `SourceAlabama NewsCenter`                                                                               NA
## `SourceAlaska Dispatch News`                                                                             NA
## `SourceAlaska Public Radio Network`                                                                      NA
## `SourceAlbanian Daily News`                                                                              NA
## `SourceAlbany Business Review`                                                                           NA
## `SourceAlbany Democrat Herald`                                                                           NA
## `SourceAlbany Times Union`                                                                               NA
## `SourceAlbany Times Union (blog)`                                                                        NA
## `SourceAlberni Valley News`                                                                              NA
## `SourceAlberta Daily Herald Tribune`                                                                     NA
## `SourceAlbuquerque Business First (blog)`                                                                NA
## `SourceAlbuquerque Journal`                                                                              NA
## `SourceAlex News (blog)`                                                                                 NA
## `SourceAlexandria Town Talk`                                                                             NA
## `SourceAlg\\u009d\\u009drie Presse Service`                                                              NA
## SourceAlgemeiner                                                                                         NA
## `Sourcealgerie-focus.com`                                                                                NA
## `SourceAlgérie Presse Service`                                                                           NA
## `SourceAliran Monthly`                                                                                   NA
## `SourceAliran Online`                                                                                    NA
## SourceAljazeera.com                                                                                      NA
## `SourceAljazeera.com (blog)`                                                                             NA
## `SourceAll About Hawke's Bay`                                                                            NA
## SourceAllAfrica.com                                                                                      NA
## `SourceAllCoinsNews.com (blog)`                                                                          NA
## `SourceAllentown Morning Call`                                                                           NA
## SourceAllGov                                                                                             NA
## `SourceAllure Magazine (blog)`                                                                           NA
## SourceAlphr                                                                                              NA
## `SourceAltEnergyMag (press release)`                                                                     NA
## `SourceAlternative Information Center (AIC)`                                                             NA
## `SourceAlternative Information Center (AIC) (blog)`                                                      NA
## SourceAlterNet                                                                                           NA
## `SourceAlton Telegraph`                                                                                  NA
## `SourceAlyaexpress-News`                                                                                 NA
## `SourceAmarillo Globe-News`                                                                              NA
## SourceAmarillo.com                                                                                       NA
## `SourceAmazinessNet (blog)`                                                                              NA
## SourceAMEinfo                                                                                            NA
## `SourceAmerica Magazine`                                                                                 NA
## `SourceAmerican Action Forum (blog)`                                                                     NA
## `SourceAmerican Banker`                                                                                  NA
## `SourceAmerican Center for Law and Justice (blog)`                                                       NA
## `SourceAmerican Enterprise Institute`                                                                    NA
## `SourceAmerican Free Press`                                                                              NA
## `SourceAmerican Journal of Transportation`                                                               NA
## `SourceAmerican Kennel Club (blog)`                                                                      NA
## `SourceAmerican Libraries (blog)`                                                                        NA
## `SourceAmerican Spectator`                                                                               NA
## `SourceAmerican Spectator (blog)`                                                                        NA
## `SourceAmerican Thinker`                                                                                 NA
## `SourceAmerican Thinker (blog)`                                                                          NA
## `SourceAmerican Trade Journal`                                                                           NA
## `SourceAmericans for Tax Reform (blog)`                                                                  NA
## `SourceAmericas Quarterly`                                                                               NA
## `SourceAmericas Quarterly (blog)`                                                                        NA
## SourceAmeriPublications                                                                                  NA
## `SourceAmes Tribune`                                                                                     NA
## SourceAmigobulls                                                                                         NA
## `SourceAmmoLand Shooting Sports News`                                                                    NA
## SourceamNewYork                                                                                          NA
## SourceamNY                                                                                               NA
## `SourceAn Phoblacht`                                                                                     NA
## `SourceAnadolu Agency`                                                                                   NA
## SourceAnandTech                                                                                          NA
## SourceAnarkismo.net                                                                                      NA
## `SourceAnchorage Daily News`                                                                             NA
## `SourceAndean Airmail & PERUVIAN TIMES`                                                                  NA
## `SourceAnderson Independent Mail`                                                                        NA
## `SourceAndroid Authority (blog)`                                                                         NA
## `SourceAndroid Central`                                                                                  NA
## `SourceAndroid Community`                                                                                NA
## `SourceAndroid Headlines - Android News`                                                                 NA
## `SourceAndroid Police`                                                                                   NA
## SourceAndroidOrigin                                                                                      NA
## `SourceAndroidPIT US (blog)`                                                                             NA
## SourceAngolaPress                                                                                        NA
## `SourceANI via Yahoo! India News`                                                                        NA
## `SourceAnimation World Network`                                                                          NA
## `SourceAnime News Network`                                                                               NA
## SourceANINEWS                                                                                            NA
## SourceAnorak                                                                                             NA
## `SourceANSA (registration)`                                                                              NA
## SourceANSAmed                                                                                            NA
## SourceANTARA                                                                                             NA
## `SourceAntigua Observer`                                                                                 NA
## SourceAntiwar.com                                                                                        NA
## `SourceAntiwar.com (blog)`                                                                               NA
## `SourceAOL Money UK`                                                                                     NA
## `SourceAOL News`                                                                                         NA
## `SourceAP S\\u009d\\u009dn\\u009d\\u009dgalaise`                                                         NA
## `SourceAP via Yahoo! New Zealand News`                                                                   NA
## `SourceAP via Yahoo!7 News`                                                                              NA
## SourceAPA                                                                                                NA
## `SourceAPEX Media`                                                                                       NA
## SourceAppAdvice                                                                                          NA
## `SourceAppeal-Democrat`                                                                                  NA
## `SourceApple Insider`                                                                                    NA
## `SourceAppleInsider (press release) (blog)`                                                              NA
## `SourceAppleton Post Crescent`                                                                           NA
## `SourceArab American News`                                                                               NA
## `SourceArab News`                                                                                        NA
## `SourceArab News via Yahoo Maktoob News`                                                                 NA
## `SourceArab Times Kuwait English Daily`                                                                  NA
## SourceArabianBusiness.com                                                                                NA
## SourceARC                                                                                                NA
## SourceArchinect                                                                                          NA
## `SourceArchitectural Digest`                                                                             NA
## SourceArcticStartup                                                                                      NA
## `SourceArizona Capitol Times`                                                                            NA
## `SourceArizona Daily Star`                                                                               NA
## `SourceArizona Daily Sun`                                                                                NA
## `SourceArkansas Business`                                                                                NA
## `SourceArkansas Democrat-Gazette`                                                                        NA
## `SourceArkansas News`                                                                                    NA
## `SourceArkansas Online`                                                                                  NA
## SourceArmeniaNow.com                                                                                     NA
## SourceArmenpress.am                                                                                      NA
## SourceArmyTimes.com                                                                                      NA
## SourceARNnet                                                                                             NA
## `SourceAround the Rings (subscription)`                                                                  NA
## `SourceArs Technica`                                                                              8.418e-01
## `SourceArs Technica UK`                                                                                  NA
## `SourceArt Newspaper`                                                                                    NA
## `SourceArtesia Daily Press`                                                                              NA
## SourceArtforum                                                                                           NA
## SourceArtLyst                                                                                            NA
## `Sourceartnet News`                                                                                      NA
## `SourceArtslink.co.za News (press release)`                                                              NA
## `SourceArutz Sheva`                                                                                      NA
## `SourceAS/COA Online`                                                                                    NA
## `SourceAsahi Shimbun`                                                                                    NA
## SourceAsahi.com                                                                                          NA
## `SourceAsbarez Armenian News`                                                                            NA
## `SourceAsbury Park Press`                                                                                NA
## `SourceAsharq Al-awsat (blog)`                                                                           NA
## `SourceAsharq Al-awsat English`                                                                          NA
## `SourceAsharq Alawsat`                                                                                   NA
## `SourceAsheboro Courier Tribune`                                                                         NA
## `SourceAsheville Citizen-Times`                                                                          NA
## `SourceAsia Pacific Report`                                                                              NA
## `SourceAsia Society`                                                                                     NA
## `SourceAsia Society (blog)`                                                                              NA
## `SourceAsia Times`                                                                                       NA
## `SourceAsian Correspondent`                                                                              NA
## `SourceAsian Image`                                                                                      NA
## `SourceAsian Tribune`                                                                                    NA
## SourceAsiaNews.it                                                                                        NA
## SourceAsiaOne                                                                                            NA
## `SourceAspen Times`                                                                                      NA
## `SourceAssociated Press of Pakistan`                                                                     NA
## `SourceAssociated Press via Yahoo Maktoob News`                                                          NA
## `SourceAssociated Press via Yahoo UK & Ireland Finance`                                                  NA
## `SourceAssociated Press via Yahoo UK & Ireland News`                                                     NA
## `SourceAssociated Press via Yahoo! Finance`                                                       1.339e+00
## `SourceAssociated Press via Yahoo! Finance India`                                                        NA
## `SourceAssociated Press via Yahoo! India News`                                                           NA
## `SourceAssociated Press via Yahoo! New Zealand Finance`                                                  NA
## `SourceAssociated Press via Yahoo! News`                                                          5.517e-01
## `SourceAssociated Press via Yahoo! Philippines News`                                                     NA
## `SourceAssociated Press via Yahoo! Philippines Sports`                                                   NA
## `SourceAssociated Press via Yahoo! Singapore News`                                                       NA
## `SourceAssociated Press via Yahoo! Singapore Sports`                                                     NA
## `SourceAssociated Press via Yahoo!7 Finance`                                                             NA
## `SourceAssociation France Palestine Solidarit\\u009d\\u009d`                                             NA
## `SourceAssociation France Palestine Solidarité`                                                          NA
## `SourceAstana Times`                                                                                     NA
## `SourceAstro Awani`                                                                                      NA
## `SourceAthens Banner-Herald`                                                                             NA
## `SourceAthens Daily Review`                                                                              NA
## `SourceAtlanta Black Star`                                                                               NA
## `SourceAtlanta Business Chronicle`                                                                       NA
## `SourceAtlanta Intown`                                                                                   NA
## `SourceAtlanta Journal-Constitution`                                                                     NA
## `SourceAtlanta Journal Constitution`                                                                     NA
## `SourceAtlanta Journal Constitution (blog)`                                                              NA
## `SourceAtlas Obscura`                                                                                    NA
## `SourceAttack of the Fanboy`                                                                             NA
## SourceATTN                                                                                               NA
## SourceATWOnline                                                                                          NA
## `SourceAuburn Citizen`                                                                                   NA
## `SourceAuburn Citizen (blog)`                                                                            NA
## `SourceAuckland stuff.co.nz`                                                                             NA
## `SourceAugusta Free Press`                                                                               NA
## SourceAusdroid                                                                                           NA
## `SourceAustin American-Statesman`                                                                        NA
## `SourceAustin Business Journal`                                                                          NA
## `SourceAustin Chronicle`                                                                                 NA
## `SourceAustin Inno`                                                                                      NA
## `SourceAustralia-Israel Jewish Affairs Council`                                                          NA
## `SourceAustralia Network News`                                                                           NA
## `SourceAustralian Aviation`                                                                              NA
## `SourceAustralian Broadcasting Corporation`                                                              NA
## `SourceAustralian Business Traveller`                                                                    NA
## `SourceAustralian FourFourTwo`                                                                           NA
## `SourceAustralian Jewish News`                                                                           NA
## `SourceAustralian Policy Online`                                                                         NA
## `SourceAutoblog (blog)`                                                                                  NA
## SourceAutocar                                                                                            NA
## `SourceAutocar India`                                                                                    NA
## Sourceautoevolution                                                                                      NA
## SourceAutoExpress                                                                                        NA
## SourceAutoGuide.com                                                                                      NA
## `SourceAutomation World`                                                                                 NA
## `SourceAutomotive News`                                                                                  NA
## `SourceAutomotive News Europe (registration)`                                                            NA
## `SourceAutomotiveIT International`                                                                       NA
## SourceAutooMobile.com                                                                                    NA
## SourceAutoweek                                                                                           NA
## `SourceAviation Week`                                                                                    NA
## SourceAviationPros.com                                                                                   NA
## `SourceAwful Announcing`                                                                                 NA
## `SourceAxis of Logic`                                                                                    NA
## Sourceazcentral.com                                                                                      NA
## SourceAzerNews                                                                                           NA
## SourceAZFamily                                                                                           NA
## `SourceB\\u009d\\u009do D\\u009d\\u009dn Vit`                                                            NA
## `SourceB2B Marketing Online`                                                                             NA
## SourceB92                                                                                                NA
## `SourceBABW News`                                                                                        NA
## `SourceBahamas Tribune`                                                                                  NA
## `SourceBahrain News Agency`                                                                              NA
## `SourceBalitang America`                                                                                 NA
## `SourceBalkan Insight`                                                                                   NA
## `SourceBalkans.com Business News`                                                                        NA
## `SourceBaltic Times`                                                                                     NA
## `SourceBaltimore Business Journal (blog)`                                                                NA
## `SourceBaltimore Sun`                                                                                    NA
## `SourceBaltimore Sun (blog)`                                                                             NA
## SourceBaltimoreRavens.com                                                                                NA
## `SourceBangalore Mirror`                                                                                 NA
## `SourceBangkok Post`                                                                                     NA
## `SourceBangladesh News 24 hours`                                                                         NA
## `SourceBangor Daily News`                                                                                NA
## `SourceBank of Canada`                                                                                   NA
## `SourceBanking Technology`                                                                               NA
## SourceBankrate.com                                                                                       NA
## `SourceBankrate.com via Yahoo Canada Finance`                                                            NA
## `SourceBankrate.com via Yahoo! Finance`                                                                  NA
## `SourceBarbados Advocate`                                                                                NA
## `SourceBarca Blaugranes (blog)`                                                                          NA
## `SourceBarre Montpelier Times Argus`                                                                     NA
## `SourceBarron's`                                                                                         NA
## `SourceBarron's (blog)`                                                                                  NA
## `SourceBarron&#39;s Online`                                                                              NA
## SourceBaseline                                                                                           NA
## `SourceBaseline (blog)`                                                                                  NA
## `SourceBasic Income News`                                                                                NA
## `SourceBasingstoke Gazette`                                                                              NA
## `SourceBasta !`                                                                                          NA
## `SourceBath Chronicle`                                                                                   NA
## `SourceBattle Creek Enquirer`                                                                            NA
## `SourceBaxter Bulletin`                                                                                  NA
## `SourceBay Area Indymedia`                                                                               NA
## `SourceBay News 9`                                                                                       NA
## `SourceBay Today`                                                                                        NA
## `SourceBaytown Sun`                                                                                      NA
## `SourceBBC News`                                                                                  5.261e+01
## `SourceBBC NI`                                                                                           NA
## `SourceBBC Sport`                                                                                        NA
## `SourceBBC world`                                                                                        NA
## SourceBCBusiness                                                                                         NA
## SourceBDlive                                                                                             NA
## `SourceBeacon Examiner`                                                                                  NA
## SourceBeanstockd                                                                                         NA
## `SourceBearing Arms`                                                                                     NA
## `SourceBeatrice Daily Sun`                                                                               NA
## `SourceBeaumont Enterprise`                                                                              NA
## `SourceBecker's Hospital Review`                                                                         NA
## `SourceBecker's Orthopedic & Spine`                                                                      NA
## `SourceBeckley Register-Herald`                                                                          NA
## `SourceBedford Today`                                                                                    NA
## `SourceBeef Magazine (blog)`                                                                             NA
## `SourceBelarus Digest`                                                                                   NA
## `SourceBelarus News (BelTA)`                                                                             NA
## `SourceBelfast Newsletter`                                                                               NA
## `SourceBelfast Telegraph`                                                                                NA
## `SourceBella Naija`                                                                                      NA
## SourceBellaciao                                                                                          NA
## `SourceBelleville News-Democrat`                                                                         NA
## `SourceBellevue Reporter`                                                                                NA
## `SourceBeloit Daily News`                                                                                NA
## `SourceBenchmark Monitor`                                                                                NA
## `SourceBend Bulletin`                                                                                    NA
## `SourceBenefits Canada`                                                                                  NA
## `SourceBenton Evening News`                                                                              NA
## SourceBenzinga                                                                                           NA
## `SourceBenzinga via Yahoo! Finance`                                                                      NA
## `SourceBerkshire Eagle (subscription)`                                                                   NA
## SourceBernama                                                                                            NA
## SourceBernews                                                                                            NA
## `SourceBerwick Advertiser`                                                                               NA
## `SourceBerwick Today`                                                                                    NA
## SourceBET                                                                                                NA
## `SourceBET (blog)`                                                                                       NA
## SourceBetaBoston                                                                                         NA
## SourceBetaKit                                                                                            NA
## SourceBetaNews                                                                                    5.379e+01
## SourceBGR                                                                                                NA
## `SourceBGR India`                                                                                        NA
## `SourceBGR News via Yahoo! News`                                                                  1.466e+00
## `SourceBharat Press`                                                                                     NA
## `SourceBharat Times`                                                                                     NA
## `SourceBi-College News`                                                                                  NA
## `SourceBidness ETC`                                                                                      NA
## `SourceBig Island Now`                                                                                   NA
## `SourceBig Issue`                                                                                        NA
## `SourceBig News Network.com`                                                                             NA
## `SourceBig Think`                                                                                        NA
## `SourceBig Think (blog)`                                                                                 NA
## `SourceBigPond News`                                                                                     NA
## `SourceBigPond Sport`                                                                                    NA
## SourceBILD                                                                                               NA
## SourceBillboard                                                                                          NA
## `SourceBillings Gazette`                                                                                 NA
## SourceBillMoyers.com                                                                                     NA
## SourceBiography                                                                                          NA
## `SourceBiomass Magazine`                                                                                 NA
## `SourceBiometric Update`                                                                                 NA
## `SourceBirmingham Business Journal`                                                                      NA
## `SourceBirmingham Mail`                                                                                  NA
## `SourceBirmingham Post`                                                                                  NA
## `SourceBismarck Tribune`                                                                                 NA
## SourceBisnow                                                                                             NA
## `Sourcebit-tech.net`                                                                                     NA
## SourceBitbag                                                                                             NA
## `SourceBitcoin Magazine`                                                                                 NA
## SourceBitcoinist.net                                                                                     NA
## `SourcebizEDGE NZ`                                                                                       NA
## SourceBizNews                                                                                            NA
## `SourceBizPac Review`                                                                                    NA
## SourceBizReport                                                                                          NA
## `SourceBizTech Magazine`                                                                                 NA
## `SourceBizTimes.com (Milwaukee)`                                                                         NA
## SourceBLABBERMOUTH.NET                                                                                   NA
## `SourceBlack Agenda Report`                                                                              NA
## `SourceBlack Enterprise`                                                                                 NA
## `SourceBlack Mountain News`                                                                              NA
## SourceBlackburnNews.com                                                                                  NA
## `SourceBlackmore Vale Magazine`                                                                          NA
## SourceBlackNews.com                                                                                      NA
## `SourceBlackNews.com (press release)`                                                                    NA
## `SourceBlasting News`                                                                                    NA
## SourceBlastr                                                                                             NA
## `SourceBleacher Report`                                                                                  NA
## `SourceBleeding Cool News`                                                                               NA
## SourceBlic                                                                                               NA
## `SourceBlockchain News`                                                                                  NA
## `SourceBlogging Censorship`                                                                              NA
## `SourceBloody Disgusting`                                                                                NA
## SourceBloomberg                                                                                  -6.825e+04
## `SourceBloomberg Big Law Business`                                                                       NA
## `SourceBloomberg BNA`                                                                                    NA
## `SourceBloomberg Government (blog)`                                                                      NA
## `SourceBloomberg via Yahoo UK & Ireland Finance`                                                         NA
## `SourceBloomberg via Yahoo! Finance`                                                                     NA
## `SourceBloomberg via Yahoo! Finance India`                                                               NA
## `SourceBloomberg via Yahoo! New Zealand Finance`                                                         NA
## `SourceBloomberg via Yahoo!7 Finance`                                                                    NA
## `SourceBloomberg View`                                                                                   NA
## `SourceBloomer Advance (subscription)`                                                                   NA
## `SourceBloomington Pantagraph`                                                                           NA
## SourceBlorge                                                                                             NA
## `SourceBlue Nation Review`                                                                               NA
## `SourceBluefield Daily Telegraph`                                                                        NA
## `SourceBluffton Today`                                                                                   NA
## `SourceBMWBLOG (blog)`                                                                                   NA
## SourceBnet.com.au                                                                                        NA
## Sourcebnn.ca                                                                                             NA
## `SourceBNO News`                                                                                         NA
## `SourceBob Sullivan.net`                                                                                 NA
## `SourceBobsguide (press release)`                                                                        NA
## `SourceBoing Boing`                                                                                      NA
## `SourceBonham Journal`                                                                                   NA
## `SourceBonner County Daily Bee`                                                                          NA
## `SourceBooks LIVE (blog)`                                                                                NA
## SourceBorderstan                                                                                         NA
## SourceBostInno                                                                                           NA
## `SourceBoston Business Journal`                                                                          NA
## `SourceBoston Business Journal (blog)`                                                                   NA
## `SourceBoston Herald`                                                                                    NA
## `SourceBoston Review`                                                                                    NA
## SourceBoston.com                                                                                         NA
## `SourceBoulder Daily Camera`                                                                             NA
## `SourceBoulder Weekly`                                                                                   NA
## `SourceBournemouth Echo`                                                                                 NA
## `SourceBowling Green Daily News`                                                                         NA
## SourceBoxscore                                                                                           NA
## `SourceBrad Jones, Digital Trends via Yahoo! News`                                                       NA
## `SourceBradenton Herald`                                                                                 NA
## `SourceBradford Telegraph`                                                                               NA
## `SourceBradford Telegraph and Argus`                                                                     NA
## `SourceBrampton Guardian`                                                                                NA
## `SourceBrandon Sun`                                                                                      NA
## `SourceBrattleboro Reformer`                                                                             NA
## `SourceBrave New Coin`                                                                                   NA
## `SourceBrazil-Arab News Agency (ANBA)`                                                                   NA
## `SourceBreaking Belize News (blog)`                                                                      NA
## `SourceBreaking Israel News`                                                                             NA
## SourceBreakingNews.com                                                                                   NA
## SourceBreakingNews.ie                                                                                    NA
## SourceBreakingviews                                                                                      NA
## SourceBREATHEcast                                                                                        NA
## `SourceBreitbart News`                                                                                   NA
## `SourceBretton Woods Observer`                                                                           NA
## `SourceBrian Madden (blog)`                                                                              NA
## `SourceBrides.com (blog)`                                                                                NA
## `SourceBriefing.com via Yahoo! Finance`                                                                  NA
## SourceBright                                                                                             NA
## `SourceBright Green`                                                                                     NA
## `SourceBrisbane Times`                                                                                   NA
## `SourceBristol Herald Courier`                                                                           NA
## `SourceBristol Herald Courier (press release) (blog)`                                                    NA
## `SourceBristol Post`                                                                                     NA
## `SourceBristol Press`                                                                                    NA
## `SourceBritish Journal of Photography`                                                                   NA
## `SourceBroadband TV News`                                                                                NA
## SourceBroadcaster                                                                                        NA
## `SourceBroadcasting & Cable`                                                                             NA
## SourceBroadly                                                                                            NA
## `SourceBrookings Institution`                                                                            NA
## `SourceBrookings Institution (blog)`                                                                     NA
## `SourceBrookson (press release) (blog)`                                                                  NA
## `SourceBrown County Democrat`                                                                            NA
## `SourceBrownwood Bulletin`                                                                               NA
## SourceBruDirect.com                                                                                      NA
## `SourceBryan-College Station Eagle`                                                                      NA
## SourceBT.com                                                                                             NA
## `SourceBU Today`                                                                                         NA
## `SourceBuckingham Advertiser`                                                                            NA
## SourceBucks.com                                                                                          NA
## `SourceBudapest Business Journal`                                                                        NA
## `SourceBudapest Times`                                                                                   NA
## `SourceBuenos Aires Herald`                                                                              NA
## `SourceBuffalo Business First`                                                                           NA
## `SourceBuffalo News`                                                                                     NA
## `SourceBuilder Magazine`                                                                                 NA
## `SourceBullard Banner News`                                                                              NA
## `SourceBulletin of the Atomic Scientists`                                                                NA
## `SourceBunbury Mail`                                                                                     NA
## `SourceBundaberg News Mail`                                                                              NA
## `SourceBurlington County Times (subscription)`                                                           NA
## `SourceBurlington Times News`                                                                            NA
## SourceBurlingtonFreePress.com                                                                            NA
## `SourceBusiness 2 Community`                                                                             NA
## `SourceBusiness Cloud News`                                                                              NA
## `SourceBusiness Cornwall Magazine`                                                                       NA
## `SourceBusiness Finance News`                                                                            NA
## `SourceBusiness Green`                                                                                   NA
## `SourceBusiness Green (blog)`                                                                            NA
## `SourceBusiness In Savannah`                                                                             NA
## `SourceBusiness in Vancouver`                                                                            NA
## `SourceBusiness Insider`                                                                          1.677e+00
## `SourceBusiness Insider Australia`                                                                       NA
## `SourceBusiness Insider Nordic`                                                                          NA
## `SourceBusiness Insider UK`                                                                              NA
## `SourceBusiness Insider UK Finance via Yahoo Canada Finance`                                      1.108e+00
## `SourceBusiness Insider UK Finance via Yahoo UK & Ireland Finance`                                1.257e+00
## `SourceBusiness Insider UK Finance via Yahoo! Finance India`                                             NA
## `SourceBusiness Insider via Yahoo Canada Finance`                                                        NA
## `SourceBusiness Insider via Yahoo Maktoob News`                                                          NA
## `SourceBusiness Insider via Yahoo UK & Ireland Finance`                                                  NA
## `SourceBusiness Insider via Yahoo! Finance`                                                      -2.252e+15
## `SourceBusiness Insider via Yahoo! Finance India`                                                        NA
## `SourceBusiness Insider via Yahoo! India News`                                                           NA
## `SourceBusiness Insurance`                                                                               NA
## `SourceBusiness Management Daily`                                                                        NA
## `SourceBusiness MattersBusiness Matters`                                                                 NA
## `SourceBusiness Mirror`                                                                                  NA
## `SourceBusiness News`                                                                                    NA
## `SourceBusiness News Americas`                                                                           NA
## `SourceBusiness News Americas (subscription)`                                                            NA
## `SourceBusiness News Daily`                                                                              NA
## `SourceBusiness News Wales (press release)`                                                              NA
## `SourceBusiness Recorder`                                                                                NA
## `SourceBusiness Recorder (press release) (registration) (blog)`                                          NA
## `SourceBusiness Reporter`                                                                                NA
## `SourceBusiness Review`                                                                                  NA
## `SourceBusiness Solutions Magazine`                                                                      NA
## `SourceBusiness Spectator`                                                                               NA
## `SourceBusiness Standard`                                                                                NA
## `SourceBusiness Standard (press release) (registration) (blog)`                                          NA
## `SourceBusiness Standard India`                                                                          NA
## `SourceBusiness Times of Western Colorado`                                                               NA
## `SourceBusiness Today`                                                                                   NA
## `SourceBusiness Travel News`                                                                             NA
## `SourceBusiness Traveller`                                                                               NA
## `SourceBusiness Weekly`                                                                                  NA
## `SourceBusiness Wire`                                                                                    NA
## `SourceBusiness Wire (press release)`                                                                    NA
## `SourceBusiness Wire via Yahoo Canada Finance`                                                           NA
## `SourceBusiness Wire via Yahoo UK & Ireland Finance`                                                     NA
## `SourceBusiness Wire via Yahoo! Finance`                                                                 NA
## `SourceBusiness Wire via Yahoo! Finance India`                                                           NA
## `SourceBusiness Wire via Yahoo! New Zealand Finance`                                                     NA
## SourceBusiness.com                                                                                       NA
## SourceBusinessBecause                                                                                    NA
## SourceBusinessDay                                                                                        NA
## `SourceBusinessDesk via Yahoo! New Zealand Finance`                                                      NA
## `SourceBusinessinsider India`                                                                            NA
## SourceBusinessKorea                                                                                      NA
## SourceBusinessNorth.com                                                                                  NA
## SourceBusinessTech                                                                                       NA
## `SourceBusinessWorld Online`                                                                             NA
## `SourceBusinessWorld Online Edition`                                                                     NA
## SourceBustle                                                                                             NA
## `SourceBuying Business Travel`                                                                           NA
## `SourceBuzzFeed News`                                                                                    NA
## SourceBwog                                                                                               NA
## `SourceByron Shire News`                                                                                 NA
## SourceCainTV                                                                                             NA
## `SourceCaixin Media`                                                                                     NA
## `SourceCalcutta News`                                                                                    NA
## `SourceCalcutta Telegraph`                                                                               NA
## `SourceCalgary Herald`                                                                                   NA
## `SourceCalgary Sun`                                                                                      NA
## `SourceCalifornia Economy Reporting`                                                                     NA
## `SourceCambridge Community Television`                                                                   NA
## `SourceCambridge Evening News`                                                                           NA
## `SourceCambridge News`                                                                                   NA
## `SourceCampaign Asia-Pacific`                                                                            NA
## SourceCampaignLive                                                                                       NA
## `SourceCampus Reform`                                                                                    NA
## `SourceCampus Technology`                                                                                NA
## `SourceCampus Watch`                                                                                     NA
## `SourceCanada Free Press`                                                                                NA
## `SourceCanada NewsWire (press release)`                                                                  NA
## `SourceCanada Politics via Yahoo Canada News`                                                            NA
## SourceCanada.com                                                                                         NA
## `SourceCanadian HR Reporter`                                                                             NA
## `SourceCanadian Jewish News`                                                                             NA
## `SourceCanadian Jewish News (blog)`                                                                      NA
## `SourceCanadian Mining Journal`                                                                          NA
## `SourceCanadian Mortgage Broker News`                                                                    NA
## `SourceCanadian Reviewer`                                                                                NA
## SourceCanadianBusiness.com                                                                               NA
## `SourceCanadianBusiness.com (blog)`                                                                      NA
## `SourceCanberra Times`                                                                                   NA
## SourceCanoe                                                                                       1.875e+00
## `SourceCAPA - Centre for Aviation`                                                                       NA
## `SourceCape Breton Post`                                                                                 NA
## `SourceCape Business News`                                                                               NA
## `SourceCape Business News South Africa Business`                                                         NA
## SourceCapeTalk                                                                                           NA
## `SourceCapital City Weekly`                                                                              NA
## `SourceCapital FM Kenya (press release) (blog)`                                                          NA
## `SourceCapital Public Radio News`                                                                        NA
## `SourceCapital.gr (press release)`                                                                       NA
## SourceCapitalGazette.com                                                                                 NA
## `SourceCar and Driver (blog)`                                                                            NA
## SourceCarAdvice                                                                                          NA
## `SourceCarbon Brief`                                                                                     NA
## `SourceCarbonated.tv (blog)`                                                                             NA
## SourceCarBuzz                                                                                            NA
## SourceCardPlayer.com                                                                                     NA
## SourceCare2.com                                                                                          NA
## `SourceCaribbean360.com (subscription)`                                                                  NA
## `SourceCarlisle Sentinel`                                                                                NA
## `SourceCarlsbad Current-Argus`                                                                           NA
## `SourceCarnegie Endowment for International Peace`                                                       NA
## `SourceCarnegie Europe`                                                                                  NA
## SourceCarolinacoastonline                                                                                NA
## `SourceCarroll County Times`                                                                             NA
## `SourceCarscoops (blog)`                                                                                 NA
## `SourceCarteret County News-Times`                                                                       NA
## `SourceCasper Star-Tribune Online`                                                                       NA
## SourceCastanet.net                                                                                       NA
## `SourceCatch News`                                                                                       NA
## `SourceCatholic Culture`                                                                                 NA
## `SourceCatholic Herald`                                                                                  NA
## `SourceCatholic Herald Online`                                                                           NA
## `SourceCatholic New York`                                                                                NA
## `SourceCatholic News Agency`                                                                             NA
## `SourceCatholic News Service`                                                                            NA
## `SourceCatholic Online`                                                                                  NA
## `SourceCatholic University of America The Tower`                                                         NA
## `SourceCato Institute`                                                                                   NA
## `SourceCato Institute (blog)`                                                                            NA
## `SourceCayman Compass (press release) (registration)`                                                    NA
## `SourceCayman News Service`                                                                              NA
## `SourceCBBC Newsround`                                                                                   NA
## `SourceCBC Edmonton`                                                                                     NA
## `SourceCBC Montreal`                                                                                     NA
## `SourceCBC Newfoundland and Labrador`                                                                    NA
## `SourceCBC via Yahoo Canada News`                                                                        NA
## SourceCBC.ca                                                                                             NA
## `SourceCBS 19 Tyler`                                                                                     NA
## `SourceCBS 2 Los Angeles`                                                                                NA
## `SourceCBS 46 News Atlanta`                                                                              NA
## `SourceCBS 5 Phoenix`                                                                                    NA
## `SourceCBS 6 Richmond`                                                                                   NA
## `SourceCBS 8 San Diego`                                                                                  NA
## `SourceCBS Baltimore`                                                                                    NA
## `SourceCBS Chicago`                                                                                      NA
## `SourceCBS Dallas - Fort Worth`                                                                          NA
## `SourceCBS Denver`                                                                                       NA
## `SourceCBS Detroit`                                                                                      NA
## `SourceCBS Local`                                                                                        NA
## `SourceCBS Miami`                                                                                        NA
## `SourceCBS Minnesota`                                                                                    NA
## `SourceCBS MoneyWatch`                                                                                   NA
## `SourceCBS MoneyWatch via Yahoo! Finance`                                                                NA
## `SourceCBS New York`                                                                                     NA
## `SourceCBS News`                                                                                         NA
## `SourceCBS Philadelphia`                                                                                 NA
## `SourceCBS Pittsburgh`                                                                                   NA
## `SourceCBS San Francisco`                                                                                NA
## `SourceCBS Sports`                                                                                       NA
## `SourceCBS sports.com (blog)`                                                                            NA
## SourceCBSSports.com                                                                                      NA
## SourceCCM                                                                                                NA
## SourceCCTV                                                                                               NA
## `SourceCCTV-America`                                                                                     NA
## `SourceCDA News`                                                                                         NA
## `SourceCebu Daily News`                                                                                  NA
## `SourceCebu Tech Blogger`                                                                                NA
## `SourceCecil Whig`                                                                                       NA
## SourceCedarCreekLake.com                                                                                 NA
## `SourceCelebrating Progress Africa`                                                                      NA
## `SourceCellular News`                                                                                    NA
## `SourceCentenary News`                                                                                   NA
## `SourceCenter For American Progress`                                                                     NA
## `SourceCenter for Research on Globalization`                                                             NA
## `SourceCenter for Strategic and International Studies`                                                   NA
## `SourceCentral Chronicle`                                                                                NA
## `SourceCentral Florida Future`                                                                           NA
## `SourceCentral Penn Business Journal`                                                                    NA
## `SourceCentral Washington University`                                                                    NA
## `SourceCentre Daily Times`                                                                               NA
## `SourceCeylon Daily News`                                                                                NA
## `SourceCFA Institute Enterprising Investor (blog)`                                                       NA
## `SourceCFJC Today Kamloops`                                                                              NA
## SourceCFO                                                                                                NA
## `SourceCGMA Magazine`                                                                                    NA
## `SourceChampaign/Urbana News-Gazette`                                                                    NA
## SourceChampion                                                                                           NA
## `SourceChandigarh Tribune`                                                                               NA
## `SourceChannel 24`                                                                                       NA
## `SourceChannel 4 News`                                                                                   NA
## `SourceChannel 4 News (blog)`                                                                            NA
## `SourceChannel 8 San Diego`                                                                              NA
## `SourceChannel Insider`                                                                                  NA
## `SourceChannel News Asia`                                                                                NA
## `SourceChannel NewsAsia`                                                                                 NA
## `SourceChannel Partners`                                                                                 NA
## `SourceChannel Partners (blog)`                                                                          NA
## `SourceChannel Pro`                                                                                      NA
## `SourceChannel3000.com - WISC-TV3`                                                                       NA
## SourceChannel4000.com                                                                                    NA
## SourceChannelBiz                                                                                         NA
## SourceChannelBuzz.ca                                                                                     NA
## `SourceChannelLife Australia`                                                                            NA
## `SourceChannelLife NZ`                                                                                   NA
## SourceChannelnomics                                                                                      NA
## `SourceChannelnomics EU (registration)`                                                                  NA
## `SourceCHANNELS TELEVISION`                                                                              NA
## `SourceCharisma News`                                                                                    NA
## `SourceCharleston Gazette-Mail (subscription)`                                                           NA
## `SourceCharleston Post Courier`                                                                          NA
## `SourceCharleston Post Courier (press release)`                                                          NA
## `SourceCharlotte Business Journal`                                                                       NA
## `SourceCharlotte Business Journal (blog)`                                                                NA
## `SourceCharlotte Observer`                                                                               NA
## SourceChartAttack                                                                                        NA
## `SourceCharter 97`                                                                                       NA
## `SourceChase News & Stories`                                                                             NA
## `SourceChattanooga Times Free Press`                                                                     NA
## SourceChemicalOnline                                                                                     NA
## `SourceCherry Hill Courier Post`                                                                         NA
## `SourceCherwell Online`                                                                                  NA
## `SourceChicago Business Journal`                                                                         NA
## `SourceChicago Daily Herald`                                                                             NA
## `SourceChicago Inno`                                                                                     NA
## `SourceChicago Reader`                                                                                   NA
## `SourceChicago Sun-Times`                                                                                NA
## `SourceChicago Tonight | WTTW`                                                                           NA
## `SourceChicago Tribune`                                                                           7.661e-01
## SourceChicagoist                                                                                         NA
## `SourceChicagoNow (blog)`                                                                                NA
## `SourceChichester Observer`                                                                              NA
## `SourceChillicothe Gazette`                                                                              NA
## `SourceChilliwack Progress`                                                                              NA
## `SourceChina Daily`                                                                                      NA
## `SourceChina Daily HK Edition`                                                                           NA
## `SourceChina Digital Times`                                                                              NA
## `SourceChina Economic Net`                                                                               NA
## `SourceChina Economic Review`                                                                            NA
## `SourceChina Post`                                                                                       NA
## SourceChina.org.cn                                                                                       NA
## `SourceChinadaily USA`                                                                                   NA
## SourceChinaFile                                                                                          NA
## SourceChinapost                                                                                          NA
## SourceChinatopix                                                                                         NA
## SourceChinaTopix                                                                                         NA
## `SourceChip Chick`                                                                                       NA
## SourceCHOICE                                                                                             NA
## `SourceChristian Broadcasting Network`                                                                   NA
## `SourceChristian Daily`                                                                                  NA
## `SourceChristian News Network`                                                                           NA
## `SourceChristian Post`                                                                                   NA
## `SourceChristian Science Monitor`                                                                        NA
## `SourceChristian Science Monitor via Yahoo Canada News`                                                  NA
## `SourceChristian Science Monitor via Yahoo UK & Ireland News`                                            NA
## `SourceChristian Science Monitor via Yahoo! News`                                                        NA
## `SourceChristian Today`                                                                                  NA
## SourceChristianityToday.com                                                                              NA
## SourceChristianToday                                                                                     NA
## SourceChron.com                                                                                          NA
## `SourceChron.com (blog)`                                                                                 NA
## SourceChronicle                                                                                          NA
## `SourceChronicle of Higher Education (subscription)`                                                     NA
## `SourceChronicle of Higher Education (subscription) (blog)`                                              NA
## `SourceChronicle of Philanthropy (subscription)`                                                         NA
## SourceChronicleLive                                                                                      NA
## `SourceChurch Militant`                                                                                  NA
## `SourceChurch Times`                                                                                     NA
## `SourceCihan News Agency`                                                                                NA
## SourceCILISOS.MY                                                                                         NA
## `SourceCincinnati Business Courier`                                                                      NA
## `SourceCincinnati Business Courier (blog)`                                                               NA
## SourceCincinnati.com                                                                                     NA
## `SourceCincinnati.com (blog)`                                                                            NA
## `SourceCinema Blend`                                                                                     NA
## SourceCInewsNow                                                                                          NA
## SourceCIO                                                                                                NA
## `SourceCIO Australia`                                                                                    NA
## `SourceCIO Dive`                                                                                         NA
## `SourceCIO Insight`                                                                                      NA
## `SourceCIO New Zealand`                                                                                  NA
## `SourceCIO Today`                                                                                        NA
## `SourceCIO UK`                                                                                           NA
## `SourceCIOReview (press release)`                                                                        NA
## SourceCirculate                                                                                          NA
## `SourceCities Today`                                                                                     NA
## SourceCitifmonline                                                                                       NA
## SourceCitizen                                                                                            NA
## `SourceCitizen TV (press release)`                                                                       NA
## `SourceCitizens Voice`                                                                                   NA
## `SourceCitrus County Chronicle`                                                                          NA
## `SourceCity & County of San Francisco (press release)`                                                   NA
## `SourceCity A.M.`                                                                                        NA
## `SourceCity Limits`                                                                                      NA
## `SourceCity Pages`                                                                                       NA
## SourceCityLab                                                                                            NA
## SourceCityMetric                                                                                         NA
## SourceCityNews                                                                                           NA
## SourceCitywire.co.uk                                                                                     NA
## `SourceCivil Society Media`                                                                              NA
## `SourceCIWM Journal Online`                                                                              NA
## SourceCJOB                                                                                               NA
## `SourceCKGSB Knowledge`                                                                                  NA
## `SourceCKNW News Talk 980`                                                                               NA
## SourceClaimsJournal.com                                                                                  NA
## SourceClapway                                                                                            NA
## `SourceClaremore Daily Progress`                                                                         NA
## `SourceClarence Valley Daily Examiner`                                                                   NA
## `SourceClarksville Leaf Chronicle`                                                                       NA
## `SourceClay County Times-Democrat`                                                                       NA
## SourceCleanTechnica                                                                                      NA
## `SourceCleveland 19 News`                                                                                NA
## Sourcecleveland.com                                                                                      NA
## `SourceClick Green`                                                                                      NA
## SourceClickOnDetroit                                                                                     NA
## `SourceClimate Central`                                                                                  NA
## `SourceClimate Home`                                                                                     NA
## `SourceClinton Herald`                                                                                   NA
## `SourceCloud Computing Intelligence (registration)`                                                      NA
## `SourceCloud Pro`                                                                                        NA
## `SourceCloud Tech`                                                                                       NA
## SourceCloudTech                                                                                          NA
## SourceCloudWedge                                                                                         NA
## `SourceCLTV Chicago`                                                                                     NA
## SourceCMSWire                                                                                            NA
## SourceCNBC                                                                                       -2.603e+02
## `SourceCNBC (subscription)`                                                                              NA
## `SourceCNBC via Yahoo Canada Finance`                                                                    NA
## `SourceCNBC via Yahoo! Finance`                                                                   6.258e-01
## `SourceCNBC via Yahoo! Finance India`                                                                    NA
## `SourceCNBC via Yahoo! New Zealand Finance`                                                              NA
## `SourceCNBC via Yahoo!7 Finance`                                                                         NA
## SourceCNBCAfrica.com                                                                                     NA
## SourceCNET                                                                                               NA
## `SourceCNET en español via Yahoo! News`                                                                  NA
## `SourceCNET UK`                                                                                   1.443e+02
## `SourceCNET via Yahoo! Finance`                                                                          NA
## `SourceCNET via Yahoo! News`                                                                             NA
## SourceCNN                                                                                                NA
## `SourceCNN International`                                                                                NA
## `SourceCNN Money`                                                                                        NA
## `SourceCNN Philippines`                                                                                  NA
## SourceCNN.com                                                                                            NA
## SourceCNNMoney                                                                                           NA
## SourceCNSNews.com                                                                                        NA
## `SourceCNSNews.com (blog)`                                                                               NA
## `SourceCNW Group via Yahoo Canada Finance`                                                               NA
## `SourceCNW Group via Yahoo! Finance`                                                                     NA
## `SourceCo-operative News`                                                                                NA
## SourceCo.Create                                                                                          NA
## SourceCo.Design                                                                                          NA
## `SourceCo.Design (blog)`                                                                                 NA
## SourceCo.Exist                                                                                           NA
## `SourceCoAssets via Yahoo! Singapore News`                                                               NA
## `SourceCoast Reporter`                                                                           -4.504e+15
## `SourceCochrane Times`                                                                                   NA
## `SourceCoconuts Bangkok`                                                                                 NA
## `SourceCoconuts Hong Kong`                                                                               NA
## `SourceCoffs Coast Advocate`                                                                             NA
## SourceCoinDesk                                                                                           NA
## SourceCoinReport                                                                                         NA
## SourceCoinTelegraph                                                                                      NA
## `SourceColombia Reports`                                                                                 NA
## `SourceColombo Gazette`                                                                                  NA
## `SourceColorado Springs Gazette`                                                                         NA
## `SourceColorLines magazine`                                                                              NA
## `SourceColumbia Daily Herald`                                                                            NA
## `SourceColumbia Daily Tribune`                                                                           NA
## `SourceColumbia Journalism Review`                                                                       NA
## `SourceColumbia Missourian`                                                                              NA
## `SourceColumbus Business First`                                                                          NA
## `SourceColumbus Dispatch`                                                                                NA
## `SourceColumbus Dispatch (blog)`                                                                         NA
## `SourceColumbus Ledger-Enquirer`                                                                         NA
## `SourceComcast SportsNet Philadelphia`                                                                   NA
## `SourceComet 24`                                                                                         NA
## SourceComicbook.com                                                                                      NA
## `SourceCommBank MyWealth`                                                                                NA
## `SourceCommentary Magazine`                                                                              NA
## `SourceCommercial Property Executive`                                                                    NA
## `SourceCommittee for Accuracy in Middle East Reporting in America`                                       NA
## `SourceCommittee for Accuracy in Middle East Reporting in America (blog)`                                NA
## `SourceCommon Dreams (press release)`                                                                    NA
## SourceCommonDreams.org                                                                                   NA
## SourceCommonSpace                                                                                        NA
## `SourceCommonweal (blog)`                                                                                NA
## `SourceCommonWealth magazine`                                                                            NA
## `SourceCommunist Party USA`                                                                              NA
## `SourceCommunity Financial News`                                                                         NA
## `SourceComox Valley Record`                                                                              NA
## `SourceComplete Music Update`                                                                            NA
## SourceComplex                                                                                            NA
## `SourceComputer Business Review`                                                                         NA
## `SourceComputer Dealer News`                                                                             NA
## `SourceComputer Weekly`                                                                                  NA
## `SourceComputer World Australia`                                                                         NA
## SourceComputerWeekly.com                                                                                 NA
## `SourceComputerWeekly.com (blog)`                                                                        NA
## SourceComputerworld                                                                                      NA
## `SourceComputerworld Australia`                                                                          NA
## `SourceComputerworld New Zealand`                                                                        NA
## SourceComputerworldUK                                                                                    NA
## SourceComputing                                                                                          NA
## SourceComputing.co.uk                                                                                    NA
## `SourceConcord Monitor`                                                                                  NA
## `SourceConcord Transcript`                                                                               NA
## `SourceCond\\u009d\\u009d Nast Traveler`                                                                 NA
## `SourceCondé Nast Traveller`                                                                             NA
## `SourceConnecticut Jewish Ledger`                                                                        NA
## `SourceConnecticut Post`                                                                                 NA
## `SourceConsequence of Sound (blog)`                                                                      NA
## `SourceConservative Home`                                                                                NA
## `SourceConsortium News`                                                                                  NA
## Sourceconsortiumnews.com                                                                                 NA
## `SourceConstitution Daily (blog)`                                                                        NA
## `SourceConstruction Week Online`                                                                         NA
## SourceConsultancy.uk                                                                                     NA
## `SourceConsumer Reports via Yahoo Canada Finance`                                                        NA
## `SourceConsumer Reports via Yahoo! Finance`                                                              NA
## `SourceContra Costa Times`                                                                               NA
## `SourceContractor UK`                                                                                    NA
## `SourceCoos Bay World`                                                                                   NA
## `SourceCops 2.0`                                                                                         NA
## `SourceCordele Dispatch`                                                                                 NA
## `SourceCorn and Soybean Digest (blog)`                                                                   NA
## `SourceCornell Chronicle`                                                                                NA
## `SourceCornell University The Cornell Daily Sun`                                                         NA
## `SourceCornish Guardian`                                                                                 NA
## `SourceCorpus Christi Caller-Times`                                                                      NA
## `SourceCorsicana Daily Sun`                                                                              NA
## `SourceCorvallis Gazette Times`                                                                          NA
## `SourceCorvus Business Newswire`                                                                         NA
## SourceCosmopolitan.com                                                                                   NA
## `SourceCoStar Group`                                                                                     NA
## `SourceCotswold Journal`                                                                                 NA
## `SourceCouncil on Foreign Relations`                                                                     NA
## `SourceCouncil on Foreign Relations (blog)`                                                              NA
## `SourceCounsel & Heal`                                                                                   NA
## SourceCounterCurrents.org                                                                                NA
## SourceCounterPunch                                                                                       NA
## `SourceCourier Mail`                                                                                     NA
## `SourceCoventry City FC`                                                                                 NA
## `SourceCoventry Telegraph`                                                                               NA
## `SourceCP24 Toronto's Breaking News`                                                                     NA
## `SourceCPI Financial`                                                                                    NA
## `SourceCQ Politics`                                                                                      NA
## SourceCrackBerry.com                                                                                     NA
## `SourceCrain's Chicago Business`                                                                         NA
## `SourceCrain's Chicago Business (blog)`                                                                  NA
## `SourceCrain's Cleveland Business`                                                                       NA
## `SourceCrain's Detroit Business`                                                                         NA
## `SourceCrain's Detroit Business (blog)`                                                                  NA
## `SourceCrain's New York Business`                                                                        NA
## `SourceCrain's New York Business (blog)`                                                                 NA
## `SourceCrain&#39;s New York Business`                                                                    NA
## `SourceCrave Online`                                                                                     NA
## `SourceCreamer Media's Engineering News`                                                                 NA
## `SourceCreamer Media's Mining Weekly`                                                                    NA
## SourceCreativity                                                                                         NA
## `SourceCredit.com via Yahoo! Finance`                                                                    NA
## SourceCRIENGLISH.com                                                                                     NA
## SourceCrikey                                                                                             NA
## `SourceCrikey (registration)`                                                                            NA
## SourceCRN                                                                                                NA
## `SourceCRN - UK`                                                                                         NA
## `SourceCRN Australia`                                                                                    NA
## `SourceCrookston Daily Times`                                                                            NA
## `SourceCross Rhythms`                                                                                    NA
## `SourceCrowdfund Insider`                                                                                NA
## SourceCrowdsourcing.org                                                                                  NA
## `SourceCrux: Covering all things Catholic`                                                               NA
## SourceCryptoCoinsNews                                                                                    NA
## `SourceCSO Australia`                                                                                    NA
## `SourceCSO Online`                                                                                       NA
## SourceCSPnet.com                                                                                         NA
## `SourceCSRwire.com (press release)`                                                                      NA
## `SourceCT Post`                                                                                          NA
## SourceCTR                                                                                                NA
## `SourceCTV British Columbia News`                                                                        NA
## `SourceCTV Calgary News`                                                                                 NA
## `SourceCTV Montreal News`                                                                                NA
## `SourceCTV News`                                                                                         NA
## `SourceCTV Ottawa News`                                                                                  NA
## `SourceCTV Toronto`                                                                                      NA
## SourceCTV.ca                                                                                             NA
## `SourceCU Boulder News & Events`                                                                         NA
## `SourceCU Columbia Spectator`                                                                            NA
## `SourceCult of Mac`                                                                                      NA
## SourceCurbed                                                                                             NA
## `SourceCurbed Chicago`                                                                                   NA
## `SourceCurbed DC`                                                                                        NA
## `SourceCustomer Think`                                                                                   NA
## `SourceCW39 NewsFix`                                                                                     NA
## SourceCXOToday.com                                                                                       NA
## `SourceCycling Weekly`                                                                                   NA
## `SourceCyprus Mail`                                                                                      NA
## `SourceCzech Happenings`                                                                                 NA
## `SourceD Magazine`                                                                                       NA
## `SourceDaiji World`                                                                                      NA
## SourceDaijiworld.com                                                                                     NA
## `SourceDaily American Online`                                                                            NA
## `SourceDaily Astorian`                                                                                   NA
## `SourceDaily Aztec`                                                                                      NA
## `SourceDaily Beast`                                                                                      NA
## `SourceDaily Bruin`                                                                                      NA
## `SourceDaily Californian`                                                                                NA
## `SourceDaily Caller`                                                                                     NA
## `SourceDaily Capital (Capital TV)`                                                                       NA
## `SourceDaily Commercial`                                                                                 NA
## `SourceDaily Courier`                                                                                    NA
## `SourceDaily Democrat`                                                                                   NA
## `SourceDaily Echo`                                                                                       NA
## `SourceDaily Excelsior`                                                                                  NA
## `SourceDaily Express`                                                                                    NA
## `SourceDaily Free Press (subscription)`                                                                  NA
## `SourceDaily Herald`                                                                                     NA
## `SourceDaily Journal`                                                                                    NA
## `SourceDaily Kos`                                                                                        NA
## `SourceDaily Life`                                                                                       NA
## `SourceDaily Local News`                                                                                 NA
## `SourceDaily Mail`                                                                                5.380e+01
## `SourceDaily Maverick`                                                                                   NA
## `SourceDaily Mirror`                                                                                     NA
## `SourceDaily News`                                                                                       NA
## `SourceDaily News & Analysis`                                                                            NA
## `SourceDaily News | The National Newspaper (press release) (blog)`                                       NA
## `SourceDaily News Egypt`                                                                                 NA
## `SourceDaily Nexus`                                                                                      NA
## `SourceDaily NK`                                                                                         NA
## `SourceDaily Northwestern`                                                                               NA
## `SourceDaily Pakistan`                                                                                   NA
## `SourceDaily Pioneer`                                                                                    NA
## `Sourcedaily post`                                                                                       NA
## `SourceDaily Post Nigeria`                                                                               NA
## `SourceDaily Post North Wales`                                                                           NA
## `SourceDaily Press`                                                                                      NA
## `SourceDaily Reckoning - Australian Edition`                                                             NA
## `SourceDaily Record`                                                                                     NA
## `SourceDaily Sabah`                                                                                      NA
## `SourceDaily Signal`                                                                                     NA
## `SourceDaily Star`                                                                                       NA
## `SourceDaily Star Gazette`                                                                               NA
## `SourceDaily Sun`                                                                                        NA
## `SourceDaily Telegraph`                                                                                  NA
## `SourceDaily Times`                                                                                      NA
## `SourceDaily Times Nigeria`                                                                              NA
## `SourceDaily Trojan Online`                                                                              NA
## `SourceDaily Trust`                                                                                      NA
## `SourceDaily Yonder`                                                                                     NA
## SourceDailyFinance                                                                                       NA
## SourceDailyForex.com                                                                                     NA
## SourceDailyFX                                                                                            NA
## `SourceDailyFX via Yahoo! Finance`                                                                       NA
## `SourceDailyFX via Yahoo! New Zealand Finance`                                                           NA
## `SourceDailyFX via Yahoo!7 Finance`                                                                      NA
## SourceDailyNews                                                                                          NA
## SourceDailyO                                                                                             NA
## `SourceDailyPost Nigeria`                                                                                NA
## Sourcedailytelegraph.com.au                                                                              NA
## SourceDailyuw                                                                                            NA
## `SourceDakota Financial News`                                                                            NA
## `SourceDallas Business Journal`                                                                          NA
## `SourceDallas Business Journal (blog)`                                                                   NA
## `SourceDallas Morning News`                                                                              NA
## `SourceDallas Morning News (blog)`                                                                       NA
## `SourceDallas Sun Times`                                                                                 NA
## `SourceDanbury News Times`                                                                               NA
## `SourceDarien News-Review`                                                                               NA
## `SourceDark Reading`                                                                                     NA
## `SourceData Center Knowledge`                                                                            NA
## SourceDatamation                                                                                         NA
## SourceDatanami                                                                                           NA
## SourceDATAQUEST                                                                                          NA
## `SourceDavid Curry, Digital Trends via Yahoo! News`                                                      NA
## SourceDawn                                                                                               NA
## SourceDAWN.com                                                                                           NA
## `SourceDay Herald`                                                                                       NA
## `SourceDayton Business Journal`                                                                          NA
## `SourceDayton Daily News`                                                                                NA
## `SourceDaytona Beach News-Journal`                                                                       NA
## `SourceDazeinfo (blog)`                                                                                  NA
## `SourceDC Inno`                                                                                          NA
## SourceDCist.com                                                                                          NA
## `SourceDe Dagelijkse Standaard (Blog)`                                                                   NA
## `SourceDe Montfort University (press release)`                                                           NA
## SourceDeadline                                                                                           NA
## `SourceDeadline Hollywood`                                                                               NA
## SourceDeadspin                                                                                           NA
## SourceDealBreaker                                                                                        NA
## SourceDEALSTREETASIA                                                                                     NA
## `SourceDeath and Taxes`                                                                                  NA
## `SourceDEBKA file`                                                                                       NA
## SourceDEBKAfile                                                                                          NA
## `SourceDeccan Chronicle`                                                                                 NA
## `SourceDeccan Herald`                                                                                    NA
## SourceDeepika                                                                                            NA
## `SourceDefense One`                                                                                      NA
## SourceDefenseNews.com                                                                                    NA
## `SourceDeKalb Daily Chronicle`                                                                           NA
## `SourceDelaware First Media`                                                                             NA
## SourceDelimiter                                                                                          NA
## `SourceDelmarva Daily Times`                                                                             NA
## SourceDelo                                                                                               NA
## `SourceDelta Farm Press`                                                                                 NA
## `SourceDemocracy Now!`                                                                                   NA
## `SourceDemocracy Now! (blog)`                                                                            NA
## `SourceDentistry IQ`                                                                                     NA
## `SourceDenver Business Journal (blog)`                                                                   NA
## `SourceDenver Post`                                                                                      NA
## `SourceDenver Sun Times`                                                                                 NA
## `SourceDepartment of Defense`                                                                            NA
## `SourceDerby Telegraph`                                                                                  NA
## `SourceDerbyshire Times`                                                                                 NA
## `SourceDerry Journal`                                                                                    NA
## `SourceDerry Now`                                                                                        NA
## `SourceDeseret News`                                                                                     NA
## `SourceDesign & Trend`                                                                                   NA
## `SourceDesign Week`                                                                                      NA
## `SourceDesign World Network`                                                                             NA
## `SourceDesignboom (blog)`                                                                                NA
## SourceDesignNews                                                                                         NA
## SourceDESINFOS.com                                                                                       NA
## `SourceDeSmog Canada`                                                                                    NA
## SourceDesMoinesRegister.com                                                                              NA
## `SourceDestination CRM`                                                                                  NA
## SourceDestinyMan                                                                                         NA
## SourceDestructoid                                                                                        NA
## SourceDetails                                                                                            NA
## `SourceDetroit Free Press`                                                                               NA
## `SourceDetroit News`                                                                                     NA
## `SourceDeutsche Welle`                                                                                   NA
## SourceDevelop                                                                                            NA
## `SourceDeveloper Tech`                                                                                   NA
## SourceDeveloper.com                                                                                      NA
## SourceDeveloperTech                                                                                      NA
## SourceDevex                                                                                              NA
## `SourceDevils Lake Journal`                                                                              NA
## SourceDexigner                                                                                           NA
## SourceDezeen                                                                                             NA
## Sourcedh.be                                                                                              NA
## `SourceDhaka Tribune`                                                                                    NA
## SourceDhakaTribune                                                                                       NA
## `SourceDiamondback Online`                                                                               NA
## `SourceDickinson Press`                                                                                  NA
## `SourceDigi Times`                                                                                       NA
## SourceDigiday                                                                                            NA
## SourceDiginomica                                                                                         NA
## SourceDigit                                                                                              NA
## `SourceDigital Arts Online`                                                                              NA
## `SourceDigital Journal`                                                                                  NA
## `SourceDigital Music News`                                                                               NA
## `SourceDigital Spy`                                                                                      NA
## `SourceDigital Trends`                                                                                   NA
## `SourceDigital Trends via Yahoo Canada News`                                                             NA
## `SourceDigital Trends via Yahoo Maktoob News`                                                            NA
## `SourceDigital Trends via Yahoo UK & Ireland News`                                                       NA
## `SourceDigital Trends via Yahoo! Finance`                                                                NA
## `SourceDigital Trends via Yahoo! News`                                                           -3.194e+03
## `SourceDigital Trends via Yahoo! Sports`                                                         -5.411e+03
## SourceDigitalBroadcastingcom                                                                             NA
## SourceDIGITALLOOK                                                                                        NA
## SourceDigitalTVEurope.net                                                                                NA
## SourceDigitimes                                                                                          NA
## `SourceDin Merican`                                                                                      NA
## `SourceDirect Marketing News`                                                                            NA
## SourceDirectionsMag.com                                                                                  NA
## `SourceDirector magazine`                                                                                NA
## `SourceDisability Scoop`                                                                                 NA
## SourceDiscover                                                                                           NA
## `SourceDiscover Humboldt`                                                                                NA
## `SourceDiscover Magazine (blog)`                                                                         NA
## `SourceDiscovery News`                                                                                   NA
## `SourceDissident Voice`                                                                                  NA
## `SourceDiverse: Issues in Higher Education`                                                              NA
## SourceDividend.com                                                                                       NA
## SourceDJBooth.net                                                                                        NA
## `SourceDL-Online`                                                                                        NA
## `SourceDNA India`                                                                                        NA
## SourceDNAinfo                                                                                            NA
## SourceDOGOnews                                                                                           NA
## `SourceDoha News`                                                                                        NA
## `SourceDomain News`                                                                                      NA
## `SourceDominican Today`                                                                                  NA
## SourceDoordarshan                                                                                        NA
## `SourceDorking and Leatherhead Advertiser`                                                               NA
## `SourceDorset Echo`                                                                                      NA
## `SourceDothan Eagle`                                                                                     NA
## `SourceDothan First`                                                                                     NA
## `SourceDouglas Budget`                                                                                   NA
## `SourceDover Post`                                                                                       NA
## `SourceDownload.com via Yahoo! News`                                                                     NA
## `SourceDream Team FC`                                                                                    NA
## `SourceDreuz Info`                                                                                       NA
## `SourceDrexel University The Triangle Online`                                                            NA
## SourceDriving                                                                                            NA
## SourceDSNews.com                                                                                         NA
## `SourceDubuque Telegraph Herald`                                                                         NA
## `SourceDuluth News Tribune`                                                                              NA
## `SourceDuncan Banner`                                                                                    NA
## `SourceDunyaNews Pakistan`                                                                               NA
## `SourceDunyaNews Pakistan (blog)`                                                                        NA
## `SourceDurham Herald Sun`                                                                                NA
## SourceDutchNews.nl                                                                                       NA
## `SourceDZ Foot`                                                                                          NA
## `SourceDZone News`                                                                                       NA
## `SourceE-Commerce Times`                                                                          9.233e-01
## `SourceE-Flux`                                                                                           NA
## `SourceE-Pao.net`                                                                                        NA
## `SourceE Kantipur`                                                                                       NA
## `SourceE! Online`                                                                                        NA
## `SourceE&T magazine`                                                                                     NA
## Sourcee27                                                                                                NA
## `Sourcee27 via Yahoo! Singapore News`                                                                    NA
## `SourceEagle-Tribune`                                                                                    NA
## `SourceEagle Radio`                                                                                      NA
## `SourceEast African Business Week`                                                                       NA
## `SourceEast Anglian Daily Times`                                                                         NA
## `SourceEast Asia Forum`                                                                                  NA
## `SourceEast Bay Express`                                                                                 NA
## `SourceEast Bay Times`                                                                                   NA
## `SourceEast Coast Radio`                                                                                 NA
## `SourceEast London and West Essex Guardian Series`                                                       NA
## `SourceEast Oregonian (subscription)`                                                                    NA
## `SourceEastbourne Herald`                                                                                NA
## SourceEastday.com                                                                                        NA
## `SourceEat Out Magazine`                                                                                 NA
## SourceEater                                                                                              NA
## `SourceEater Austin`                                                                                     NA
## `SourceEater DC`                                                                                         NA
## `SourceEater Detroit (blog)`                                                                             NA
## `SourceEater Seattle`                                                                                    NA
## `SourceeCampus News`                                                                                     NA
## `SourceECB Publishing`                                                                                   NA
## SourceEcho                                                                                               NA
## SourceEchonetdaily                                                                                       NA
## SourceECNmag.com                                                                                         NA
## Sourceecns                                                                                               NA
## `Sourceeco-business.com`                                                                                 NA
## Sourceeconomia                                                                                           NA
## `SourceEconomic Calendar`                                                                                NA
## `SourceEconomic Times`                                                                                   NA
## `SourceEconomic Times (blog)`                                                                            NA
## SourceEconomics21                                                                                        NA
## `SourceEconoMonitor (blog)`                                                                              NA
## SourceEconomy                                                                                            NA
## SourceEconomyWatch.com                                                                                   NA
## SourceEconoTimes                                                                                         NA
## `SourceEContent (press release)`                                                                         NA
## SourceEcoWatch                                                                                           NA
## `SourceEcumenical News`                                                                                  NA
## Sourceedie.net                                                                                           NA
## `SourceEdmond Sun`                                                                                       NA
## `SourceEdmonton Journal`                                                                                 NA
## `SourceEdmonton Sun`                                                                                     NA
## SourceEdmunds.com                                                                                        NA
## SourceEdSurge                                                                                            NA
## `SourceEdTech Magazine: Focus on Higher Education`                                                       NA
## `SourceEducation Dive`                                                                                   NA
## `SourceEducation Week (subscription)`                                                                    NA
## `SourceEducation Week (subscription) (blog)`                                                             NA
## `SourceEducators NZ`                                                                                     NA
## `SourceEE Times`                                                                                         NA
## `SourceEE Times Asia`                                                                                    NA
## SourceEETimes                                                                                            NA
## SourceEFF                                                                                                NA
## `SourceEffingham's News Leader`                                                                          NA
## `SourceEffingham Daily News`                                                                             NA
## `SourceEgypt Independent`                                                                                NA
## `SourceEgypt SIS (press release)`                                                                        NA
## `SourceEgyptian Streets`                                                                                 NA
## `SourceEJ Insight`                                                                                       NA
## SourceEkklesia                                                                                           NA
## `SourceEl Moudjahid`                                                                                     NA
## `SourceEl Paisano`                                                                                       NA
## `SourceEl Watan`                                                                                         NA
## `Sourceelan: The Guide to Global Muslim Culture`                                                         NA
## `SourceElectronic Beats (press release) (blog)`                                                          NA
## `SourceElectronics EETimes (registration)`                                                               NA
## `SourceElectronics Weekly`                                                                               NA
## `SourceElectronics Weekly (blog)`                                                                        NA
## `SourceElite Daily`                                                                                      NA
## `SourceElite Daily (blog)`                                                                               NA
## `SourceElizabethtown News Enterprise`                                                                    NA
## `SourceElko Daily Free Press`                                                                            NA
## `SourceELLE UK`                                                                                          NA
## SourceELLE.com                                                                                           NA
## `SourceElliott Wave`                                                                                     NA
## SourceEllwoodCity.org                                                                                    NA
## `SourceEly News`                                                                                         NA
## SourceeMarketer                                                                                          NA
## `SourceEmbassy News (subscription)`                                                                      NA
## `SourceEmergency Management (blog)`                                                                      NA
## Sourceemergingmarkets.org                                                                                NA
## `SourceEmirates 24|7`                                                                                    NA
## SourceEMQ                                                                                                NA
## `SourceEN DELFI`                                                                                         NA
## `SourceEN DELFI (subscription)`                                                                          NA
## SourceeNCA                                                                                               NA
## `SourceEnergy Matters`                                                                                   NA
## `SourceEnergy Voice`                                                                                     NA
## `SourceEnergy.gov (blog)`                                                                                NA
## `SourceeNews Park Forest`                                                                                NA
## SourceEngadget                                                                                    5.369e+01
## `SourceEngadget (blog)`                                                                                  NA
## SourceENGINEERING.com                                                                                    NA
## SourceEnnahar                                                                                            NA
## `SourceEnough Project`                                                                                   NA
## `SourceEnough Project (blog)`                                                                            NA
## `SourceENPI Info Centre`                                                                                 NA
## SourceEnsia                                                                                              NA
## SourceEnstarz                                                                                            NA
## `SourceEnter Stage Right`                                                                                NA
## `SourceEnterprise Apps Tech`                                                                             NA
## `SourceEnterprise Innovation`                                                                            NA
## `SourceEnterprise Irregulars (blog)`                                                                     NA
## `SourceEnterprise Leader`                                                                                NA
## `SourceEnterprise Times`                                                                                 NA
## `SourceEnterpriseContentManagementConnection-ECM`                                                        NA
## SourceEnterpriseTech                                                                                     NA
## `SourceEntertainment Tonight`                                                                            NA
## `SourceEntertainment Tonight via Yahoo Canada News`                                                      NA
## `SourceEntertainment Weekly`                                                                             NA
## `SourceEntertainment Weekly (blog)`                                                                      NA
## SourceEntrepreneur                                                                                       NA
## `SourceEntrepreneur via Yahoo Canada Finance`                                                            NA
## `SourceEntrepreneur via Yahoo! Finance`                                                                  NA
## SourceEntrpreneur                                                                                        NA
## `SourceEnvironment & Energy Publishing`                                                                  NA
## `SourceEnvironmental Data Interactive Exchange`                                                          NA
## `SourceEnvironmental Defense Fund (blog)`                                                                NA
## `SourceEnvironmental Finance`                                                                            NA
## `SourceEnvironmental Leader`                                                                             NA
## `SourceEnvironmental News Network`                                                                       NA
## `SourceEnvironmental Working Group`                                                                      NA
## SourceeParisExtra.com                                                                                    NA
## `SourceEqual Times`                                                                                      NA
## `SourceEquilibrio Informativo`                                                                           NA
## SourceEquities.com                                                                                       NA
## `SourceErie Times-News`                                                                                  NA
## `SourceErvik.as (press release) (registration) (blog)`                                                   NA
## `Sourceeské noviny`                                                                                      NA
## SourceESPN                                                                                               NA
## `SourceESPN (blog)`                                                                                      NA
## `SourceESPN Blogs`                                                                                       NA
## `SourceESPN FC`                                                                                          NA
## `SourceESPN FC (blog)`                                                                                   NA
## SourceESPNcricinfo.com                                                                                   NA
## SourceEsquire.com                                                                                        NA
## SourceEssence.com                                                                                        NA
## `SourceEssex Chronicle`                                                                                  NA
## SourceETAuto.com                                                                                         NA
## SourceETCIO.com                                                                                          NA
## `SourceETF Daily News`                                                                                   NA
## `SourceETF Trends via Yahoo! Finance`                                                                    NA
## `SourceETF.com via Yahoo! Finance`                                                                       NA
## SourceETFinalScore.com                                                                                   NA
## `SourceETonline via Yahoo Celebrity`                                                                     NA
## SourceETRetail.com                                                                                       NA
## SourceETtech.com                                                                                         NA
## SourceETTelecom.com                                                                                      NA
## SourceeTurboNews                                                                                         NA
## `SourceEu Business`                                                                                      NA
## `SourceEU News`                                                                                          NA
## `SourceEUbusiness (press release)`                                                                       NA
## SourceEUobserver                                                                                         NA
## SourceEurActiv                                                                                           NA
## `SourceEurasia Review`                                                                                   NA
## SourceEurasiaNet                                                                                         NA
## `SourceEureka Times Standard`                                                                            NA
## `SourceEurekAlert (press release)`                                                                       NA
## `SourceEurekAlert!`                                                                                      NA
## SourceEurogamer.net                                                                                      NA
## `SourceEuromoney magazine`                                                                               NA
## Sourceeuronews                                                                                           NA
## SourceEuroNews                                                                                           NA
## `SourceEurope Online Magazine`                                                                           NA
## `SourceEuropean Council on Foreign Relations`                                                            NA
## `SourceEuropean Jewish Press`                                                                            NA
## `SourceEuropean Parliament (press release)`                                                              NA
## SourceEuropeanCEO                                                                                        NA
## `SourceEUROPP - European Politics and Policy (blog)`                                                     NA
## SourceEuroScientist                                                                                      NA
## SourceEurosport                                                                                          NA
## SourceEURweb                                                                                             NA
## SourceEurweb.com                                                                                         NA
## `SourceEvenimentul Zilei`                                                                                NA
## `SourceEvening Chronicle`                                                                                NA
## `SourceEvening Standard`                                                                                 NA
## `SourceEveningTimes Online`                                                                              NA
## `SourceEvent Magazine`                                                                                   NA
## SourceEventHubs                                                                                          NA
## `SourceEverett Herald`                                                                                   NA
## Sourceevertiq.com                                                                                        NA
## SourceEverythingLubbock.com                                                                              NA
## SourceeWeek                                                                                              NA
## `SourceExaminer Enterprise`                                                                              NA
## `SourceExaminer Gazette`                                                                                 NA
## SourceExaminer.com                                                                                       NA
## `SourceExaminerPost.com (blog)`                                                                          NA
## `SourceExcalibur Online`                                                                                 NA
## `SourceExchange News Direct`                                                                             NA
## `SourceExchange Rates UK`                                                                                NA
## `SourceExchangeWire (blog)`                                                                              NA
## `SourceExecutive Mosaic Media (blog)`                                                                    NA
## `SourceExecutiveBiz (blog)`                                                                              NA
## `SourceExpert Reviews`                                                                                   NA
## `SourceExperts Exchange (blog)`                                                                          NA
## `SourceExpress Computer`                                                                                 NA
## SourceExpress.co.uk                                                                                      NA
## Sourceexpressandstar.com                                                                                 NA
## SourceExtremeTech                                                                                        NA
## `SourceEye For Travel`                                                                                   NA
## Sourceeyefortravel.com                                                                                   NA
## `SourceEyewitness News`                                                                                  NA
## `SourceEyewitness News 3 Hartford`                                                                       NA
## SourceeZadar                                                                                             NA
## `SourceFabius Maximus website (blog)`                                                                    NA
## SourceFactCheck.org                                                                                      NA
## SourceFAIR                                                                                               NA
## `SourceFair Observer`                                                                                    NA
## `SourceFairbanks Daily News-Miner`                                                                       NA
## `SourceFairfield Daily Republic`                                                                         NA
## `SourceFamagusta Gazette`                                                                                NA
## `SourceFamily Security Matters`                                                                          NA
## SourceFanSided                                                                                           NA
## `SourceFarm Business Communications`                                                                     NA
## `SourceFarm Futures`                                                                                     NA
## `SourceFarm Weekly`                                                                                      NA
## SourceFarmersWeekly                                                                                      NA
## `SourceFarming Life`                                                                                     NA
## `SourceFarmington Daily Times`                                                                           NA
## `SourceFashionista (blog)`                                                                               NA
## `SourceFast Company`                                                                                     NA
## `SourceFast Company Magazine`                                                                            NA
## `SourceFayetteville Observer`                                                                            NA
## `SourceFC Inter.it`                                                                                      NA
## Sourcefdanewsalert.com                                                                                   NA
## `SourceFederal Computer Week`                                                                            NA
## `SourceFederal Reserve Bank of San Francisco`                                                            NA
## `SourceFederal Reserve Bank of San Francisco (blog)`                                                     NA
## `SourceFederal Times`                                                                                    NA
## SourceFederalNewsRadio.com                                                                               NA
## SourceFedScoop                                                                                           NA
## SourceFeedstuffs                                                                                         NA
## `SourceFG Insight`                                                                                       NA
## SourceFIBA                                                                                               NA
## SourceFibre2fashion.com                                                                                  NA
## `SourceFIDH (Communiqu\\u009d\\u009d de presse)`                                                         NA
## `SourceFIDH (press release)`                                                                             NA
## SourceFierceCIO                                                                                          NA
## SourceFierceContentManagement                                                                            NA
## SourceFierceEnterpriseCommunications                                                                     NA
## SourceFierceGovernmentIT                                                                                 NA
## `SourceFierceMedicalDevices (press release) (registration)`                                              NA
## SourceFierceMobileIT                                                                                     NA
## SourceFierceTelecom                                                                                      NA
## SourceFierceWireless                                                                                     NA
## SourceFIFA                                                                                               NA
## SourceFIFA.com                                                                                           NA
## `SourceFife Today`                                                                                       NA
## `SourceFight Back! Newspaper`                                                                            NA
## `SourceFiji Sun Online`                                                                                  NA
## `SourceFiji Times`                                                                                       NA
## `SourceFileHippo News`                                                                                   NA
## `SourceFinalCall.com News`                                                                               NA
## `SourceFinance and Commerce`                                                                             NA
## `SourceFinance Magnates`                                                                                 NA
## `SourceFinance Magnates (blog)`                                                                          NA
## SourceFinanceAsia                                                                                        NA
## `SourceFinancial Advisor Magazine (registration)`                                                        NA
## `SourceFinancial Director`                                                                               NA
## `SourceFinancial Express`                                                                                NA
## `SourceFinancial Express Bangladesh`                                                                     NA
## `SourceFinancial Market News`                                                                            NA
## `SourceFinancial News (subscription)`                                                                    NA
## `SourceFinancial Planning`                                                                               NA
## `SourceFinancial Post`                                                                                   NA
## `SourceFinancial Times`                                                                                  NA
## `SourceFinancial Times via Yahoo! New Zealand Finance`                                                   NA
## SourceFinancialSpots.com                                                                                 NA
## SourceFinanzen.net                                                                                       NA
## SourcefindBIOMETRICS                                                                                     NA
## Sourcefinder.com.au                                                                                      NA
## SourceFinextra                                                                                           NA
## `SourceFinextra (press release)`                                                                         NA
## `SourceFingal Independent`                                                                               NA
## `SourceFirst Things (blog)`                                                                              NA
## SourceFirstcoastnews.com                                                                                 NA
## SourceFirstpost                                                                                          NA
## `SourceFirstpost (satire)`                                                                               NA
## SourceFiveThirtyEight                                                                                    NA
## `SourceFlathead Beacon`                                                                                  NA
## SourceFlavorwire                                                                                         NA
## `SourceFleet Owner (blog)`                                                                               NA
## SourceFleetNews                                                                                          NA
## `SourceFleetwood Today`                                                                                  NA
## SourceFlightglobal                                                                                       NA
## `SourceFlorida Flambeau`                                                                                 NA
## `SourceFlorida Politics (blog)`                                                                          NA
## `SourceFlorida Times-Union`                                                                              NA
## `SourceFlorida Today`                                                                                    NA
## `SourceFlorida Trend`                                                                                    NA
## `SourceFlyer News`                                                                                       NA
## `SourceFM World`                                                                                         NA
## `SourceFocus News`                                                                                       NA
## `SourceFocus Taiwan News Channel`                                                                        NA
## `SourceFond du Lac Reporter`                                                                             NA
## `SourceFood Tank (blog)`                                                                                 NA
## SourceFoodManufacture.co.uk                                                                              NA
## `SourceFoodNavigator-Asia.com`                                                                           NA
## SourceFoodProductionDaily.com                                                                            NA
## `SourceFor The Win`                                                                                      NA
## SourceForbes                                                                                             NA
## `SourceForbes India`                                                                                     NA
## `SourceForbes via Yahoo! Finance`                                                                        NA
## `SourceForbes via Yahoo! News`                                                                           NA
## `SourceForeign Affairs`                                                                                  NA
## `SourceForeign Affairs (subscription)`                                                                   NA
## `SourceForeign Policy`                                                                                   NA
## `SourceForeign Policy (blog)`                                                                            NA
## `SourceForeign Policy Blogs (blog)`                                                                      NA
## `SourceForeign Policy In Focus`                                                                          NA
## `SourceForeign Policy Journal`                                                                           NA
## `SourceForeign Relations`                                                                                NA
## `SourceForex Factory`                                                                                    NA
## SourceForexLive                                                                                          NA
## `SourceFormtek Blog (blog)`                                                                              NA
## `SourceFort Wayne Journal Gazette`                                                                       NA
## `SourceFort Wayne Journal Gazette (blog)`                                                                NA
## `SourceFort Worth Star-Telegram`                                                                         NA
## `SourceFort Worth Star Telegram`                                                                         NA
## `SourceFort Worth Star Telegram (blog)`                                                                  NA
## SourceFortune                                                                                            NA
## `SourceFortune via Yahoo Canada Finance`                                                                 NA
## `SourceFortune via Yahoo! Finance`                                                                       NA
## SourceForward                                                                                            NA
## `SourceFoster's Daily Democrat`                                                                          NA
## SourceFourFourTwo                                                                                        NA
## `SourceFourFourTwo via Yahoo Canada Sports`                                                              NA
## `SourceFOX 11 Los Angeles`                                                                               NA
## `SourceFOX 11 Reno`                                                                                      NA
## `SourceFOX 12 Oregon`                                                                                    NA
## `SourceFOX 13 News, Tampa Bay`                                                                           NA
## `SourceFOX 13 Utah`                                                                                      NA
## `SourceFOX 19 Cincinnati`                                                                                NA
## `SourceFox 2 Detroit`                                                                                    NA
## `SourceFOX 2 News St. Louis`                                                                             NA
## `SourceFox 28`                                                                                           NA
## `SourceFOX 28 South Bend`                                                                                NA
## `SourceFOX 29 News Philadelphia`                                                                         NA
## `SourceFOX 31 Denver`                                                                                    NA
## `SourceFox 32 Chicago`                                                                                   NA
## `SourceFox 35 Orlando`                                                                                   NA
## `SourceFOX 4 Kansas City`                                                                                NA
## `SourceFOX 4 News`                                                                                       NA
## `SourceFOX 41 Louisville`                                                                                NA
## `SourceFOX 43 Harrisburg`                                                                                NA
## `SourceFOX 46 Charlotte`                                                                                 NA
## `SourceFOX 5 Atlanta`                                                                                    NA
## `SourceFOX 5 Las Vegas`                                                                                  NA
## `SourceFOX 5 San Diego`                                                                                  NA
## `SourceFox 59`                                                                                           NA
## `SourceFOX 59 Indianapolis`                                                                              NA
## `SourceFOX 6 Milwaukee`                                                                                  NA
## `SourceFOX 6 News Birmingham`                                                                            NA
## `SourceFOX 61`                                                                                           NA
## `SourceFOX 7 Austin`                                                                                     NA
## `SourceFOX 7 WTVW Evansville`                                                                            NA
## `SourceFOX 8 Cleveland`                                                                                  NA
## `SourceFOX 8 New Orleans`                                                                                NA
## `SourceFOX 8 WGHP`                                                                                       NA
## `SourceFox Business`                                                                                     NA
## `SourceFOX Business`                                                                                     NA
## `SourceFox Business via Yahoo! Finance`                                                                  NA
## `SourceFOX CT Hartford`                                                                                  NA
## `SourceFOX Illinois`                                                                                     NA
## `SourceFox News`                                                                                         NA
## `SourceFox News Insider`                                                                                 NA
## `SourceFox News Latino`                                                                                  NA
## `SourceFOX News Radio (blog)`                                                                            NA
## `SourceFox Sports`                                                                                       NA
## SourceFox11online.com                                                                                    NA
## `SourceFOX13 Memphis`                                                                                    NA
## Sourcefox13now.com                                                                                       NA
## SourceFox17                                                                                              NA
## SourceFOX21News.com                                                                                      NA
## Sourcefox2now.com                                                                                        NA
## `SourceFOX30 / CBS47 Jacksonville`                                                                       NA
## `SourceFOX31 Denver`                                                                                     NA
## SourceFOX40                                                                                              NA
## `SourceFOX40 Sacramento`                                                                                 NA
## SourceFOX43.com                                                                                          NA
## Sourcefox4kc.com                                                                                         NA
## SourceFox5NY                                                                                             NA
## Sourcefox5sandiego.com                                                                                   NA
## Sourcefox6now.com                                                                                        NA
## Sourcefox8.com                                                                                           NA
## SourceFoxReno.com                                                                                        NA
## SourceFOXSports.com                                                                                      NA
## `SourceFRANCE 24`                                                                                        NA
## `SourceFranklin Independent`                                                                             NA
## `SourceFranklin News Post`                                                                               NA
## `SourceFraser Coast Chronicle`                                                                           NA
## `SourceFrederick News Post (subscription)`                                                               NA
## SourceFredericksburg.com                                                                                 NA
## `SourceFree Malaysia Today`                                                                       5.151e+01
## `SourceFree Press Journal`                                                                               NA
## `SourceFreedom Newspaper`                                                                                NA
## SourceFreestonecountytimesonline                                                                         NA
## `SourceFresh Business Thinking`                                                                          NA
## SourceFreshPlaza                                                                                         NA
## `SourceFresno Bee`                                                                                       NA
## `SourceFresno Bee (blog)`                                                                                NA
## `SourceFresno Business Journal`                                                                          NA
## `SourceFrome Standard`                                                                                   NA
## `SourceFrome Times`                                                                                      NA
## SourceFRONTLINE                                                                                          NA
## `SourceFrontPage Magazine`                                                                               NA
## `SourceFrost Illustrated`                                                                                NA
## SourceFSView                                                                                             NA
## `SourceFT Adviser`                                                                                       NA
## `SourceFT Alphaville (registration)`                                                                     NA
## `SourceFT.com (blog)`                                                                                    NA
## `SourceFT.com (registration) (blog)`                                                                     NA
## `SourceFudzilla (blog)`                                                                                  NA
## `SourceFuelFix (blog)`                                                                                   NA
## `SourceFulton News`                                                                                      NA
## `SourceFund Strategy`                                                                                    NA
## Sourcefuse.tv                                                                                            NA
## `SourceFuseworks via Yahoo! New Zealand Finance`                                                         NA
## SourceFusion                                                                                             NA
## SourceFXStreet                                                                                           NA
## SourceGadget                                                                                             NA
## SourceGadgette                                                                                           NA
## `SourceGainesville Sun`                                                                                  NA
## `SourceGainesville Times`                                                                                NA
## `SourceGalesburg Register-Mail`                                                                          NA
## SourceGalleyCat                                                                                          NA
## SourceGallup                                                                                             NA
## SourceGallup.com                                                                                         NA
## SourceGamasutra                                                                                          NA
## `SourceGamasutra (blog)`                                                                                 NA
## `SourceGame Debate`                                                                                      NA
## `SourceGame Informer`                                                                                    NA
## `SourceGame Rant`                                                                                        NA
## `SourceGame Revolution`                                                                                  NA
## SourceGameDev.net                                                                                        NA
## SourceGamenguide                                                                                         NA
## SourceGamepur                                                                                            NA
## `SourceGameranx (blog)`                                                                                  NA
## `SourceGamereactor UK`                                                                                   NA
## `SourceGames Radar`                                                                                      NA
## Sourcegamesindustry.biz                                                                                  NA
## SourceGamesIndustry.biz                                                                                  NA
## `SourceGamesIndustry.biz (registration)`                                                                 NA
## SourceGameSpot                                                                                           NA
## `SourceGameSpot (blog)`                                                                                  NA
## `SourceGameSpot via Yahoo! News`                                                                         NA
## SourceGamespresso                                                                                        NA
## `SourceGamesRadar (blog)`                                                                                NA
## SourceGameZone                                                                                           NA
## SourceGamingBolt                                                                                         NA
## `SourceGant Daily`                                                                                       NA
## `SourceGas 2.0`                                                                                          NA
## `SourceGatestone Institute`                                                                              NA
## SourceGawker                                                                                             NA
## `SourceGazette Live`                                                                                     NA
## `SourceGazette News`                                                                                     NA
## SourceGazetteNET                                                                                         NA
## `SourceGazetteUnion,com (blog)`                                                                          NA
## Sourcegbtimes                                                                                            NA
## SourceGCaptain                                                                                           NA
## SourceGCN.com                                                                                            NA
## `SourceGear Junkie (blog)`                                                                               NA
## Sourcegearburn                                                                                           NA
## SourceGearNuke                                                                                           NA
## SourceGeek                                                                                               NA
## `SourceGeek Snack`                                                                                       NA
## SourceGeek.com                                                                                           NA
## SourceGeekSided                                                                                          NA
## SourceGeektime                                                                                           NA
## SourceGeekWire                                                                                           NA
## `SourceGeeky Gadgets`                                                                                    NA
## `SourceGeelong Advertiser`                                                                               NA
## SourceGematsu                                                                                            NA
## SourceGenomeWeb                                                                                          NA
## `SourceGeo News, Pakistan`                                                                               NA
## `SourceGeorgetown University The Hoya`                                                                   NA
## `SourceGeorgia Today`                                                                                    NA
## Sourcegetreading                                                                                         NA
## Sourcegetwestlondon                                                                                      NA
## `SourceGhacks Technology News`                                                                           NA
## `SourceGhana Broadcasting Corporation`                                                                   NA
## SourceGhanasoccernet.com                                                                                 NA
## SourceGhanaWeb                                                                                           NA
## SourceGhanaweb.com                                                                                       NA
## `SourceGia \\u009dnh Vnexpresss`                                                                         NA
## SourceGigaom                                                                                             NA
## `SourceGigaom via Yahoo! Finance`                                                                        NA
## `SourceGilmer Mirror`                                                                                    NA
## `SourceGippsland Times`                                                                                  NA
## `SourceGisborne Herald`                                                                                  NA
## SourceGizbot                                                                                             NA
## Sourcegizmag                                                                                             NA
## SourceGizmag                                                                                             NA
## SourceGizmodo                                                                                     1.211e+00
## `SourceGizmodo Australia`                                                                                NA
## `SourceGizmodo India`                                                                                    NA
## `SourceGizmodo UK`                                                                                       NA
## SourceGizmoids                                                                                           NA
## `SourceGladstone Observer`                                                                               NA
## SourceGlamour                                                                                            NA
## `SourceGlamour (blog)`                                                                                   NA
## `SourceGlasgow Daily Times`                                                                              NA
## `SourceGlasgow Evening Times`                                                                            NA
## `SourceGlens Falls Post-Star`                                                                            NA
## `SourceGlenwood Springs Post Independent`                                                                NA
## `SourceGlobal Envision`                                                                                  NA
## `SourceGlobal Grind`                                                                                     NA
## `SourceGlobal Indonesian Voices (GIVnews.com)`                                                           NA
## `SourceGlobal Investor`                                                                                  NA
## `SourceGlobal News`                                                                                      NA
## `SourceGlobal Risk Insights`                                                                             NA
## `SourceGlobal Times`                                                                                     NA
## `SourceGlobal Trade Review (GTR)`                                                                        NA
## `SourceGlobal Voices Online`                                                                             NA
## SourceGlobalMeatNews.com                                                                                 NA
## SourceGlobalnews.ca                                                                                      NA
## SourceGlobalPost                                                                                         NA
## `SourceGlobeNewswire (press release)`                                                                    NA
## `SourceGlobeNewswire via Yahoo Canada Finance`                                                           NA
## `SourceGlobeNewswire via Yahoo UK & Ireland Finance`                                                     NA
## `SourceGlobeNewswire via Yahoo! Finance`                                                                 NA
## `SourceGlobeNewswire via Yahoo! Finance India`                                                           NA
## `SourceGlobeNewswire via Yahoo! New Zealand Finance`                                                     NA
## `SourceGlobeNewswire via Yahoo!7 Finance`                                                                NA
## SourceGlobes                                                                                             NA
## `SourceGlobes Online`                                                                                    NA
## SourceGlobeSt.com                                                                                        NA
## `SourceGMA News`                                                                                         NA
## `SourceGMA News Online`                                                                                  NA
## `SourceGo Certify`                                                                                       NA
## SourceGoal.com                                                                                           NA
## `SourceGoal.com via Yahoo! Sports`                                                                       NA
## SourceGoDanRiver.com                                                                                     NA
## SourceGoErie.com                                                                                         NA
## `SourceGold Coast Bulletin`                                                                              NA
## `SourceGold Seek`                                                                                        NA
## `SourceGolden Gate Xpress`                                                                               NA
## SourceGoldSeek.com                                                                                       NA
## SourceGolf.com                                                                                           NA
## SourceGolfDigest.com                                                                                     NA
## SourceGoLocalProv                                                                                        NA
## `SourceGood Gear Guide`                                                                                  NA
## `SourceGOOD Magazine`                                                                                    NA
## `SourceGood Morning America via Yahoo! News`                                                             NA
## `SourceGood News Network`                                                                                NA
## `SourceGood News Pilipinas`                                                                              NA
## SourceGood4Utah                                                                                          NA
## `SourceGoodCall News (blog)`                                                                             NA
## `SourceGoogle (press release)`                                                                           NA
## SourceGOPUSA                                                                                             NA
## `SourceGoshen News`                                                                                      NA
## `SourceGospel Herald`                                                                                    NA
## `SourceGossip Monthly Magazine`                                                                          NA
## `SourceGotham Gazette`                                                                                   NA
## SourceGothamist                                                                                          NA
## `SourceGotta Be Mobile`                                                                                  NA
## SourceGovConWire                                                                                         NA
## `SourceGovernance Now`                                                                                   NA
## SourceGoverning                                                                                          NA
## `SourceGovernment of Canada News`                                                                        NA
## `SourceGovernment of Jamaica, Jamaica Information Service`                                               NA
## `SourceGovernment of Ontario News`                                                                       NA
## `SourceGovernment Technology`                                                                            NA
## `SourceGQ Magazine`                                                                                      NA
## SourceGQ.com                                                                                             NA
## `SourceGraham Cluley Security News`                                                                      NA
## `SourceGrand Forks Herald`                                                                               NA
## `SourceGrand Island Independent`                                                                         NA
## `SourceGrand Junction Daily Sentinel`                                                                    NA
## `SourceGrand Rapids Herald-Review`                                                                       NA
## `SourceGrand River Sachem`                                                                               NA
## `SourceGrande Prairie Daily Herald-Tribune`                                                              NA
## `SourceGreat Falls Tribune`                                                                              NA
## SourceGreatandhra.com                                                                                    NA
## `SourceGreater Baton Rouge Business Report`                                                              NA
## `SourceGreater Greater Washington`                                                                       NA
## `SourceGreater Kashmir`                                                                                  NA
## `SourceGreek Reporter`                                                                                   NA
## `SourceGreeley Tribune`                                                                                  NA
## `SourceGreen Bay Press Gazette`                                                                          NA
## `SourceGreen Car Reports`                                                                                NA
## `SourceGreen Left Weekly`                                                                                NA
## `SourceGreen Valley News`                                                                                NA
## SourceGreenBiz                                                                                           NA
## SourceGreenbot                                                                                           NA
## `SourceGreene County Messenger`                                                                          NA
## `SourceGreenfield Daily Reporter`                                                                        NA
## `SourceGreenock Telegraph`                                                                               NA
## `SourceGreensboro News & Record`                                                                         NA
## `SourceGreentech Media`                                                                                  NA
## `SourceGreenville News`                                                                                  NA
## `SourceGreenwich Time`                                                                                   NA
## `SourceGrimsby Telegraph`                                                                                NA
## SourceGrist                                                                                              NA
## `SourceGroesbeck Journal`                                                                                NA
## SourcegroovyPost                                                                                         NA
## `SourceGrub Street`                                                                                      NA
## SourceGSMArena.com                                                                                       NA
## `SourceGuardian Liberty Voice`                                                                           NA
## `SourceGuitar World Magazine`                                                                            NA
## `SourceGulf Business News`                                                                               NA
## `SourceGulf Digital News`                                                                                NA
## `SourceGulf News`                                                                                        NA
## `SourceGulf News Journal`                                                                                NA
## `SourceGulf News via Yahoo Maktoob News`                                                                 NA
## `SourceGulf Times`                                                                                       NA
## `SourceGulf Today`                                                                                       NA
## Sourcegulfnews.com                                                                                       NA
## SourceGuns.com                                                                                           NA
## `SourceGuru Focus`                                                                                       NA
## `Sourceguru3d.com (press release)`                                                                       NA
## SourceGuruFocus.com                                                                                      NA
## `SourceGuruFocus.com via Yahoo! Finance`                                                                 NA
## `SourceGW Today`                                                                                         NA
## `SourceGympie Times`                                                                                     NA
## `SourceH\\u009d\\u009d Ni Mi`                                                                            NA
## SourceHaaretz                                                                                            NA
## `SourceHaaretz Daily`                                                                                    NA
## `SourceHack Read`                                                                                        NA
## SourceHackaday                                                                                           NA
## SourceHaitilibre.com                                                                                     NA
## `SourceHamilton Journal News`                                                                            NA
## `SourceHamilton Spectator`                                                                               NA
## `SourceHampshire Chronicle`                                                                              NA
## `SourceHandelsblatt Global Edition (subscription)`                                                       NA
## `SourceHanford Sentinel`                                                                                 NA
## `SourceHardcore Gamer`                                                                                   NA
## `SourceHardOCP (press release)`                                                                          NA
## `SourceHardware Secrets`                                                                                 NA
## SourceHardwareZone                                                                                       NA
## `SourceHardwareZone via Yahoo! Philippines News`                                                         NA
## `SourceHardwareZone via Yahoo! Singapore News`                                                           NA
## SourceHarpersBAZAAR.com                                                                                  NA
## `SourceHartford Courant`                                                                                 NA
## `SourceHartlepool Mail`                                                                                  NA
## `SourceHarvard Business Review`                                                                          NA
## `SourceHarvard Gazette`                                                                                  NA
## `SourceHarvard Law Record`                                                                               NA
## `SourceHarvard Law School News`                                                                          NA
## `SourceHastings Tribune`                                                                                 NA
## `SourceHavana Times`                                                                                     NA
## Sourcehaveeruonline                                                                                      NA
## `SourceHawaii 24/7 (press release)`                                                                      NA
## `SourceHawaii News Now`                                                                                  NA
## `SourceHeadlines & Global News`                                                                          NA
## `SourceHealth Affairs (blog)`                                                                            NA
## `SourceHealth Aim`                                                                                       NA
## `SourceHealthcare IT News`                                                                               NA
## SourceHealthline                                                                                         NA
## `SourceHeat Street`                                                                                      NA
## `SourceHeavy Duty Trucking`                                                                              NA
## SourceHeavy.com                                                                                          NA
## `SourceHelena Daily World`                                                                               NA
## `SourceHelena Independent Record`                                                                        NA
## `SourceHellenic News of America`                                                                         NA
## `SourceHellenic Shipping News Worldwide`                                                                 NA
## `SourceHello Beautiful - Interactive One (blog)`                                                         NA
## Sourcehellomagazine.com                                                                                  NA
## `SourceHelsingin Sanomat`                                                                                NA
## `SourceHenderson Daily News`                                                                             NA
## `SourceHerald-Mail Media`                                                                                NA
## `SourceHerald & Review`                                                                                  NA
## `SourceHerald & Review (blog)`                                                                           NA
## `SourceHerald and News`                                                                                  NA
## `SourceHerald Scotland`                                                                                  NA
## `SourceHerald Sun`                                                                                       NA
## `SourceHerald Times Reporter`                                                                            NA
## SourceHerald.ie                                                                                          NA
## SourceHeraldNet                                                                                          NA
## `SourceHere And Now`                                                                                     NA
## `SourceHereford Times`                                                                                   NA
## `SourceHeritage Florida Jewish News`                                                                     NA
## `SourceHeritage Foundation`                                                                              NA
## SourceHeritage.org                                                                                       NA
## `SourceHerts and Essex Observer`                                                                         NA
## `SourceHexa News`                                                                                        NA
## SourceHEXUS                                                                                              NA
## `SourceHibbing Daily Tribune`                                                                            NA
## `SourceHickory Daily Record`                                                                             NA
## `SourceHigh Country News`                                                                                NA
## `SourceHigh Country Press`                                                                               NA
## `SourceHigh Plains Journal`                                                                              NA
## `SourceHigh Point University (press release) (blog)`                                                     NA
## `SourceHIGH TIMES`                                                                                       NA
## `SourceHighbrow Magazine`                                                                                NA
## `SourceHighlands Today`                                                                                  NA
## SourceHighsnobiety                                                                                       NA
## `SourceHill Times (subscription)`                                                                        NA
## `SourceHimalayan Times`                                                                                  NA
## `SourceHindu Business Line`                                                                              NA
## `SourceHindustan Times`                                                                                  NA
## `SourceHints News Network`                                                                               NA
## SourceHipHopDX                                                                                           NA
## `SourceHistory News Network (HNN)`                                                                       NA
## `SourceHIT Consultant`                                                                                   NA
## SourceHITC                                                                                               NA
## `SourceHollywood Life`                                                                                   NA
## `SourceHollywood Reporter`                                                                               NA
## SourceHolyrood.com                                                                                       NA
## SourceHometownlife.com                                                                                   NA
## `SourceHonest Reporting Canada`                                                                          NA
## SourceHonestreporting.com                                                                                NA
## `SourceHong Kong Free Press`                                                                             NA
## `SourceHong Kong Standard`                                                                               NA
## `SourceHong Kong Standard (press release)`                                                               NA
## `SourceHonolulu Civil Beat`                                                                              NA
## `SourceHonolulu Star-Advertiser`                                                                         NA
## `SourceHoosier Ag Today`                                                                                 NA
## `SourceHope Star`                                                                                        NA
## `SourceHornell Evening Tribune`                                                                          NA
## `SourceHospitality Net`                                                                                  NA
## `SourceHot Air`                                                                                          NA
## `SourceHot Hardware`                                                                                     NA
## `SourceHot Springs Sentinel`                                                                             NA
## `SourceHot Stocks Point`                                                                                 NA
## `SourceHotel News Now`                                                                                   NA
## `SourceHotel News Resource (press release)`                                                              NA
## `SourceHotelier Middle East`                                                                             NA
## SourceHotNewHipHop                                                                                       NA
## `SourceHouma Courier`                                                                                    NA
## SourceHousingWire                                                                                        NA
## `SourceHousingWire (blog)`                                                                               NA
## `SourceHouston Chronicle`                                                                                NA
## `SourceHouston Public Media`                                                                             NA
## `SourceHoustonia Magazine`                                                                               NA
## `SourceHoward University The District Chronicles`                                                        NA
## `SourceHowStuffWorks NOW`                                                                                NA
## SourceHPCwire                                                                                            NA
## `SourceHQ Grande Prairie`                                                                                NA
## SourceHRHub                                                                                              NA
## `SourceHSUS News`                                                                                        NA
## `SourceHSUS News (blog)`                                                                                 NA
## `Sourcehttp://hamodia.com`                                                                               NA
## `Sourcehttp://wales.gov.uk/`                                                                             NA
## `Sourcehttp://www.newsgram.com/`                                                                         NA
## `SourceHuddersfield Daily Examiner`                                                                      NA
## `SourceHuddersfield Examiner`                                                                            NA
## `SourceHuffington Post`                                                                                  NA
## `SourceHuffington Post (blog)`                                                                           NA
## `SourceHuffington Post Australia`                                                                        NA
## `SourceHuffington Post Canada`                                                                           NA
## `SourceHuffington Post India`                                                                            NA
## `SourceHuffington Post UK`                                                                               NA
## SourceHUH.                                                                                               NA
## `SourceHuman Capital`                                                                                    NA
## `SourceHuman Events`                                                                                     NA
## `SourceHuman Resources Online`                                                                           NA
## `SourceHuman Rights Campaign (blog)`                                                                     NA
## `SourceHuman Rights First`                                                                               NA
## `SourceHuman Rights First (blog)`                                                                        NA
## `SourceHuman Rights Watch`                                                                               NA
## SourceHumanosphere                                                                                       NA
## `SourceHungary Today`                                                                                    NA
## `SourceHuntington Herald Dispatch`                                                                       NA
## `SourceHuntsville Item`                                                                                  NA
## `SourceHuron Daily Tribune`                                                                              NA
## `SourceHurriyet Daily News`                                                                              NA
## `SourceHybrid Cars News`                                                                                 NA
## `SourceHyde Park Herald`                                                                                 NA
## SourceHydrocarbonOnline                                                                                  NA
## SourceHyperallergic                                                                                      NA
## `SourceHypergrid Business`                                                                               NA
## `SourceI am in dna of India`                                                                             NA
## Sourcei24news                                                                                            NA
## `SourceI4U News`                                                                                         NA
## SourceiAfrica.com                                                                                        NA
## `SourceIAM (registration) (blog)`                                                                        NA
## SourceiamWire                                                                                            NA
## `SourceIANS India Private Limited via Yahoo! India News`                                                 NA
## `SourceIANS India Private Limited via Yahoo! Singapore News`                                             NA
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! India News`                         1.438e+00
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! Singapore News`                     1.032e+00
## `SourceIANS via Yahoo Maktoob News`                                                               1.262e+00
## `SourceIANS via Yahoo! Finance India`                                                                    NA
## `SourceIB Times via Yahoo UK & Ireland News`                                                             NA
## `SourceIB Times via Yahoo! Singapore News`                                                               NA
## `SourceIBN live`                                                                                         NA
## SourceIBN7                                                                                               NA
## SourceIBNLive                                                                                            NA
## `SourceIBNLive (blog)`                                                                                   NA
## `SourceIceland Monitor`                                                                                  NA
## SourceIceNews                                                                                            NA
## SourceICIS                                                                                               NA
## SourceiClarified                                                                                         NA
## `SourceICRC (press release)`                                                                             NA
## `SourceIdaho State Journal`                                                                              NA
## `SourceIdaho Statesman`                                                                                  NA
## `SourceIDEX Online`                                                                                      NA
## SourceiDigitalTimes.com                                                                                  NA
## `SourceIDN InDepthNews | Analysis That Matters`                                                          NA
## `SourceIEEE Spectrum`                                                                                    NA
## `SourceiFiber One`                                                                                       NA
## SourceIGN                                                                                                NA
## `SourceIGN Videogames`                                                                                   NA
## `SourceIGN Xbox One Games`                                                                               NA
## `SourceIHS Electronics360`                                                                               NA
## `SourceIJ Review`                                                                                        NA
## SourceikhwanWeb.com                                                                                      NA
## `SourceIlford Recorder`                                                                                  NA
## `SourceIlford Recorder 24`                                                                               NA
## `SourceIllawarra Mercury`                                                                                NA
## SourceIlliniHQ.com                                                                                       NA
## Sourceiloubnan.info                                                                                      NA
## SourceiMediaEthics                                                                                       NA
## `SourceImmortal News`                                                                                    NA
## Sourceimpact24                                                                                           NA
## `SourceImperial College London`                                                                          NA
## `SourceImperial Valley Press`                                                                            NA
## `SourceIn-Cyprus (press release) (subscription) (blog)`                                                  NA
## `SourceIn Defense of Marxism`                                                                            NA
## `SourceIn Homeland Security`                                                                             NA
## `SourceIn These Times`                                                                                   NA
## SourceInc.com                                                                                            NA
## SourceInDaily                                                                                            NA
## `SourceIndependent Australia`                                                                            NA
## `SourceIndependent Catholic News`                                                                        NA
## `SourceIndependent Florida Alligator`                                                                    NA
## `SourceIndependent Media Review Analysis (IMRA)`                                                         NA
## `SourceIndependent Online`                                                                               NA
## `SourceIndependent Reporter`                                                                             NA
## `SourceIndependent Tribune`                                                                              NA
## SourceIndependent.ae                                                                                     NA
## SourceIndex.hr                                                                                           NA
## `SourceIndia Infoline`                                                                                   NA
## `SourceIndia Today`                                                                                      NA
## `SourceIndia Today Group via Yahoo! Finance India`                                                       NA
## `SourceIndia Tribune`                                                                                    NA
## `SourceIndia TV`                                                                                         NA
## SourceIndia.com                                                                                          NA
## Sourceindiablooms                                                                                        NA
## SourceIndiainfoline                                                                                      NA
## `SourceIndian Country Today Media Network`                                                               NA
## `SourceIndiana Public Media`                                                                             NA
## `SourceIndiana&#39;s NewsCenter`                                                                         NA
## `SourceIndianapolis Business Journal`                                                                    NA
## `SourceIndianapolis Business Journal (blog)`                                                             NA
## `SourceIndianapolis Star`                                                                                NA
## SourceIndiatimes.com                                                                                     NA
## `SourceIndie Shuffle Music News (blog)`                                                                  NA
## `SourceIndie Wire`                                                                                       NA
## `SourceIndie Wire (blog)`                                                                                NA
## `SourceIndo American News`                                                                               NA
## `SourceIndonesia Investments (press release)`                                                            NA
## `SourceIndustrial Laser Solutions Magazine`                                                              NA
## `SourceIndustry Leaders Magazine`                                                                        NA
## `SourceIndustry Week`                                                                                    NA
## SourceIndustryWeek                                                                                       NA
## SourceiNews                                                                                              NA
## SourceiNews880.com                                                                                       NA
## SourceInferse                                                                                            NA
## `Sourceinfo-europa`                                                                                      NA
## `SourceInfo-Palestine`                                                                                   NA
## `Sourceinfo komputer`                                                                                    NA
## SourceInfoQ.com                                                                                          NA
## `SourceInformation Age`                                                                           1.826e+07
## SourceInformationWeek                                                                                    NA
## SourceINFORUM                                                                                            NA
## `SourceInfosecurity Magazine`                                                                            NA
## `SourceInfoTel News Ltd`                                                                                 NA
## SourceInfoToday.com                                                                                      NA
## SourceInfoWorld                                                                                          NA
## SourceInhabitat                                                                                          NA
## `SourceInnovation Excellence (blog)`                                                                     NA
## SourceInquirer                                                                                           NA
## SourceInquirer.net                                                                                       NA
## `SourceInSerbia News`                                                                                    NA
## `SourceInside Bay Area`                                                                                  NA
## `SourceInside Edition`                                                                                   NA
## `SourceInside Higher Ed`                                                                                 NA
## `SourceInside Higher Ed (blog)`                                                                          NA
## `SourceInside INdiana Business`                                                                          NA
## `SourceInside NoVA`                                                                                      NA
## `SourceInside Trade`                                                                                     NA
## `SourceInside Tucson Business`                                                                           NA
## `SourceInside World Football`                                                                            NA
## `SourceInsideClimate News`                                                                               NA
## SourceInsideHalton.com                                                                                   NA
## `SourceInsider Louisville (press release) (registration)`                                                NA
## `SourceInsider Media`                                                                                    NA
## `SourceInsider Monkey (blog)`                                                                            NA
## `SourceInsider Trading Report`                                                                           NA
## SourceInsideSources                                                                                      NA
## `SourceInsight via Yahoo Canada Finance`                                                                 NA
## `SourceInstitute for Defence Studies and Analyses`                                                       NA
## `SourceInstitutional Investor`                                                                           NA
## `SourceInstitutional Investor (blog)`                                                                    NA
## SourceInStyle                                                                                            NA
## `SourceInsurance Journal`                                                                                NA
## `SourceIntelligence & Terrorism Information Center`                                                      NA
## `SourceIntelligence Online (subscription)`                                                               NA
## `SourceInter Press Service`                                                                              NA
## `SourceInteractive Investor`                                                                             NA
## SourceInterAksyon                                                                                        NA
## SourceInterfax                                                                                           NA
## `SourceIntermountain Jewish News`                                                                        NA
## `SourceInternational Adviser`                                                                            NA
## `SourceInternational Business Times`                                                              4.425e-01
## `SourceInternational Business Times AU`                                                                  NA
## `SourceInternational Business Times UK`                                                           7.967e-01
## `SourceInternational Business Times via Yahoo UK & Ireland News`                                  4.305e-01
## `SourceInternational Business Times, India Edition`                                                      NA
## `SourceInternational Business Times, Singapore Edition`                                                  NA
## `SourceInternational Chamber of Commerce`                                                                NA
## `SourceInternational Falls Journal`                                                                      NA
## `SourceInternational Federation of Red Cross and Red Crescent Societies`                                 NA
## `SourceInternational Herald Tribune`                                                                     NA
## `SourceInternational Middle East Media Center`                                                           NA
## `SourceInternational Monetary Fund`                                                                      NA
## `SourceInternational New York Times`                                                                     NA
## `SourceInternational Paralymic Committee`                                                                NA
## `SourceInternational Solidarity Movement`                                                                NA
## SourceinTheBay                                                                                           NA
## `SourceIntifada Palestine`                                                                               NA
## SourceInverse                                                                                            NA
## SourceInvestCorrectly                                                                                    NA
## SourceInvesting.com                                                                                      NA
## `SourceInvestment Executive`                                                                             NA
## `SourceInvestment U`                                                                                     NA
## `SourceInvestment Week`                                                                                  NA
## SourceInvestmentNews                                                                                     NA
## SourceInvestopedia                                                                                       NA
## `SourceInvestor's Business Daily`                                                                        NA
## `SourceInvestor Newswire`                                                                                NA
## SourceInvestorGuide                                                                                      NA
## `SourceInvestorIdeas.com (press release)`                                                                NA
## SourceInvestorplace.com                                                                                  NA
## `SourceInvestors Chronicle`                                                                              NA
## Sourceio9                                                                                                NA
## `SourceIoT Evolution World (blog)`                                                                       NA
## `SourceIoT Hub`                                                                                          NA
## `SourceIowa City Press Citizen`                                                                          NA
## `SourceiPolitics.ca (subscription)`                                                                      NA
## SourceiProgrammer                                                                                        NA
## `SourceIpsos News & Polls (subscription)`                                                                NA
## `SourceIpswich Star`                                                                                     NA
## SourceIPWatchdog.com                                                                                     NA
## `SourceIRA Market Report`                                                                                NA
## `SourceIran News Update`                                                                                 NA
## SourceIRINnews.org                                                                                       NA
## `SourceIrish Building Magazine`                                                                          NA
## `SourceIrish Examiner`                                                                                   NA
## `SourceIrish Independent`                                                                                NA
## `SourceIrish Legal News`                                                                                 NA
## `SourceIrish Mirror`                                                                                     NA
## `SourceIrish Times`                                                                                      NA
## SourceIrishCentral                                                                                       NA
## `SourceIrvine World News`                                                                                NA
## `SourceIs stories`                                                                                       NA
## SourceiSchoolGuide                                                                                       NA
## `SourceIsland Packet`                                                                                    NA
## `SourceIsland Sun`                                                                                       NA
## SourceISM                                                                                                NA
## SourceISPreview                                                                                          NA
## `SourceIsrael Hayom`                                                                                     NA
## `Sourceisrael heute ltd.`                                                                                NA
## `SourceIsrael Today`                                                                                     NA
## SourceIsraelValley                                                                                       NA
## SourceIsthmus                                                                                            NA
## `SourceIT Business Edge`                                                                                 NA
## `SourceIT Business Edge (blog)`                                                                          NA
## `SourceiT News`                                                                                          NA
## `SourceiT News (blog)`                                                                                   NA
## `SourceIT News Africa`                                                                                   NA
## `SourceIT PRO`                                                                                           NA
## `SourceIT World`                                                                                         NA
## `SourceIT World Canada`                                                                                  NA
## `SourceIT World Canada (blog)`                                                                           NA
## SourceITBusiness.ca                                                                                      NA
## `SourceiTech Post`                                                                                       NA
## `SourceIthaca Journal`                                                                                   NA
## SourceITProPortal                                                                                        NA
## `SourceITS International`                                                                                NA
## `SourceITV News`                                                                                         NA
## SourceITV.com                                                                                            NA
## SourceITWeb                                                                                              NA
## SourceiTWire                                                                                             NA
## `SourceiTWire (press release)`                                                                           NA
## SourceITworld                                                                                            NA
## `SourceJ-Wire Jewish Australian News Service`                                                            NA
## `SourceJ Weekly`                                                                                         NA
## `SourceJacaranda FM`                                                                                     NA
## `SourceJackson Clarion Ledger`                                                                           NA
## `SourceJackson Free Press`                                                                               NA
## `SourceJackson Hole News & Guide`                                                                        NA
## `SourceJackson Sun`                                                                                      NA
## `SourceJacksonville Business Journal`                                                                    NA
## `SourceJacksonville Daily Progress`                                                                      NA
## `SourceJacksonville Journal Courier`                                                                     NA
## `SourceJacobin magazine`                                                                                 NA
## SourceJadaliyya                                                                                          NA
## `SourceJakarta Globe`                                                                                    NA
## `SourceJakarta Post`                                                                                     NA
## SourceJalopnik                                                                                           NA
## `SourceJamaica Gleaner`                                                                                  NA
## `SourceJamaica Observer`                                                                                 NA
## `SourceJamestown Sun`                                                                                    NA
## `SourceJanesville Gazette`                                                                               NA
## `SourceJapan Today`                                                                                      NA
## `SourceJefferson City News Tribune`                                                                      NA
## `SourceJerusalem Center for Public Affairs`                                                              NA
## `SourceJerusalem Post Israel News`                                                                       NA
## `SourceJerusalem Post Israel News (blog)`                                                                NA
## `SourceJeune Afrique`                                                                                    NA
## `SourceJewish Business News`                                                                             NA
## `SourceJewish Chronicle`                                                                                 NA
## `SourceJewish Ledger`                                                                                    NA
## `SourceJewish Link of New Jersey`                                                                        NA
## `SourceJewish News`                                                                                      NA
## `SourceJewish Post`                                                                                      NA
## `SourceJewish Telegraphic Agency`                                                                        NA
## SourceJewschool                                                                                          NA
## SourceJezebel                                                                                            NA
## SourceJNS.org                                                                                            NA
## `SourceJobs & Hire`                                                                                      NA
## SourceJOC.com                                                                                            NA
## SourceJOE                                                                                                NA
## SourceJOE.co.uk                                                                                          NA
## `SourceJohannesburg Sunday World`                                                                        NA
## `SourceJohnson City Press`                                                                               NA
## `SourceJoplin Globe`                                                                                     NA
## `SourceJordan Times`                                                                                     NA
## `SourceJournal and Courier`                                                                              NA
## `SourceJournal Gazette and Times-Courier`                                                                NA
## `SourceJournal of Turkish Weekly`                                                                        NA
## `SourceJournal Online`                                                                                   NA
## `SourceJournal Pioneer`                                                                                  NA
## `SourceJournal Times`                                                                                    NA
## SourceJournalism.co.uk                                                                                   NA
## `SourceJP Updates`                                                                                       NA
## `SourceJspace News`                                                                                      NA
## `SourceJuneau Empire (subscription)`                                                                     NA
## `SourceJunior College`                                                                                   NA
## SourceJunkee                                                                                             NA
## SourceJURIST                                                                                             NA
## `Sourcejust-style.com (subscription)`                                                                    NA
## `SourceJust International`                                                                               NA
## `SourceJust Jared`                                                                                       NA
## `SourceJust Security`                                                                                    NA
## SourceJustmeans                                                                                          NA
## `SourceJustmeans (blog)`                                                                                 NA
## SourceJweekly.com                                                                                        NA
## `SourceK24 TV`                                                                                           NA
## `SourceKABC-TV`                                                                                          NA
## `SourceKABC-TV Los Angeles`                                                                              NA
## `SourceKaiser Family Foundation`                                                                         NA
## SourceKAKE                                                                                               NA
## SourceKALW                                                                                               NA
## SourceKanglaOnline                                                                                       NA
## `SourceKankakee Daily Journal`                                                                           NA
## `SourceKansas City Business Journal`                                                                     NA
## `SourceKansas City InfoZine`                                                                             NA
## `SourceKansas City Star`                                                                                 NA
## `SourceKansas City Star (blog)`                                                                          NA
## SourceKAPP                                                                                               NA
## SourceKARE                                                                                               NA
## SourceKARK                                                                                               NA
## `SourceKashmir Life`                                                                                     NA
## `SourceKashmir Media Service`                                                                            NA
## `SourceKashmir Reader`                                                                                   NA
## `SourceKashmir Watch`                                                                                    NA
## `SourceKasmir Monitor`                                                                                   NA
## `SourceKATC Lafayette News`                                                                              NA
## SourceKathimerini                                                                                        NA
## `SourceKathmandu Post`                                                                                   NA
## `SourceKatib\\u009d\\u009dn`                                                                             NA
## `SourceKatoikos.eu (satire) (registration) (blog)`                                                       NA
## SourceKATU                                                                                               NA
## SourceKATV                                                                                               NA
## `SourceKaufman Herald`                                                                                   NA
## `SourceKAUZ-TV`                                                                                          NA
## `SourceKawartha Media Group`                                                                             NA
## `SourceKawowo Sports`                                                                                    NA
## `SourceKBS WORLD Radio News`                                                                             NA
## SourceKBTX                                                                                               NA
## `SourceKBTX 3 Bryan - College Station`                                                                   NA
## `SourceKCBD-TV Lubbock`                                                                                  NA
## `SourceKCCI 8 Des Moines`                                                                                NA
## `SourceKCCI Des Moines`                                                                                  NA
## `SourceKCEN-TV`                                                                                          NA
## SourceKCET                                                                                               NA
## `SourceKCRA 3 Sacramento`                                                                                NA
## `SourceKCRA Sacramento`                                                                                  NA
## SourceKCRG                                                                                               NA
## `SourceKCTV 5 Kansas City`                                                                               NA
## `SourceKDLT News`                                                                                        NA
## SourceKdminer                                                                                            NA
## SourceKDramaStars                                                                                        NA
## `SourceKearney Hub`                                                                                      NA
## `SourceKELO AM-FM`                                                                                       NA
## `SourceKELOLAND TV`                                                                                      NA
## `SourceKelowna Capital News`                                                                             NA
## `SourceKenai Peninsula Online`                                                                           NA
## `SourceKennebec Journal & Morning Sentinel`                                                              NA
## `SourceKENS 5 TV`                                                                                        NA
## `SourceKent Online`                                                                                      NA
## `SourceKERA News`                                                                                        NA
## `SourceKERA North Texas`                                                                                 NA
## `SourceKern Golden Empire`                                                                               NA
## SourceKESQ                                                                                               NA
## `SourceKETV 7 Omaha`                                                                                     NA
## `SourceKETV Omaha`                                                                                       NA
## `SourceKEVN Black Hills Fox`                                                                             NA
## `SourceKewanee Star Courier`                                                                             NA
## `SourceKEYE TV`                                                                                          NA
## SourceKEYT                                                                                               NA
## SourceKFDA                                                                                               NA
## `SourceKFDA-TV Amarillo`                                                                                 NA
## SourceKFDI                                                                                               NA
## SourceKFGO                                                                                               NA
## Sourcekfor.com                                                                                           NA
## `SourceKFOX 14 El Paso`                                                                                  NA
## `SourceKFOX El Paso`                                                                                     NA
## `SourceKFSM Ft. Smith-Fayetteville`                                                                      NA
## `SourceKFSN-TV`                                                                                          NA
## `SourceKFSN-TV Fresno`                                                                                   NA
## SourceKFVS                                                                                               NA
## SourceKgab                                                                                               NA
## `SourceKGBT-TV`                                                                                          NA
## SourceKGMI                                                                                               NA
## SourceKGNS.tv                                                                                            NA
## `SourceKGO-TV`                                                                                           NA
## `SourceKGO-TV Bay Area`                                                                                  NA
## SourceKGOU                                                                                               NA
## `SourceKGTV San Diego`                                                                                   NA
## Sourcekgw.com                                                                                            NA
## `SourceKhaama Press (press release) (blog)`                                                              NA
## `SourceKhaleej Times`                                                                                    NA
## `SourceKhaleej Times via Yahoo Maktoob News`                                                             NA
## `SourceKHBS - KHOG Fort Smith - Fayetteville`                                                            NA
## SourceKHON2                                                                                              NA
## SourceKHOU                                                                                               NA
## SourceKHOU.com                                                                                           NA
## `SourceKHQ Right Now`                                                                                    NA
## `SourceKHQ Spokane`                                                                                      NA
## `SourceKiama Independent`                                                                                NA
## SourceKicker                                                                                             NA
## `SourceKIII TV3`                                                                                         NA
## `SourceKilgore News Herald`                                                                              NA
## `SourceKill Screen (blog)`                                                                               NA
## `SourceKilleen Daily Herald`                                                                             NA
## `SourceKIMT 3`                                                                                           NA
## SourceKING5.com                                                                                          NA
## SourceKIONrightnow.com                                                                                   NA
## `SourceKiplinger Personal Finance`                                                                       NA
## SourceKiplinger.com                                                                                      NA
## `SourceKipp Report`                                                                                      NA
## `SourceKIRO 7 Seattle-Tacoma`                                                                            NA
## `SourceKIRO Seattle`                                                                                     NA
## `SourceKitchener - Waterloo Record`                                                                      NA
## SourceKitGuru                                                                                            NA
## `SourceKitsap Sun`                                                                                       NA
## `SourceKITV Honolulu`                                                                                    NA
## `SourceKKTV 11 Colorado Springs`                                                                         NA
## `SourceKKTV 11 News`                                                                                     NA
## `SourceKLAS-TV`                                                                                          NA
## SourceKLTV                                                                                               NA
## `SourceKLTV 7 Tyler`                                                                                     NA
## `SourceKMBC-TV Kansas City`                                                                              NA
## `SourceKMBC Kansas City`                                                                                 NA
## SourceKMOV.com                                                                                           NA
## SourceKMUW                                                                                               NA
## `SourceKMWorld Magazine`                                                                                 NA
## `SourceKNBN Rapid City`                                                                                  NA
## Sourceknopnews2                                                                                          NA
## `SourceKnow Your Mobile`                                                                                 NA
## `SourceKnowledge at Wharton`                                                                             NA
## `SourceKnowledge Wharton Today`                                                                          NA
## `SourceKnowledge@Wharton`                                                                                NA
## `SourceKnowTechie (blog)`                                                                                NA
## `SourceKnoxville News Sentinel`                                                                          NA
## `SourceKOAA.com Colorado Springs and Pueblo News`                                                        NA
## `SourceKOAM-TV`                                                                                          NA
## `SourceKOAM-TV Pittsburg`                                                                                NA
## `SourceKOAT Albuquerque`                                                                                 NA
## `SourceKOB 4 Albuquerque`                                                                                NA
## SourceKOB.com                                                                                            NA
## `SourceKOBI-TV NBC5 / KOTI-TV NBC2`                                                                      NA
## `SourceKOCO 5 Oklahoma City`                                                                             NA
## `SourceKOCO Oklahoma City`                                                                               NA
## `SourceKokomo Tribune`                                                                                   NA
## `SourceKOLD News 13 Tuscon`                                                                              NA
## SourceKOLO                                                                                               NA
## `SourceKOLO 8 Reno`                                                                                      NA
## SourceKomando                                                                                            NA
## `SourceKOMO News`                                                                                        NA
## `SourceKOMO Seattle`                                                                                     NA
## `SourceKOMU Columbia`                                                                                    NA
## `SourceKorea JoongAng Daily`                                                                             NA
## `SourceKorea Portal (English Edition)`                                                                   NA
## `SourceKorea Times`                                                                                      NA
## SourceKOSU                                                                                               NA
## SourceKotaku                                                                                             NA
## `SourceKotaku Australia`                                                                                 NA
## SourceKotatv                                                                                             NA
## `SourceKPAX-TV`                                                                                          NA
## SourceKPBS                                                                                               NA
## `SourceKPBS San Diego`                                                                                   NA
## `SourceKPCC Pasadena`                                                                                    NA
## `Sourcekpfa 94.1fm`                                                                                      NA
## `SourceKPHO Phoenix`                                                                                     NA
## `SourceKPLR 11 St. Louis`                                                                                NA
## `SourceKPLU News for Seattle and the Northwest`                                                          NA
## `SourceKPRC Houston`                                                                                     NA
## `SourceKPRC Local 2 Houston`                                                                             NA
## `SourceKPVI News 6`                                                                                      NA
## SourceKQED                                                                                               NA
## SourceKRBD                                                                                               NA
## SourceKRCRTV.COM                                                                                         NA
## SourceKRDO                                                                                               NA
## `SourceKRDO Colorado Springs`                                                                            NA
## `SourceKrebs on Security`                                                                                NA
## SourceKRGV                                                                                               NA
## `SourceKRIS Corpus Christi News`                                                                         NA
## `SourceKRNV My News 4`                                                                                   NA
## SourceKRON4.com                                                                                          NA
## `SourceKRQE & KASA FOX 2 Albuquerque`                                                                    NA
## `SourceKRQE News 13`                                                                                     NA
## `SourceKRTV Great Falls News`                                                                            NA
## `SourceKSAT San Antonio`                                                                                 NA
## `SourceKSBY San Luis Obispo News`                                                                        NA
## SourceKSDK                                                                                               NA
## SourceKSDK.com                                                                                           NA
## SourceKSHB                                                                                               NA
## `SourceKSHB-TV Kansas City`                                                                              NA
## SourceKSL.com                                                                                            NA
## `SourceKSLA-TV`                                                                                          NA
## `SourceKSLA-TV Shreveport`                                                                               NA
## `SourceKSNT (press release) (registration) (blog)`                                                       NA
## SourceKSPR                                                                                               NA
## SourceKSWO                                                                                               NA
## `SourceKSWO Lawton-Wichita Falls`                                                                        NA
## SourceKTAL                                                                                               NA
## `SourceKTAL Shreveport`                                                                                  NA
## SourceKTAR.com                                                                                           NA
## SourceKTBS                                                                                               NA
## SourceKTIC                                                                                               NA
## SourceKTLA                                                                                               NA
## SourceKTOO                                                                                               NA
## SourceKTRE                                                                                               NA
## `SourceKTRE Lufkin and Nacogdoches`                                                                      NA
## `SourceKTRK-TV`                                                                                          NA
## `SourceKTTC Rochester`                                                                                   NA
## `SourceKTTS 94.7`                                                                                        NA
## SourceKTUL                                                                                               NA
## SourceKTUU.com                                                                                           NA
## `SourceKTVA.com - Anchorage, Alaska`                                                                     NA
## SourceKTVB                                                                                               NA
## SourceKTVB.com                                                                                           NA
## SourceKTVN                                                                                               NA
## `SourceKTVN Reno`                                                                                        NA
## `SourceKTVQ Billings News`                                                                               NA
## `SourceKTVU San Francisco`                                                                               NA
## SourceKTVZ                                                                                               NA
## SourceKTXS                                                                                               NA
## `SourceKuensel, Buhutan's National Newspaper`                                                            NA
## `SourceKUOW News and Information`                                                                        NA
## SourceKUT                                                                                                NA
## `SourceKUTV 2News`                                                                                       NA
## `SourceKuwait News Agency`                                                                               NA
## `SourceKuwait Times`                                                                                     NA
## `SourceKVOA Tucson News`                                                                                 NA
## SourceKVUE                                                                                               NA
## SourceKVUE.com                                                                                           NA
## Sourcekwbe                                                                                               NA
## SourceKWCH                                                                                               NA
## `SourceKWQC-TV6`                                                                                         NA
## `SourceKWTV News9`                                                                                       NA
## Sourcekwwl.com                                                                                           NA
## `SourceKX TV North Dakota`                                                                               NA
## SourceKXAN.com                                                                                           NA
## `SourceKXLH Helena News`                                                                                 NA
## SourceKXNet.com                                                                                          NA
## `SourceKXXV News Channel 25`                                                                             NA
## `SourceKXXV Waco`                                                                                        NA
## SourceKY3                                                                                                NA
## `SourceKyiv Post`                                                                                        NA
## `SourceKYIV Post`                                                                                        NA
## `SourceKykernel.com (subscription)`                                                                      NA
## SourceKYMA                                                                                               NA
## SourceKYTX                                                                                               NA
## SourceKYUK                                                                                               NA
## `SourceL'Express`                                                                                        NA
## `SourceL'Expression`                                                                                     NA
## `SourceL'Humanit\\u009d\\u009d`                                                                          NA
## `SourceL'Humanité`                                                                                       NA
## `SourceL'info en direct d'Isra\\u009d\\u009dl 24h/24 (Communiqu\\u009d\\u009d de presse) (Blog)`         NA
## `SourceL'Orient-Le Jour`                                                                                 NA
## `SourceL&#39;Atelier`                                                                                    NA
## `SourceL.A. Biz`                                                                                         NA
## `SourceL.A. Weekly`                                                                                      NA
## `SourceLa Croix`                                                                                         NA
## `SourceLa Crosse Tribune`                                                                                NA
## `SourceLA Daily News`                                                                                    NA
## SourceLabourList                                                                                         NA
## Sourceladepeche.fr                                                                                       NA
## `SourceLadysmith Gazette`                                                                                NA
## SourceLAist                                                                                              NA
## `SourceLake Cowichan Gazette`                                                                            NA
## `SourceLake Tahoe News`                                                                                  NA
## SourceLakenewsonline.com                                                                                 NA
## `SourceLakeshore Public Media`                                                                           NA
## `SourceLamorinda Sun`                                                                                    NA
## `SourceLancashire Evening Post`                                                                          NA
## `SourceLancashire Telegraph`                                                                             NA
## `SourceLancaster Eagle Gazette`                                                                          NA
## `SourceLancaster Today`                                                                                  NA
## SourceLancasterOnline                                                                                    NA
## `SourceLanka Business Online`                                                                            NA
## `SourceLansing State Journal`                                                                            NA
## `SourceLaptop Mag`                                                                                       NA
## `SourceLas Cruces Sun-News`                                                                              NA
## `SourceLas Vegas Review-Journal`                                                                         NA
## `SourceLas Vegas Review-Journal (blog)`                                                                  NA
## `SourceLas Vegas Sun`                                                                                    NA
## `SourceLast Night On`                                                                                    NA
## `SourceLatin American Herald Tribune`                                                                    NA
## `SourceLatin Correspondent`                                                                              NA
## `SourceLatin Post`                                                                                       NA
## `SourceLatin Times`                                                                                      NA
## `SourceLatino Post`                                                                                      NA
## `SourceLatinos Post`                                                                                     NA
## `SourceLawfare (blog)`                                                                                   NA
## SourceLawNewz                                                                                            NA
## `SourceLawrence Berkeley National Laboratory`                                                            NA
## `SourceLawrence Journal-World`                                                                           NA
## `SourceLawrence Journal World`                                                                           NA
## `SourceLawrence Journal World (blog)`                                                                    NA
## `SourceLawyer Herald`                                                                                    NA
## `SourceLayman Online`                                                                                    NA
## SourceLazygamer                                                                                          NA
## `SourceLBC 97.3`                                                                                         NA
## `SourceLe Club de Mediapart (Blog)`                                                                      NA
## `SourceLe Figaro`                                                                                        NA
## `SourceLe Grand Soir.info`                                                                               NA
## `SourceLe Mauricien`                                                                                     NA
## `SourceLe Mirabel`                                                                                       NA
## `SourceLe Monde`                                                                                         NA
## `SourceLe Monde Diplomatique`                                                                            NA
## `SourceLe Monde Diplomatique (blog)`                                                                     NA
## `SourceLe Parisien`                                                                                      NA
## `SourceLe Soleil`                                                                                        NA
## `SourceLe T\\u009d\\u009dl\\u009d\\u009dgramme`                                                          NA
## `SourceLeader-Telegram`                                                                                  NA
## `SourceLeader Journal`                                                                                   NA
## `SourceLeaders Tunisie`                                                                                  NA
## `SourceLeadership Newspapers`                                                                            NA
## SourceLeafly                                                                                             NA
## `SourceLeamington Courier`                                                                               NA
## SourceLearnBonds                                                                                         NA
## SourceLEDinside                                                                                          NA
## `SourceLee's Summit Journal`                                                                             NA
## `SourceLeek Post & Times`                                                                                NA
## `SourceLeesville Daily Leader`                                                                           NA
## SourceLeFaso.net                                                                                         NA
## `SourceLeft Foot Forward`                                                                                NA
## `SourceLeftLane News`                                                                                    NA
## `Sourcelegal Insurrection (blog)`                                                                        NA
## `SourceLehigh Valley Business`                                                                           NA
## Sourcelehighvalleylive.com                                                                               NA
## `SourceLeicester Mercury`                                                                                NA
## SourceleJDD.fr                                                                                           NA
## SourceleJSD                                                                                              NA
## `SourceLet Me Know About This`                                                                           NA
## `SourceLethbridge Herald`                                                                                NA
## Sourceletsrecycle.com                                                                                    NA
## `SourceLexington Herald-Leader`                                                                          NA
## `SourceLexington Herald Leader`                                                                          NA
## `SourceLexology (registration)`                                                                          NA
## `SourceLGBTQ Nation`                                                                                     NA
## `SourceLiberal Democrat Voice`                                                                           NA
## SourceLiberation                                                                                         NA
## `SourceLiberian Daily Observer`                                                                          NA
## `SourceLiberty News Now`                                                                                 NA
## SourceLifehacker                                                                                         NA
## `SourceLifehacker Australia`                                                                             NA
## `SourceLifehacker UK`                                                                                    NA
## SourceLifeNews.com                                                                                       NA
## SourceLifesite                                                                                           NA
## SourceLifestyles                                                                                         NA
## SourceLifeZette                                                                                          NA
## `SourceLight Reading`                                                                                    NA
## SourceLiliputing                                                                                         NA
## `SourceLim Kit Siang`                                                                                    NA
## `SourceLimerick Post`                                                                                    NA
## `SourceLincoln Journal Star`                                                                             NA
## `SourceLincolnshire Echo`                                                                                NA
## `SourceLinkedIn (blog)`                                                                                  NA
## `SourceLinn's Stamp News`                                                                                NA
## SourceLinux                                                                                              NA
## `SourceLinux Journal`                                                                                    NA
## `SourceLinux Today`                                                                                      NA
## `SourceLinux.com (blog)`                                                                                 NA
## SourceLinuxInsider.com                                                                                   NA
## `SourceLion's Roar`                                                                                      NA
## `SourceLisbon Morning Journal`                                                                           NA
## `SourceLive 5 News Charleston`                                                                           NA
## `SourceLive Science`                                                                                     NA
## `SourceLive Trading News`                                                                                NA
## SourceLivemint                                                                                           NA
## `SourceLiverpool Echo`                                                                                   NA
## `SourceLiveScience.com via Yahoo! News`                                                                  NA
## `SourceLivingston Daily`                                                                                 NA
## SourceLLRX.com                                                                                           NA
## SourceLobeLog                                                                                            NA
## `SourceLocal 10`                                                                                         NA
## `SourceLocal 10 Miami`                                                                                   NA
## `SourceLocal 6 Orlando`                                                                                  NA
## `SourceLocal 8 Now`                                                                                      NA
## SourceLocalNews8.com                                                                                     NA
## `SourceLockport Union-Sun & Journal`                                                                     NA
## `SourceLogistics Management`                                                                             NA
## `SourceLompoc Record`                                                                                    NA
## `SourceLondon Evening Standard`                                                                          NA
## `SourceLondon Free Press`                                                                                NA
## `SourceLondon Loves Business`                                                                            NA
## `SourceLondon Review of Books (subscription)`                                                            NA
## `SourceLondon School of Business and Finance (blog)`                                                     NA
## `SourceLondon South East (registration) (blog)`                                                          NA
## SourceLondon24                                                                                           NA
## `SourceLondonderry Today`                                                                                NA
## SourceLondonist                                                                                          NA
## `SourceLong Beach Press Telegram`                                                                        NA
## `SourceLong Island Business News`                                                                        NA
## `SourceLong Island Business News (subscription)`                                                         NA
## `SourceLong War Journal`                                                                                 NA
## `SourceLongview Daily News`                                                                              NA
## `SourceLongview News-Journal`                                                                            NA
## `SourceLonoke News`                                                                                      NA
## `SourceLos Angeles Business Journal`                                                                     NA
## `SourceLos Angeles Daily News`                                                                           NA
## `SourceLos Angeles Sun Times`                                                                            NA
## `SourceLos Angeles Times`                                                                                NA
## `SourceLost Coast Outpost`                                                                               NA
## SourceLoudwire                                                                                           NA
## `SourceLowell Sun`                                                                                       NA
## SourceLubbockOnline.com                                                                                  NA
## `SourceLudwig von Mises Institute`                                                                       NA
## `SourceLusaka Times`                                                                                     NA
## `SourceLuton Today`                                                                                      NA
## `SourceLuxemburger Wort - English Edition`                                                               NA
## `SourceLuxury Daily`                                                                                     NA
## `SourceLynchburg News and Advance`                                                                       NA
## `SourceLynn News`                                                                                        NA
## `SourceM\\u009d\\u009ddecins Sans Fronti\\u009d\\u009dres (MSF) International`                           NA
## `SourceM\\u009d\\u009ddias-Presse-Info`                                                                  NA
## `SourceM\\u009d\\u009dtro Montr\\u009d\\u009dal`                                                         NA
## `SourceMac Kung Fu (satire) (blog)`                                                                      NA
## `SourceMac Rumors`                                                                                       NA
## `SourceMacau Daily Times`                                                                                NA
## SourceMacDailyNews                                                                                       NA
## `SourceMackay Daily Mercury`                                                                             NA
## SourceMacleans.ca                                                                                        NA
## SourceMacNN                                                                                              NA
## `SourceMacroBusiness (blog)`                                                                             NA
## SourceMacworld                                                                                           NA
## `SourceMacworld (blog)`                                                                                  NA
## `SourceMacworld UK`                                                                               1.072e+00
## `SourceMadame Figaro`                                                                                    NA
## `SourceMadame Noire`                                                                                     NA
## SourceMadameNoire                                                                                        NA
## SourceMadison.com                                                                                        NA
## `SourceMaidenhead Advertiser`                                                                            NA
## `SourceMail & Guardian`                                                                                  NA
## `SourceMail & Guardian Africa`                                                                           NA
## `SourceMail & Guardian Online`                                                                           NA
## `SourceMail Today via Yahoo! India News`                                                                 NA
## `SourceMain Line Times`                                                                                  NA
## `SourceMaine Public Broadcasting`                                                                        NA
## SourceMainStreet                                                                                         NA
## `SourceMaison des Droits de l'Homme de Limoges`                                                          NA
## SourceMakeUseOf                                                                                          NA
## SourceMalawi24                                                                                           NA
## `SourceMalay Mail Online`                                                                                NA
## `SourceMalaysia Chronicle`                                                                               NA
## `SourceMalaysiakini (subscription)`                                                                      NA
## `SourceMalaysian Digest`                                                                                 NA
## Sourcemalaysiandigest.com                                                                                NA
## `SourceMalta Independent Online`                                                                         NA
## `SourceMalta Independent Online (blog)`                                                                  NA
## `SourceMalta Star`                                                                                       NA
## SourceMaltaToday                                                                                         NA
## `SourceMaltaToday (blog)`                                                                                NA
## `SourceManagement Today`                                                                                 NA
## `SourceManawatu Standard`                                                                                NA
## `SourceManchester Evening News`                                                                          NA
## `SourceManila Bulletin`                                                                                  NA
## `SourceManila Standard Today`                                                                            NA
## `SourceMankato Free Press`                                                                               NA
## `SourceMansfield News Journal`                                                                           NA
## SourceManufacturing.net                                                                                  NA
## `SourceManx Radio`                                                                                       NA
## `SourceMaple Ridge News`                                                                                 NA
## `SourceMaple Ridge Times`                                                                                NA
## SourceMarca                                                                                              NA
## `SourceMarie Claire Australia`                                                                           NA
## SourceMarieClaire.com                                                                                    NA
## `SourceMarine Corps Times`                                                                               NA
## SourceMarineLink                                                                                         NA
## `SourceMarket Exclusive`                                                                                 NA
## `SourceMarket Realist`                                                                                   NA
## `SourceMarket Realist via Yahoo Canada Finance`                                                          NA
## `SourceMarket Realist via Yahoo UK & Ireland Finance`                                                    NA
## `SourceMarket Realist via Yahoo! Finance`                                                         9.914e-01
## `SourceMarket Realist via Yahoo! Finance India`                                                          NA
## `SourceMarket Realist via Yahoo! New Zealand Finance`                                                    NA
## `SourceMarket Realist via Yahoo!7 Finance`                                                               NA
## `SourceMarket Watch`                                                                                     NA
## SourceMarketing                                                                                          NA
## `SourceMarketing Interactive`                                                                            NA
## `SourceMarketing Land`                                                                                   NA
## `SourceMarketing magazine Australia (registration)`                                                      NA
## `SourceMarketingProfs.com (subscription)`                                                                NA
## SourceMarketplace.org                                                                                    NA
## `SourceMarketPulse (blog)`                                                                               NA
## `SourceMarkets Daily`                                                                                    NA
## `SourceMarkets Morning`                                                                                  NA
## SourceMarketWatch                                                                                        NA
## `SourceMarketWatch (blog)`                                                                               NA
## `SourceMarketWatch via Yahoo Canada Finance`                                                             NA
## `SourceMarketWatch via Yahoo UK & Ireland Finance`                                                       NA
## `SourceMarketWatch via Yahoo! Finance`                                                                   NA
## `SourceMarketWatch via Yahoo! Finance India`                                                             NA
## `SourceMarketWatch via Yahoo! New Zealand Finance`                                                       NA
## `SourceMarketWatch via Yahoo! News`                                                                      NA
## `SourceMarketWatch via Yahoo!7 Finance`                                                                  NA
## SourceMarketwire                                                                                         NA
## `SourceMarketwired (press release)`                                                                      NA
## `SourceMarketwired via Yahoo Canada Finance`                                                             NA
## `SourceMarketwired via Yahoo UK & Ireland Finance`                                                       NA
## `SourceMarketwired via Yahoo! Finance`                                                                   NA
## `SourceMarlborough Express`                                                                              NA
## `SourceMarquette Wire`                                                                                   NA
## `SourceMarTech Advisor`                                                                                  NA
## `SourceMartins Ferry Times Leader`                                                                       NA
## `SourceMartinsburg Journal`                                                                              NA
## `SourceMaryland Daily Record (subscription)`                                                             NA
## SourceMashable                                                                                    1.107e-01
## `SourceMashable Tech via Yahoo UK & Ireland News`                                                        NA
## `SourceMashable via Yahoo Canada News`                                                                   NA
## `SourceMashable via Yahoo! News`                                                                         NA
## `SourceMason City Globe Gazette`                                                                         NA
## `SourceMass Device`                                                                                      NA
## SourceMassLive.com                                                                                       NA
## `SourceMasterstudies News (blog)`                                                                        NA
## `SourceMaterial Handling & Logistics`                                                                    NA
## `SourceMaui Now`                                                                                         NA
## `SourceMaximum PC`                                                                                       NA
## `SourceMcClatchy Washington Bureau`                                                                      NA
## SourceMCV                                                                                                NA
## `SourceMeadville Tribune`                                                                                NA
## `SourceMeat and Poultry Online`                                                                          NA
## `SourceMed Device Online (press release)`                                                                NA
## `SourceMedCity News`                                                                                     NA
## `SourceMedia Life Magazine`                                                                              NA
## `SourceMedia Matters for America`                                                                        NA
## `SourceMedia Matters for America (blog)`                                                                 NA
## SourceMediaite                                                                                           NA
## SourceMediapart                                                                                          NA
## SourceMediaPost                                                                                          NA
## `SourceMediaPost Communications`                                                                         NA
## `SourceMedical Daily`                                                                                    NA
## `SourceMedical Xpress`                                                                                   NA
## `SourceMedicine Hat News`                                                                                NA
## SourceMedicineNet.com                                                                                    NA
## `SourceMedill Reports: Chicago`                                                                          NA
## `SourceMedPage Today`                                                                                    NA
## `SourceMEED (subscription)`                                                                              NA
## SourceMegaGames                                                                                          NA
## `SourceMehr News Agency - English Version`                                                               NA
## SourceMemeburn                                                                                           NA
## `SourceMemorial Examiner`                                                                                NA
## `SourceMemphis Business Journal`                                                                         NA
## `SourceMemphis Business Journal (blog)`                                                                  NA
## `SourceMemphis Commercial Appeal`                                                                        NA
## `SourceMemphis Daily News (blog)`                                                                        NA
## `SourceMemphis Flyer`                                                                                    NA
## `SourceMen's News Daily`                                                                                 NA
## `SourceMen&#39;s Journal Tech via Yahoo! News`                                                           NA
## SourceMENAFN                                                                                     -1.303e-01
## SourceMENAFN.COM                                                                                         NA
## `SourceMennonite World Review`                                                                           NA
## SourceMensquare                                                                                          NA
## `SourceMerced Sun-Star`                                                                                  NA
## SourceMercoPress                                                                                         NA
## `SourceMercury Daily (blog)`                                                                             NA
## `SourceMeriden Record-Journal`                                                                           NA
## `SourceMeridian Booster`                                                                                 NA
## `SourceMeridian Star`                                                                                    NA
## SourceMerinews                                                                                           NA
## `SourceMeriTalk (blog)`                                                                                  NA
## `SourceMERRY JANE`                                                                                       NA
## `SourceMetal Injection.net`                                                                              NA
## SourceMetalMiner                                                                                         NA
## SourceMetro                                                                                       2.370e+00
## `SourceMetro Halifax`                                                                                    NA
## `SourceMetro TV News`                                                                                    NA
## SourceMetro.us                                                                                           NA
## `SourceMetroNews Canada`                                                                                 NA
## SourceMetrotvnews.com                                                                                    NA
## `SourceMetroWest Daily News`                                                                             NA
## `SourceMFA China`                                                                                        NA
## `SourceMiami Herald`                                                                                     NA
## `SourceMiami Herald (blog)`                                                                              NA
## `SourceMiami New Times`                                                                                  NA
## SourceMiBiz                                                                                              NA
## SourceMic                                                                                                NA
## Sourcemicebtn                                                                                            NA
## `SourceMichigan Journal`                                                                                 NA
## `SourceMichigan Radio`                                                                                   NA
## `SourceMichigan State University Extension`                                                              NA
## SourceMichronicleonline                                                                                  NA
## `SourceMicroCap Magazine`                                                                                NA
## `SourceMicrogrid Knowledge`                                                                              NA
## SourceMicroScope                                                                                         NA
## `SourceMicrosoft - Channel 9`                                                                            NA
## `SourceMicrosoft - Channel 9 (blog)`                                                                     NA
## `SourceMid-Day`                                                                                          NA
## `SourceMiddle East Confidential`                                                                         NA
## `SourceMiddle East Eye`                                                                                  NA
## `SourceMiddle East Forum`                                                                                NA
## `SourceMiddle East Forum (blog)`                                                                         NA
## `SourceMiddle East Monitor`                                                                              NA
## `SourceMiddle East Monitor (blog)`                                                                       NA
## `SourceMiddle East Newsline`                                                                             NA
## `SourceMiddle East Online`                                                                               NA
## `SourceMiddle East Report Online`                                                                        NA
## `SourceMiddletown Press`                                                                                 NA
## `SourceMidland Daily News`                                                                               NA
## `SourceMidland Reporter-Telegram`                                                                        NA
## `SourceMidlothian Exchange`                                                                              NA
## `SourceMilitary Times`                                                                                   NA
## SourceMilitary.com                                                                                       NA
## `SourceMille Babords (Communiqu\\u009d\\u009d de presse)`                                                NA
## `SourceMilli Gazette`                                                                                    NA
## `SourceMilpitas Post`                                                                                    NA
## `SourceMilwaukee Business Journal`                                                                       NA
## `SourceMilwaukee Journal Sentinel`                                                                       NA
## `SourceMilwaukee Journal Sentinel (blog)`                                                                NA
## SourceMINA                                                                                               NA
## SourceMineweb                                                                                            NA
## `SourceMining Journal (subscription)`                                                                    NA
## `SourceMining MX`                                                                                        NA
## SourceMINING.com                                                                                         NA
## `SourceMinistry of External Affairs (press release)`                                                     NA
## `SourceMinistry of Foreign Affairs of Denmark`                                                           NA
## `SourceMinneapolis-St. Paul Star Tribune`                                                                NA
## `SourceMinneapolis Star Tribune`                                                                         NA
## `SourceMinneapolis Sun Times`                                                                            NA
## `SourceMinnesota Daily`                                                                                  NA
## `SourceMinnesota Public Radio`                                                                           NA
## `SourceMinnesota Public Radio News`                                                                      NA
## SourceMinnPost                                                                                           NA
## `SourceMintpress News (blog)`                                                                            NA
## SourceMinyanville.com                                                                                    NA
## `SourceMirage News`                                                                                      NA
## SourceMirror.co.uk                                                                                       NA
## `SourceMIS Asia`                                                                                         NA
## `SourceMiscellany News`                                                                                  NA
## SourceMississauga                                                                                        NA
## `SourceMississauga News`                                                                                 NA
## `SourceMississippi Business Journal`                                                                     NA
## `SourceMississippi News Now`                                                                             NA
## `SourceMIT News`                                                                                         NA
## `SourceMIT Technology Review`                                                                            NA
## `SourceMitzpeh (press release)`                                                                          NA
## SourceMixmag                                                                                             NA
## `SourceMizzima News`                                                                                     NA
## SourceMLive.com                                                                                          NA
## `SourceMLT News`                                                                                         NA
## SourceMMAjunkie.com                                                                                      NA
## `SourceMmegi Online`                                                                                     NA
## SourceMMH.com                                                                                            NA
## `SourceMNR Daily`                                                                                        NA
## `SourceMo4ch News (press release) (blog)`                                                                NA
## `SourceMoberly Monitor-Index`                                                                            NA
## SourceMobiHealthNews                                                                                     NA
## `SourceMobile & Apps`                                                                                    NA
## `SourceMobile Burn`                                                                                      NA
## `SourceMobile Choice`                                                                                    NA
## `SourceMobile Computing Today`                                                                           NA
## `SourceMobile ID World`                                                                                  NA
## `SourceMobile News`                                                                                      NA
## `SourceMobile Payments Today`                                                                            NA
## `SourceMobile Press-Register`                                                                            NA
## `SourceMobile Today`                                                                                     NA
## `SourceMobile World Live`                                                                                NA
## SourceMobileSyrup.com                                                                                    NA
## SourceMobiPicker                                                                                         NA
## `SourceModel D`                                                                                          NA
## `SourceModern Diplomacy`                                                                                 NA
## `SourceModern Distribution Management`                                                                   NA
## SourceModernHealthcare.com                                                                               NA
## SourceModernMedicine                                                                                     NA
## `SourceModest Money (press release) (blog)`                                                              NA
## `SourceMohave Daily News`                                                                                NA
## `SourceMohave Valley News`                                                                               NA
## `SourceMonadnock Ledger Transcript`                                                                      NA
## `SourceMondaq News Alerts (registration)`                                                                NA
## SourceMondoweiss                                                                                         NA
## SourceMoney                                                                                              NA
## `SourceMoney Flow Index`                                                                                 NA
## `SourceMoney Magazine`                                                                                   NA
## `SourceMoney Marketing`                                                                                  NA
## `SourceMoney Marketing Online`                                                                           NA
## `SourceMoney Morning`                                                                                    NA
## `SourceMoney Morning Australia`                                                                          NA
## `SourceMoney News (press release)`                                                                       NA
## `SourceMoney Talks News via Yahoo! Finance`                                                              NA
## SourceMoneycontrol.com                                                                                   NA
## SourceMoneySense                                                                                         NA
## SourceMoneyweb.co.za                                                                                     NA
## SourceMoneyWeek                                                                                          NA
## SourceMonitor                                                                                            NA
## `SourceMonitor Online (blog)`                                                                            NA
## `SourceMonroe Evening News`                                                                              NA
## `SourceMonroe News Star`                                                                                 NA
## `SourceMontana Standard`                                                                                 NA
## `SourceMontana Tech`                                                                                     NA
## `SourceMonterey County Weekly`                                                                           NA
## `SourceMontgomery Advertiser`                                                                            NA
## `SourceMonthly Review`                                                                                   NA
## `SourceMontreal Gazette`                                                                                 NA
## `SourceMontserrat Reporter`                                                                              NA
## `SourceMoodys.com (press release) (subscription)`                                                        NA
## `SourceMorning Consult`                                                                                  NA
## `SourceMorning Journal News`                                                                             NA
## `SourceMorning News USA`                                                                                 NA
## `SourceMorning Star`                                                                                     NA
## `SourceMorning Star Online`                                                                              NA
## `SourceMorning Ticker`                                                                                   NA
## SourceMorningstar                                                                                        NA
## SourceMorningstar.com                                                                                    NA
## `SourceMorocco World News`                                                                               NA
## `SourceMorris Daily Herald`                                                                              NA
## `SourceMother Jones`                                                                                     NA
## `SourceMother Nature Network (blog)`                                                                     NA
## SourceMotherboard                                                                                        NA
## `SourceMotley Fool`                                                                                      NA
## `SourceMotley Fool Australia`                                                                            NA
## `SourceMotor Trend`                                                                                      NA
## SourceMotoring                                                                                           NA
## `SourceMotorsport.com, Edition: Global`                                                                  NA
## SourceMotorTrend                                                                                         NA
## `SourceMountain View Voice`                                                                              NA
## `SourceMovie TV Tech Geeks News`                                                                         NA
## SourceMoviefone                                                                                          NA
## Sourcemoviepilot.com                                                                                     NA
## SourceMovieWeb                                                                                           NA
## `SourceMRCTV (blog)`                                                                                     NA
## `SourceMRCTV (satire) (blog)`                                                                            NA
## `SourceMrTopStep.com via Yahoo! Finance`                                                                 NA
## SourceMSDynamicsWorld.com                                                                                NA
## `SourceMSN Autos`                                                                                        NA
## SourceMSNBC                                                                                              NA
## SourceMSPmentor                                                                                          NA
## `SourceMSPmentor (blog)`                                                                                 NA
## SourceMSPoweruser.com                                                                                    NA
## SourceMTPR                                                                                               NA
## SourceMTV.com                                                                                            NA
## `SourceMulti-Housing News`                                                                               NA
## `SourceMultichannel News`                                                                                NA
## `SourceMumbai Mirror`                                                                                    NA
## SourceMuMbrella                                                                                          NA
## `SourceMunchies_ Food by VICE`                                                                           NA
## `SourceMuncie Star Press`                                                                                NA
## `SourceMuscat Daily`                                                                                     NA
## `SourceMuscatine Journal`                                                                                NA
## `SourceMusic Business Worldwide`                                                                         NA
## SourceMusicrooms.net                                                                                     NA
## `SourceMuslimVillage.com (press release) (blog)`                                                         NA
## `SourceMWC News`                                                                                         NA
## `SourceMy Fox Boston`                                                                                    NA
## `SourceMy News LA`                                                                                       NA
## `SourceMy Nintendo News (blog)`                                                                          NA
## `SourceMy Twin Tiers.com`                                                                                NA
## SourceMyAJC                                                                                              NA
## `SourceMyAJC (blog)`                                                                                     NA
## `SourceMyanmar Times`                                                                                    NA
## SourceMyBroadband                                                                                        NA
## SourceMyCentralJersey.com                                                                                NA
## SourceMyDaytonDailyNews                                                                                  NA
## Sourcemyfox8.com                                                                                         NA
## SourceMYFOXZONE.com                                                                                      NA
## SourceMyjoyonline.com                                                                                    NA
## SourceMyMotherLode.com                                                                                   NA
## SourceMyNewsLA.com                                                                                       NA
## SourceMyNorthwest.com                                                                                    NA
## `SourceMyrtle Beach Sun News`                                                                            NA
## SourcemySanAntonio.com                                                                                   NA
## `SourcemySanAntonio.com (blog)`                                                                          NA
## SourceMyStateline.com                                                                                    NA
## SourceMyStatesman.com                                                                                    NA
## SourceMyTechBits                                                                                         NA
## `SourceN.C. State University Technician Online`                                                          NA
## SourceN4BB                                                                                               NA
## SourceNaharnet                                                                                           NA
## SourceNAIJ.COM                                                                                           NA
## `SourceNaked Capitalism`                                                                                 NA
## `SourceNaked Security`                                                                                   NA
## `SourceNaked Security (blog)`                                                                            NA
## `SourceNamibia Economist`                                                                                NA
## SourceNamibian                                                                                           NA
## `SourceNanaimo News Bulletin`                                                                            NA
## `SourceNanoNews (blog)`                                                                                  NA
## `SourceNapa Valley Register`                                                                             NA
## `SourceNaples Daily News`                                                                                NA
## `SourceNarendra Modi (press release) (blog)`                                                             NA
## SourceNascar                                                                                             NA
## SourceNasdaq                                                                                             NA
## `SourceNashua Telegraph`                                                                                 NA
## `SourceNashville Business Journal`                                                                       NA
## `SourceNashville Business Journal (blog)`                                                                NA
## `SourceNashville Chatter`                                                                                NA
## `SourceNathan McAlone, Business Insider via Yahoo! Finance`                                              NA
## `SourceNation News`                                                                                      NA
## `Sourcenation.lk - The Nation Newspaper`                                                                 NA
## `SourceNational Catholic Register`                                                                       NA
## `SourceNational Catholic Reporter`                                                                       NA
## `SourceNational Catholic Reporter (blog)`                                                                NA
## `SourceNational Constitution Center via Yahoo! News`                                                     NA
## `SourceNational Geographic`                                                                              NA
## `SourceNational Journal`                                                                                 NA
## `SourceNational Mirror`                                                                                  NA
## `SourceNational Observer`                                                                                NA
## `SourceNational Post`                                                                                    NA
## `SourceNational Review Online`                                                                           NA
## `SourceNational Science Foundation (press release)`                                                      NA
## `SourceNational Turk English`                                                                            NA
## `SourceNATO HQ (press release)`                                                                          NA
## `SourceNatural Gas Intelligence`                                                                         NA
## `SourceNatural Resources Defense Council`                                                                NA
## `SourceNatural Resources Defense Council (blog)`                                                         NA
## SourceNature                                                                                             NA
## `SourceNature World News`                                                                                NA
## SourceNature.com                                                                                         NA
## `SourceNBC 12 Richmond`                                                                                  NA
## `SourceNBC 2 Fort Myers`                                                                                 NA
## `SourceNBC 29 News`                                                                                      NA
## `SourceNBC 5 Dallas-Fort Worth`                                                                          NA
## `SourceNBC 6 South Florida`                                                                              NA
## `SourceNBC 7 San Diego`                                                                                  NA
## `SourceNBC Bay Area`                                                                                     NA
## `SourceNBC Chicago`                                                                                      NA
## `SourceNBC Chicago (blog)`                                                                               NA
## `SourceNBC Connecticut`                                                                                  NA
## `SourceNBC Montana`                                                                                      NA
## `SourceNBC Nebraska`                                                                                     NA
## `SourceNBC New York`                                                                                     NA
## `SourceNBC NEWS`                                                                                         NA
## `SourceNBC Southern California`                                                                          NA
## `SourceNBC2 News`                                                                                        NA
## `SourceNBC4 Washington`                                                                                  NA
## SourceNBC4i.com                                                                                          NA
## SourceNBCNews.com                                                                                        NA
## SourceNBCSports.com                                                                                      NA
## SourceNCAA.com                                                                                           NA
## `SourceNCR-Iran.org`                                                                                     NA
## SourceNDTV                                                                                               NA
## `SourceNDTV (blog)`                                                                                      NA
## SourceNDTVSports.com                                                                                     NA
## `SourceNearshore Americas`                                                                               NA
## `SourceNehanda Radio`                                                                                    NA
## `SourceNenagh Guardian`                                                                                  NA
## `SourceNeos Kosmos`                                                                                      NA
## `SourceNeosho Daily News`                                                                                NA
## SourceNeowin                                                                                             NA
## SourceNerdist                                                                                            NA
## `SourceNerdWallet (blog)`                                                                                NA
## SourceNESN.com                                                                                           NA
## `SourceNetGuide NZ`                                                                                      NA
## SourceNetimperative                                                                                      NA
## `SourceNetwork World`                                                                                    NA
## `SourceNetworks Asia`                                                                                    NA
## SourceNeurogadget                                                                                        NA
## `SourceNevada County Picayune`                                                                           NA
## `SourceNew America Media`                                                                                NA
## `SourceNew Bern Sun Journal`                                                                             NA
## `SourceNew Era`                                                                                          NA
## `SourceNew Europe`                                                                                       NA
## `SourceNew Hampshire Business Review`                                                                    NA
## `SourceNew Hampshire Public Radio`                                                                       NA
## `SourceNew Hampshire Union Leader`                                                                       NA
## `SourceNew Haven Register`                                                                               NA
## `SourceNew Historian`                                                                                    NA
## `SourceNew Internationalist (blog)`                                                                      NA
## `SourceNew Jersey 101.5 FM Radio`                                                                        NA
## `SourceNew Jersey Herald`                                                                                NA
## `SourceNew Kerala`                                                                                6.491e-01
## `SourceNew Matilda`                                                                                      NA
## `SourceNew Republic`                                                                                     NA
## `SourceNew Ross Standard`                                                                                NA
## `SourceNew Sabah Times`                                                                                  NA
## `SourceNew Scientist`                                                                                    NA
## `SourceNew Statesman`                                                                                    NA
## `SourceNew Straits Times Online`                                                                         NA
## `SourceNew Straits Times via Yahoo! Singapore News`                                                      NA
## `SourceNew University`                                                                                   NA
## `SourceNew Vision`                                                                                       NA
## `SourceNew York's PIX11 / WPIX-TV`                                                                       NA
## `SourceNew York Business Journal`                                                                        NA
## `SourceNew York Daily News`                                                                              NA
## `SourceNew York Magazine`                                                                                NA
## `SourceNew York Post`                                                                                    NA
## `SourceNew York Recorder`                                                                                NA
## `SourceNew York Review of Books`                                                                         NA
## `SourceNew York Sun`                                                                                     NA
## `SourceNew York Times`                                                                           -4.504e+15
## `SourceNew York Times (blog)`                                                                            NA
## `SourceNew York Times Finance`                                                                           NA
## `SourceNew Zealand Herald`                                                                               NA
## `SourceNew Zealand Listener`                                                                             NA
## `SourceNew Zimbabwe`                                                                                     NA
## `SourceNew Zimbabwe.com`                                                                                 NA
## SourceNewbritainherald                                                                                   NA
## `SourceNewcastle Herald`                                                                                 NA
## `SourceNewham Recorder`                                                                                  NA
## SourceNewNowNext                                                                                         NA
## `SourceNews-Medical.net`                                                                                 NA
## `SourceNews & Observer`                                                                                  NA
## `SourceNews & Observer (blog)`                                                                           NA
## `SourceNews & Star`                                                                                      NA
## `SourceNews 10NBC`                                                                                       NA
## `SourceNews 1130`                                                                                        NA
## `SourceNews 24 South Africa`                                                                             NA
## `SourceNews Channel 12 New Bern`                                                                         NA
## `SourceNews Every day`                                                                                   NA
## `SourceNews from Rutgers`                                                                                NA
## `SourceNews Ghana`                                                                                       NA
## `SourceNews On 6`                                                                                        NA
## `SourceNews On 6 Tulsa`                                                                                  NA
## `SourceNews One`                                                                                         NA
## `SourceNews Oracle`                                                                                      NA
## `SourceNews Radio 710 KEEL`                                                                              NA
## `SourceNews Sentinel`                                                                                    NA
## `SourceNews Talk 610 CKTB`                                                                               NA
## `SourceNews Talk 650 CKOM`                                                                               NA
## `SourceNews Talk 770 Calgary`                                                                            NA
## `SourceNews Talk Florida`                                                                                NA
## `SourceNews Tribe`                                                                                       NA
## `SourceNews Watch International`                                                                         NA
## `SourceNews West 9 Midland`                                                                              NA
## `SourceNews World India`                                                                                 NA
## SourceNews.Az                                                                                            NA
## SourceNews.com.au                                                                                        NA
## SourceNEWS.com.au                                                                                        NA
## `SourceNews.com.au Travel`                                                                               NA
## Sourcenews.delaware.gov                                                                                  NA
## `SourceNEWS10 ABC`                                                                                       NA
## SourceNews1130                                                                                           NA
## SourceNews18                                                                                             NA
## SourceNews24                                                                                             NA
## `SourceNews24 Nigeria`                                                                                   NA
## SourceNews3LV                                                                                            NA
## SourceNews4C                                                                                             NA
## `Sourcenews9.com KWTV`                                                                                   NA
## `SourceNewsAhead Agency`                                                                                 NA
## SourceNewsandtribune                                                                                     NA
## SourcenewsBTC                                                                                            NA
## SourceNewsbug.info                                                                                       NA
## `SourceNewsBusters (blog)`                                                                               NA
## SourceNewscenter1.tv                                                                                     NA
## `SourceNewschannel 6 Wichita Falls`                                                                      NA
## SourceNewsChannel5.com                                                                                   NA
## SourceNewsday                                                                                            NA
## SourceNewsDay                                                                                            NA
## SourceNewsdzeZimbabwe                                                                                    NA
## SourceNewser                                                                                             NA
## SourceNewsexaminer                                                                                       NA
## `SourceNewsFactor Network`                                                                               NA
## SourceNewsfirst                                                                                          NA
## SourceNewsGhana.com.gh                                                                                   NA
## `SourceNewsHounds (blog)`                                                                                NA
## SourceNewshub                                                                                            NA
## `SourceNewshub (blog)`                                                                                   NA
## SourceNewsInferno                                                                                        NA
## SourceNewsmax                                                                                            NA
## `SourceNewsnext Bangladesh`                                                                              NA
## SourceNewsOK.com                                                                                         NA
## SourceNewsQuench                                                                                         NA
## `SourceNewstalk 106-108 fm`                                                                              NA
## `SourceNewstalk ZB`                                                                                      NA
## `SourceNewsWay 21`                                                                                       NA
## SourceNewsweek                                                                                           NA
## `SourceNewsweek ME`                                                                                      NA
## `SourceNewsweek via Yahoo UK & Ireland News`                                                             NA
## `SourceNewsweek via Yahoo! News`                                                                         NA
## `SourceNewsweel ME (satire) (press release) (blog)`                                                      NA
## SourceNewsWest9.com                                                                                      NA
## SourceNewswise                                                                                           NA
## SourceNewsWithViews.com                                                                                  NA
## SourceNewsworks.org                                                                                      NA
## SourceNewsx                                                                                              NA
## SourceNewsy                                                                                              NA
## `SourceNewton Press Mentor`                                                                              NA
## SourceNewzy                                                                                              NA
## `SourceNext Big Future`                                                                                  NA
## `SourceNext City`                                                                                        NA
## SourceNextShark                                                                                          NA
## `SourceNFC World`                                                                                        NA
## SourceNFL.com                                                                                            NA
## `SourceNiagara Falls Review`                                                                             NA
## `SourceNiche Gamer`                                                                                      NA
## `SourceNigeria (press release) (blog)`                                                                   NA
## `SourceNightcap TV`                                                                                      NA
## `SourceNikkei Asian Review`                                                                              NA
## `SourceNine O&#39;Clock`                                                                                 NA
## `Sourceninemsn 9Stories`                                                                                 NA
## `SourceNintendo Life`                                                                                    NA
## `SourceNIU Newsroom`                                                                                     NA
## SourceNJ.com                                                                                             NA
## SourceNJBIZ                                                                                              NA
## `SourceNK News`                                                                                          NA
## `SourceNL Times`                                                                                         NA
## SourceNME                                                                                                NA
## SourceNME.com                                                                                            NA
## SourceNMPolitics.net                                                                                     NA
## `SourceNo Jitter`                                                                                        NA
## SourceNOLA.com                                                                                           NA
## SourceNooga.com                                                                                          NA
## SourceNoozhawk                                                                                           NA
## `SourceNorfolk Eastern Daily Press`                                                                      NA
## `SourceNorman Transcript`                                                                                NA
## `SourceNorth American Windpower`                                                                         NA
## `SourceNorth Bay Business Journal`                                                                       NA
## `SourceNorth Country Public Radio`                                                                       NA
## `SourceNorth Queensland Register`                                                                        NA
## `SourceNorthampton Chronicle & Echo`                                                                     NA
## `SourceNorthamptonshire Telegraph`                                                                       NA
## `SourceNortheast Mississippi Daily Journal`                                                              NA
## `SourceNorthern Californian`                                                                             NA
## `SourceNorthern Echo`                                                                                    NA
## `SourceNorthern Star`                                                                                    NA
## SourceNorthernLife.ca                                                                                    NA
## SourceNorthfield.org                                                                                     NA
## SourceNorthJersey.com                                                                                    NA
## `SourceNorthumberland Gazette`                                                                           NA
## `SourceNorthwest Arkansas News`                                                                          NA
## `SourceNorthwest Georgia News`                                                                           NA
## `SourceNorthwest Herald`                                                                                 NA
## `SourceNorthwestern University NewsCenter`                                                               NA
## `SourceNotebook Review`                                                                                  NA
## SourceNotebookReview.com                                                                                 NA
## `SourceNottingham Post`                                                                                  NA
## SourceNovinite                                                                                           NA
## SourceNovinite.com                                                                                       NA
## `SourceNOW Magazine`                                                                                     NA
## SourceNowGamer                                                                                           NA
## SourceNPR                                                                                                NA
## SourceNSEAVoice.com                                                                                      NA
## `SourceNT News`                                                                                          NA
## SourceNTV                                                                                                NA
## SourceNumbersUSA                                                                                         NA
## SourceNuvo                                                                                               NA
## `SourceNUVO Newsweekly`                                                                                  NA
## SourceNWAOnline                                                                                          NA
## SourceNWCN.com                                                                                           NA
## Sourcenwitimes.com                                                                                       NA
## `SourceNY Blueprint`                                                                                     NA
## `SourceNyasa Times`                                                                                      NA
## SourceNYCaribNews                                                                                        NA
## `SourceNYSE Post`                                                                                        NA
## `SourceNYU Washington Square News`                                                                       NA
## `SourceNZ Newswire via Yahoo! New Zealand News`                                                          NA
## `SourceNZ Newswire via Yahoo!7 News`                                                                     NA
## SourceNZCity                                                                                             NA
## `SourceOakland Tribune`                                                                                  NA
## `SourceOakville Beaver`                                                                                  NA
## SourceObserver                                                                                           NA
## `SourceObserver-Reporter`                                                                                NA
## `SourceObstacle Racing Media (press release) (blog)`                                                     NA
## SourceOcala                                                                                              NA
## SourceOCCRP                                                                                              NA
## SourceOCRegister                                                                                         NA
## `Sourceodditycentral (blog)`                                                                             NA
## `SourceOdessa American`                                                                                  NA
## SourceOilOnline                                                                                          NA
## SourceOilPrice.com                                                                                       NA
## `SourceOilprice.com via Yahoo Canada Finance`                                                            NA
## `SourceOilprice.com via Yahoo! Finance`                                                                  NA
## `SourceOilprice.com via Yahoo! New Zealand Finance`                                                      NA
## `SourceOilprice.com via Yahoo!7 Finance`                                                                 NA
## `SourceOK! Magazine`                                                                                     NA
## `SourceOklahoma&#39;s NewsChannel 4`                                                                     NA
## `SourceOldham Chronicle`                                                                                 NA
## `SourceOlean Times Herald`                                                                               NA
## `SourceOlhar Digital`                                                                                    NA
## `SourceOlive Press`                                                                                      NA
## `SourceOmaha World-Herald`                                                                               NA
## `SourceOMCT World Organisation Against Torture`                                                          NA
## `SourceOmnisport via Yahoo! Sports`                                                                      NA
## `SourceOn Cars India`                                                                                    NA
## `SourceOn Line opinion`                                                                                  NA
## `SourceOne India`                                                                                        NA
## SourceOneindia                                                                                           NA
## SourceOneNewsNow                                                                                         NA
## `SourceOneonta Daily Star`                                                                               NA
## `SourceOnline Athens`                                                                                    NA
## `SourceOnly Single Player`                                                                               NA
## Sourceonmanorama                                                                                         NA
## SourceOnrec                                                                                              NA
## `SourceOntario Argus Observer`                                                                           NA
## `SourceOnward State`                                                                                     NA
## SourceOnWindows.com                                                                                      NA
## `SourceOPB News`                                                                                         NA
## SourceOpEdNews                                                                                           NA
## `SourceOpen Democracy`                                                                                   NA
## `SourceOPEN MINDS (registration)`                                                                        NA
## `SourceOpen Minds UFO News`                                                                              NA
## SourceOpenCanada                                                                                         NA
## `SourceOpenDNS Blog (blog)`                                                                              NA
## `SourceOpinion Internationale`                                                                           NA
## `SourceOpposing Views`                                                                                   NA
## `SourceoptionMONSTER Research`                                                                           NA
## `SourceoptionMONSTER via Yahoo! Finance`                                                                 NA
## `SourceOR-Politics.com`                                                                                  NA
## `SourceOracleUnion.com (blog)`                                                                           NA
## `SourceOrange County Register`                                                                           NA
## `SourceOregon Daily Emerald`                                                                             NA
## `SourceOregon Public Broadcasting`                                                                       NA
## SourceOregonLive.com                                                                                     NA
## `SourceOrlando Business Journal`                                                                         NA
## `SourceOrlando Business Journal (blog)`                                                                  NA
## `SourceOrlando Sentinel`                                                                                 NA
## `SourceOrlando Weekly (blog)`                                                                            NA
## `SourceOroville Mercury Register`                                                                        NA
## `SourceOS News`                                                                                          NA
## SourceOSNews                                                                                             NA
## `SourceOSU - The Lantern`                                                                                NA
## `SourceOsun Defender`                                                                                    NA
## `SourceOswego Daily News`                                                                                NA
## `SourceOtago Daily Times`                                                                                NA
## `SourceOTC Outlook`                                                                                      NA
## `SourceOttawa Citizen`                                                                                   NA
## `SourceOttawa Sun`                                                                                       NA
## `SourceOumma.com: point de vue musulman sur l'actualit\\u009d\\u009d`                                    NA
## `SourceOumma.com: point de vue musulman sur l'actualité`                                                 NA
## `SourceOUPblog (blog)`                                                                                   NA
## SourceOurQuadCities                                                                                      NA
## `SourceOut-Law`                                                                                          NA
## `SourceOut-Law.com`                                                                                      NA
## `SourceOut Magazine`                                                                                     NA
## SourceOutdoorHub                                                                                         NA
## `SourceOuter Places`                                                                                     NA
## `SourceOutlook India`                                                                                    NA
## SourceOverlawyered                                                                                       NA
## `SourceOxfam America (press release) (blog)`                                                             NA
## `SourceOxford Mail`                                                                                      NA
## `SourceOxford Student`                                                                                   NA
## `SourceOye! Times`                                                                                       NA
## SourceOZY                                                                                                NA
## `SourceOzy via Yahoo Canada News`                                                                        NA
## `SourceOzy via Yahoo! News`                                                                              NA
## `SourcePA Money News via Yahoo UK & Ireland Finance`                                                     NA
## `SourcePacific Business News (Honolulu)`                                                                 NA
## `SourcePacific Daily News`                                                                               NA
## `SourcePacific Standard`                                                                                 NA
## `SourcePage Six`                                                                                         NA
## `SourcePajhwok Afghan News (subscription) (blog)`                                                        NA
## `SourcePakistan Christian Post`                                                                          NA
## `SourcePakistan Observer`                                                                                NA
## `SourcePakistan Today`                                                                                   NA
## SourcePalatinate                                                                                         NA
## `SourcePalestine Herald Press`                                                                           NA
## `SourcePalestine News Network`                                                                           NA
## `SourcePalestine Note`                                                                                   NA
## `SourcePalladium-Item`                                                                                   NA
## SourcePallonate                                                                                          NA
## `SourcePalm Beach Daily News`                                                                            NA
## `SourcePalm Beach Post`                                                                                  NA
## `SourcePalm Beach Post (blog)`                                                                           NA
## `SourcePamplin Media Group`                                                                              NA
## `SourcePanAm Post (blog)`                                                                                NA
## SourcePanARMENIAN.Net                                                                                    NA
## SourceParade                                                                                             NA
## `SourceParent Herald`                                                                                    NA
## `SourceParkersburg News`                                                                                 NA
## `SourceParksville Qualicum Beach News`                                                                   NA
## `SourceParti Anti Sioniste`                                                                              NA
## `SourcePassport Magazine`                                                                                NA
## SourcePatch.com                                                                                          NA
## `SourcePatently Apple`                                                                                   NA
## `SourcePatheos (blog)`                                                                                   NA
## `SourcePatriot Post`                                                                                     NA
## `SourcePattaya Today`                                                                                    NA
## `SourcePayment Week`                                                                                     NA
## `SourcePayScale Career News (blog)`                                                                      NA
## SourcePayvand                                                                                            NA
## `SourcePayvand Iran News`                                                                                NA
## `SourcePBS NewsHour`                                                                                     NA
## `SourcePC-Tablet`                                                                                        NA
## `SourcePc-Tablet Media`                                                                                  NA
## `SourcePC Advisor`                                                                                       NA
## `SourcePC Authority`                                                                                     NA
## `SourcePC Gamer`                                                                                         NA
## `SourcePC Magazine`                                                                                      NA
## `SourcePC Perspectives`                                                                                  NA
## `SourcePC PowerPlay`                                                                                     NA
## `SourcePC Tech Magazine`                                                                                 NA
## `SourcePC World`                                                                                 -3.199e+03
## SourcePCGamesN                                                                                           NA
## `SourcePCMag India`                                                                                      NA
## `Sourcepcplus tabloid komputer`                                                                          NA
## `SourcePCR-online.biz`                                                                                   NA
## SourcePCWorld                                                                                            NA
## `SourcePE Hub (subscription) (blog)`                                                                     NA
## `SourcePeeblesshire News`                                                                                NA
## `SourcePeninsula Clarion`                                                                                NA
## `SourcePeninsula On-line`                                                                                NA
## `SourcePenn State News`                                                                                  NA
## `SourcePenn: Office of University Communications`                                                        NA
## SourcePennLive.com                                                                                       NA
## `SourcePensacola News Journal`                                                                           NA
## `SourcePensions & Investments`                                                                           NA
## `SourcePenticton Western News`                                                                           NA
## `SourcePeople's World`                                                                                   NA
## `SourcePEOPLE Great Ideas`                                                                               NA
## `SourcePeople Magazine`                                                                                  NA
## `SourcePEOPLE StyleWatch`                                                                                NA
## `SourcePeoria Journal Star`                                                                              NA
## `SourcePeoria Public Radio`                                                                              NA
## `SourcePerez Hilton`                                                                                     NA
## SourcePerezHilton.com                                                                                    NA
## `SourcePersonal Liberty Digest`                                                                          NA
## SourcePersonnelToday.com                                                                                 NA
## `SourcePerth Now`                                                                                        NA
## `SourcePeru this Week`                                                                                   NA
## `SourcePetaPixel (blog)`                                                                                 NA
## `SourcePeter Greenberg.com Travel News`                                                                  NA
## `SourcePeterborough Telegraph`                                                                           NA
## `SourcePetoskey News-Review`                                                                             NA
## `SourcePetra News Agency`                                                                                NA
## `SourcePew Research Center`                                                                              NA
## `SourcePew Research Center's Global Attitudes Project`                                                   NA
## `SourcePew Research Center's Internet and American Life Project`                                         NA
## `SourcePew Research Center for the People and the Press`                                                 NA
## SourcePhandroid.com                                                                                      NA
## `SourcePharmaceutical Executive (press release) (registration) (blog)`                                   NA
## SourcePharmaceuticalOnline                                                                               NA
## `SourcePhiladelphia Business Journal`                                                                    NA
## `SourcePhilippine Star`                                                                                  NA
## `SourcePhilippine Star via Yahoo! Philippines News`                                                      NA
## SourcePhilly.com                                                                                         NA
## `SourcePhilly.com (blog)`                                                                                NA
## SourcePhillyVoice.com                                                                                    NA
## `SourcePhnom Penh Post`                                                                                  NA
## `SourcePhoenix Business Journal (blog)`                                                                  NA
## `SourcePhone Arena`                                                                                      NA
## `SourcePhone Scoop`                                                                                      NA
## SourcePhoneDog                                                                                           NA
## `SourcePhones Review`                                                                                    NA
## `SourcePhoneWorld Magazine (press release) (blog)`                                                       NA
## `SourcePhotographyBLOG (blog)`                                                                           NA
## SourcePhotonics.com                                                                                      NA
## SourcePhys.Org                                                                                           NA
## `SourcePhysics Today`                                                                                    NA
## SourcePickupTrucks.com                                                                                   NA
## `SourcePine Bluff Commercial`                                                                            NA
## SourcePinkNews                                                                                           NA
## `SourcePioneers Post (press release) (registration) (blog)`                                              NA
## `SourcePirate FM`                                                                                        NA
## `SourcePitchfork Media`                                                                                  NA
## `SourcePittsburgh Business Times (blog)`                                                                 NA
## `SourcePittsburgh Post-Gazette`                                                                          NA
## `SourcePittsburgh Tribune-Review`                                                                        NA
## `SourcePJ Media`                                                                                         NA
## `SourcePJ Media (blog)`                                                                                  NA
## SourcePlanet                                                                                             NA
## SourcePlanetSave.com                                                                                     NA
## SourcePlantAutomation.com                                                                                NA
## `SourcePlastics & Rubber Weekly`                                                                         NA
## `SourcePlastics and Rubber Weekly`                                                                       NA
## `SourcePlastics News`                                                                                    NA
## SourcePlatts                                                                                             NA
## `SourcePlatts (blog)`                                                                                    NA
## `SourcePlay the Game`                                                                                    NA
## `SourcePlayStation LifeStyle`                                                                            NA
## `Sourceplus55 (blog)`                                                                                    NA
## `SourcePlymouth Herald`                                                                                  NA
## `SourcePMLiVE (blog)`                                                                                    NA
## `SourcePocket-lint.com`                                                                                  NA
## `SourcePoint of Sale News (tm) (press release) (blog)`                                                   NA
## `SourcePolicy Network`                                                                                   NA
## SourcePolitickerNJ                                                                                       NA
## SourcePolitico                                                                                           NA
## `SourcePolitico (blog)`                                                                                  NA
## `SourcePOLITICO Magazine`                                                                                NA
## SourcePOLITICO.eu                                                                                        NA
## SourcePoliticsHome.com                                                                                   NA
## SourcePoliticsweb                                                                                        NA
## SourcePoliticusUSA                                                                                       NA
## SourcePolitiFact                                                                                         NA
## SourcePolygon                                                                                            NA
## `SourcePolygon via Yahoo! News`                                                                          NA
## `SourcePOP Herald`                                                                                       NA
## SourcePOPSUGAR                                                                                           NA
## `SourcePopular Mechanics`                                                                                NA
## `SourcePopular Science`                                                                                  NA
## SourcePopzara                                                                                            NA
## `SourcePort Huron Times Herald`                                                                          NA
## `SourcePorterville Recorder`                                                                             NA
## `SourcePortland Business Journal (blog)`                                                                 NA
## `SourcePortland Tribune`                                                                                 NA
## `SourcePortsmouth News`                                                                                  NA
## `SourcePost-Bulletin`                                                                                    NA
## `SourcePost-Tribune`                                                                                     NA
## `SourcePost and Parcel`                                                                                  NA
## `SourcePost Online`                                                                                      NA
## `SourcePost Online (blog)`                                                                               NA
## `SourcePoughkeepsie Journal`                                                                             NA
## `SourcePowder Magazine`                                                                                  NA
## `SourcePower Line (blog)`                                                                                NA
## SourcePoynter.org                                                                                        NA
## `SourcePPcorn (blog)`                                                                                    NA
## SourcePplware                                                                                            NA
## `SourcePR Newswire`                                                                                      NA
## `SourcePR Newswire (press release)`                                                                      NA
## `SourcePR Newswire UK (press release)`                                                                   NA
## `SourcePR Newswire via Yahoo! Finance`                                                            5.149e+01
## `SourcePR Web (press release)`                                                                           NA
## `SourcePrague Daily Monitor`                                                                             NA
## `SourcePrague Post`                                                                                      NA
## SourcePrameyaNews7                                                                                       NA
## SourcePravda                                                                                             NA
## SourcePremier                                                                                            NA
## `SourcePremium Times`                                                                                    NA
## `SourcePrensa Latina`                                                                                    NA
## `SourcePress-Enterprise`                                                                                 NA
## `SourcePress & Sun-Bulletin`                                                                             NA
## `SourcePress & Sun-Bulletin (blog)`                                                                      NA
## `SourcePress and Journal`                                                                                NA
## `SourcePress Association via Yahoo UK & Ireland News`                                                    NA
## `SourcePress Herald`                                                                                     NA
## `SourcePress Insider Daily`                                                                              NA
## `SourcePress of Atlantic City`                                                                           NA
## `SourcePress Release Rocket`                                                                             NA
## `SourcePress Release Service (press release)`                                                            NA
## `SourcePress Telegraph (blog)`                                                                           NA
## `SourcePress Trust of India`                                                                             NA
## `SourcePress TV`                                                                                         NA
## `SourcePressChronicle.com (blog)`                                                                        NA
## `SourcePressenza International Press Agency`                                                             NA
## SourcePRI                                                                                                NA
## `SourcePrime Minister of Canada (press release)`                                                         NA
## `SourcePrince Albert Daily Herald`                                                                       NA
## `SourcePrince George Citizen`                                                                            NA
## `SourcePrinted Electronics World`                                                                        NA
## `SourcePrivate Eye`                                                                                      NA
## SourcePRNewser                                                                                           NA
## `SourceProactive Investors UK`                                                                           NA
## `SourceProduct Reviews`                                                                                  NA
## `SourceProfit Confidential`                                                                              NA
## SourceProgrammableWeb                                                                                    NA
## `SourceProgress Illinois`                                                                                NA
## `SourceProgress.org (blog)`                                                                              NA
## `SourceProject Syndicate`                                                                                NA
## `SourceProlific North`                                                                                   NA
## `SourceProperty Guru via Yahoo! Singapore News`                                                          NA
## `SourceProperty Magazine International`                                                                  NA
## SourcePropertyCasualty360                                                                                NA
## SourceProPublica                                                                                         NA
## `SourceProspect (blog)`                                                                                  NA
## `SourceProthom Alo (English)`                                                                            NA
## `SourceProvidence Business News`                                                                         NA
## SourcePRWeb                                                                                       2.303e-01
## SourcePRWeek                                                                                             NA
## `SourcePSFK (blog)`                                                                                      NA
## `SourcePSX Extreme`                                                                                      NA
## `SourcePublic Finance`                                                                                   NA
## `SourcePublic Finance International`                                                                     NA
## `SourcePublic Knowledge Tech News and Comment (blog)`                                                    NA
## `SourcePublishers Weekly (blog)`                                                                         NA
## `SourcePueblo Chieftain`                                                                                 NA
## `SourcePuget Sound Business Journal (Seattle)`                                                           NA
## `SourcePuget Sound Business Journal (Seattle) (blog)`                                                    NA
## `SourcePulitzer Center on Crisis Reporting`                                                              NA
## Sourcepulse                                                                                              NA
## `SourcePulse Headlines`                                                                                  NA
## `SourcePulse Nigeria`                                                                                    NA
## SourcePulse.com.gh                                                                                       NA
## `SourcePulse+IT`                                                                                         NA
## `SourcePurdue Agricultural Communications`                                                               NA
## `SourcePush Square`                                                                                      NA
## `SourcePV-Tech`                                                                                          NA
## `Sourcepv magazine`                                                                                      NA
## SourcePYMNTS.com                                                                                         NA
## `SourceQ13 FOX`                                                                                          NA
## `SourceQ13 FOX Seattle`                                                                                  NA
## SourceQantara.de                                                                                         NA
## `SourceQuad-Cities Online`                                                                               NA
## `SourceQuad City Times`                                                                                  NA
## SourceQuartz                                                                                             NA
## `SourceQuartz via Yahoo UK & Ireland Finance`                                                            NA
## `SourceQuartz via Yahoo! Finance`                                                                        NA
## `SourceQueen's Journal`                                                                                  NA
## `SourceQueensland Country Life`                                                                          NA
## `SourceQueensland Times`                                                                                 NA
## SourceQueerty                                                                                            NA
## `SourceQuincy Herald-Whig`                                                                               NA
## `SourceR & D Magazine`                                                                                   NA
## Sourcerabble.ca                                                                                          NA
## `Sourcerabble.ca (blog)`                                                                                 NA
## `SourceRacked NY`                                                                                        NA
## SourceRadarOnline                                                                                        NA
## `SourceRadio Cadena Agramonte`                                                                           NA
## `SourceRadio Canada International`                                                                       NA
## `SourceRadio Free Asia`                                                                                  NA
## `SourceRadio Iowa`                                                                                       NA
## `SourceRadio New Zealand`                                                                                NA
## `SourceRadio Pakistan (press release)`                                                                   NA
## `SourceRadio Prague`                                                                                     NA
## `SourceRadio Tamazuj`                                                                                    NA
## `SourceRadio Times`                                                                                      NA
## `SourceRadio.com Music and Entertainment News`                                                           NA
## `SourceRadioFreeEurope/RadioLiberty`                                                                     NA
## SourceRadioVop                                                                                           NA
## `SourceRand Daily Mail`                                                                                  NA
## `SourceRandolph County Herald Tribune`                                                                   NA
## SourceRapaport                                                                                           NA
## `SourceRapid City Journal`                                                                               NA
## `SourceRapid tv news`                                                                                    NA
## SourceRappler                                                                                            NA
## SourceRappler.com                                                                                        NA
## `SourceRasmussen Reports`                                                                                NA
## `SourceRaw Story`                                                                                        NA
## `SourceRCR Wireless News`                                                                                NA
## `SourceRe/code`                                                                                          NA
## `SourceReading Eagle`                                                                                    NA
## SourceReadWrite                                                                                          NA
## SourceReadWriteWeb                                                                                       NA
## SourceRealClearMarkets                                                                                   NA
## SourceRealClearPolitics                                                                                  NA
## SourceRéalités                                                                                           NA
## `SourceRealtor.com News`                                                                                 NA
## `SourceRealty Today`                                                                                     NA
## `SourceRealWire (press release)`                                                                         NA
## SourceReason                                                                                             NA
## `SourceReason (blog)`                                                                                    NA
## `SourceReboot Illinois`                                                                                  NA
## SourceRecode                                                                                             NA
## SourceRecombu                                                                                            NA
## `SourceRecorder Press (blog)`                                                                            NA
## `SourceRecorderpost.com (satire) (registration) (blog)`                                                  NA
## `SourceRecycling International`                                                                          NA
## `SourceRecycling Today`                                                                                  NA
## `SourceRed Alert Politics`                                                                               NA
## `SourceRed and Black`                                                                                    NA
## `SourceRed Deer Advocate`                                                                                NA
## `SourceRed Flag`                                                                                         NA
## `SourceRedding Record Searchlight`                                                                       NA
## `SourceRedheaded Blackbelt`                                                                              NA
## Sourcerediff.com                                                                                         NA
## `SourceRedmond Channel Partner`                                                                          NA
## `SourceRedmond Channel Partner (blog)`                                                                   NA
## `SourceRedmond Reporter`                                                                                 NA
## SourceRedmondmag.com                                                                                     NA
## `SourceRedmondmag.com (blog)`                                                                            NA
## `SourceRedress Information & Analysis`                                                                   NA
## `SourceRedwood Falls Gazette`                                                                            NA
## SourceRefinery29                                                                                         NA
## `SourceRegina Leader-Post`                                                                               NA
## `SourceReligion News Service`                                                                            NA
## `SourceRenewable Energy Focus`                                                                           NA
## SourceRenewAmerica                                                                                       NA
## SourceRenewEconomy                                                                                       NA
## SourcereNews                                                                                             NA
## `SourceReno Gazette-Journal`                                                                             NA
## `SourceReno Gazette Journal`                                                                             NA
## `SourceReporters without borders (press release)`                                                        NA
## SourceRepublica                                                                                          NA
## `SourceReseller News`                                                                                    NA
## `SourceResource Investor`                                                                                NA
## SourceReuters                                                                                            NA
## `SourceReuters - UK Focus via Yahoo UK & Ireland Finance`                                                NA
## `SourceReuters Africa`                                                                                   NA
## `SourceReuters Blogs (blog)`                                                                             NA
## `SourceReuters Canada`                                                                                   NA
## `SourceReuters India`                                                                                    NA
## `SourceReuters Middle East via Yahoo Maktoob News`                                                       NA
## `SourceReuters UK`                                                                                       NA
## `SourceReuters via Yahoo Canada Finance`                                                                 NA
## `SourceReuters via Yahoo Canada News`                                                                    NA
## `SourceReuters via Yahoo Maktoob News`                                                                   NA
## `SourceReuters via Yahoo UK & Ireland Finance`                                                           NA
## `SourceReuters via Yahoo UK & Ireland News`                                                              NA
## `SourceReuters via Yahoo UK & Ireland Sport`                                                             NA
## `SourceReuters via Yahoo! Finance`                                                                1.233e+00
## `SourceReuters via Yahoo! Finance India`                                                                 NA
## `SourceReuters via Yahoo! India News`                                                                    NA
## `SourceReuters via Yahoo! New Zealand News`                                                              NA
## `SourceReuters via Yahoo! News`                                                                          NA
## `SourceReuters via Yahoo! Philippines News`                                                              NA
## `SourceReuters via Yahoo! Philippines Sports`                                                            NA
## `SourceReuters via Yahoo! Singapore News`                                                                NA
## `SourceReuters via Yahoo! Singapore Sports`                                                              NA
## `SourceReuters via Yahoo! Sports`                                                                        NA
## `SourceReuters via Yahoo!7 Finance`                                                                      NA
## `SourceReuters via Yahoo!7 News`                                                                         NA
## `SourceReykjav\\u009d\\u009dk Grapevine`                                                                 NA
## SourceRFI                                                                                                NA
## `SourceRhode Island Public Radio`                                                                        NA
## `SourceRI Future`                                                                                        NA
## `SourceRichmond County Daily Journal`                                                                    NA
## `SourceRichmond Times-Dispatch`                                                                          NA
## SourceRichmond.com                                                                                       NA
## `SourceRick Kupchella's BringMeTheNews`                                                                  NA
## `SourceRight Side News`                                                                                  NA
## `SourceRight Wing Watch`                                                                                 NA
## SourceRigzone                                                                                            NA
## `SourceRing of Fire`                                                                                     NA
## `SourceRisers & Fallers`                                                                                 NA
## `SourceRising Kashmir (press release) (registration) (blog)`                                             NA
## `SourceRising Kashmir Daily English Newspaper`                                                           NA
## `SourceRIT University News Services`                                                                     NA
## `SourceRiverfront Times (blog)`                                                                          NA
## SourceRiversideGazette.com                                                                               NA
## `SourceRoad to Paris`                                                                                    NA
## `SourceRoad to VR`                                                                                       NA
## `SourceRoad Warrior Voices`                                                                              NA
## SourceRoadandTrack.com                                                                                   NA
## `SourceRoads and Kingdoms`                                                                               NA
## `SourceRoanoke Times`                                                                                    NA
## SourceRobdailynews                                                                                       NA
## SourceRobohub                                                                                            NA
## `SourceRochdale Online`                                                                                  NA
## `SourceRochester Democrat and Chronicle`                                                                 NA
## `SourceRochester Democrat and Chronicle (blog)`                                                          NA
## SourceRocketNews24                                                                                       NA
## `SourceRockford Register Star`                                                                           NA
## `SourceRockhampton Morning Bulletin`                                                                     NA
## `SourceRoll Call`                                                                                        NA
## `SourceRoll Call (blog)`                                                                                 NA
## `SourceRoll Call (registration)`                                                                         NA
## `SourceRoll Call (registration) (blog)`                                                                  NA
## SourceRollingStone.com                                                                                   NA
## `SourceRomania-Insider.com`                                                                              NA
## `SourceRomford Recorder`                                                                                 NA
## SourceRomper                                                                                             NA
## `SourceRoute Fifty`                                                                                      NA
## `SourceRoyal Gazette`                                                                                    NA
## `SourceRoyal Society of Chemistry`                                                                       NA
## SourceRT                                                                                                 NA
## SourceRTBF                                                                                               NA
## `SourceRTE News`                                                                                         NA
## `SourceRTÉ News`                                                                                         NA
## SourceRTE.ie                                                                                             NA
## `SourceRTT News`                                                                                  9.597e+00
## `SourceRTV Slovenija`                                                                                    NA
## `SourceRU Daily Targum`                                                                                  NA
## SourceRudaw                                                                                              NA
## `SourceRuidoso News`                                                                                     NA
## `SourceRunway Girl Network`                                                                              NA
## SourceRushLimbaugh.com                                                                                   NA
## `SourceRussia and India Report`                                                                          NA
## `SourceRussia Beyond the Headlines`                                                                      NA
## `SourceRussia Direct`                                                                                    NA
## `SourceRussian Information Agency Novosti`                                                               NA
## `SourceRutland Herald`                                                                                   NA
## SourceRwanda                                                                                             NA
## `SourceRwanda News Agency (registration)`                                                                NA
## `SourceSabah Daily Express`                                                                              NA
## `SourceSac City Express`                                                                                 NA
## `SourceSacramento Bee`                                                                                   NA
## `SourceSacramento Bee (blog)`                                                                            NA
## `SourceSacramento Business Journal`                                                                      NA
## `SourceSahara Reporters`                                                                                 NA
## SourceSaharaReporters.com                                                                                NA
## `SourceSalem-News.Com`                                                                                   NA
## `SourceSalem State Log`                                                                                  NA
## SourceSalemNews.net                                                                                      NA
## SourceSalina.com                                                                                         NA
## `SourceSalisbury Journal`                                                                                NA
## SourceSalon                                                                                              NA
## SourceSalon.com                                                                                          NA
## `SourceSalt Lake Tribune`                                                                                NA
## `SourceSAMAA TV (press release) (registration) (blog)`                                                   NA
## `SourceSan Angelo LIVE!`                                                                                 NA
## `SourceSan Angelo Standard Times`                                                                        NA
## `SourceSan Antonio Business Journal`                                                                     NA
## `SourceSan Antonio Express-News`                                                                         NA
## `SourceSan Antonio Express-News (subscription)`                                                          NA
## `SourceSan Bernardino County Sun`                                                                        NA
## `SourceSan Bernardino Sun`                                                                               NA
## `SourceSan Diego Free Press`                                                                             NA
## `SourceSan Diego Jewish World`                                                                           NA
## `SourceSan Francisco Bay View`                                                                           NA
## `SourceSan Francisco Business Times (blog)`                                                              NA
## `SourceSan Francisco Chronicle`                                                                          NA
## `SourceSan Francisco Examiner`                                                                           NA
## `SourceSan Francisco Sun Times`                                                                          NA
## `SourceSan Jose Mercury News`                                                                            NA
## `SourceSan Jose Mercury News media center`                                                               NA
## `SourceSan Mateo Daily Journal`                                                                          NA
## `SourceSandton Chronicle`                                                                                NA
## `SourceSanta Barbara Independent`                                                                        NA
## `SourceSanta Clarita Valley Signal`                                                                      NA
## `SourceSanta Cruz Sentinel`                                                                              NA
## `SourceSanta Fe New Mexican`                                                                             NA
## `SourceSanta Fe New Mexican (blog)`                                                                      NA
## `SourceSanta Fe Reporter`                                                                                NA
## `SourceSanta Maria Times (subscription)`                                                                 NA
## `SourceSanta Rosa Press Democrat`                                                                        NA
## SourceSaphirNews.com                                                                                     NA
## `SourceSarasota Herald-Tribune`                                                                          NA
## `SourceSarnia Observer`                                                                                  NA
## `SourceSaskatoon StarPhoenix`                                                                            NA
## SourceSaskatoonhomepage.ca                                                                               NA
## `SourceSaudi Gazette`                                                                                    NA
## `SourceSaudi Gazette via Yahoo Maktoob News`                                                             NA
## `SourceSauk Prairie Eagle`                                                                               NA
## `SourceSault Star`                                                                                       NA
## `SourceSault Ste. Marie Evening News`                                                                    NA
## `SourceSavannah Morning News`                                                                            NA
## `SourceSB Nation`                                                                                        NA
## SourceSBS                                                                                                NA
## `SourceSBS - The World Game`                                                                             NA
## `SourceSC Magazine`                                                                                      NA
## `SourceSC Magazine UK`                                                                                   NA
## `SourceScarborough Today`                                                                                NA
## `SourceSci-Tech Today`                                                                                   NA
## SourceSciDev.Net                                                                                         NA
## `SourceScience /AAAS`                                                                                    NA
## `SourceScience 2.0`                                                                                      NA
## `SourceScience Daily`                                                                                    NA
## `SourceScience Magazine`                                                                                 NA
## `SourceScience Recorder`                                                                                 NA
## `SourceScience Times`                                                                                    NA
## `SourceScience World Report`                                                                             NA
## SourceScienceAlert                                                                                       NA
## `SourceScienceBlog.com (blog)`                                                                           NA
## `SourceScientific American`                                                                              NA
## `SourceScientific American (blog)`                                                                       NA
## SourceSCNow                                                                                              NA
## SourceScoop.co.nz                                                                                        NA
## `SourceScoop.co.nz (press release)`                                                                      NA
## SourceScoopWhoop                                                                                         NA
## `SourceScotland on Sunday`                                                                               NA
## SourceScotsman                                                                                           NA
## `SourceScotsman (blog)`                                                                                  NA
## `SourceScottish Daily Record`                                                                            NA
## `SourceScottish Housing News`                                                                            NA
## `SourceScottsbluff Star Herald`                                                                          NA
## `SourceSCOTUSblog (blog)`                                                                                NA
## `SourceScranton Times-Tribune`                                                                           NA
## `SourceScreen International`                                                                             NA
## SourceScroll.in                                                                                          NA
## `SourceSDE Entertainment News`                                                                           NA
## `SourceSDPB Radio`                                                                                       NA
## `SourceSDSU Newscenter`                                                                                  NA
## SourceSDTimes.com                                                                                        NA
## SourceSeacoastonline.com                                                                                 NA
## `SourceSearch Engine Journal`                                                                            NA
## `SourceSearch Engine Land`                                                                               NA
## `SourceSeattle Globalist`                                                                                NA
## `SourceSeattle Sun Times`                                                                                NA
## `SourceSeattle Times`                                                                             5.146e-01
## Sourceseattlepi.com                                                                                      NA
## `Sourceseattlepi.com (blog)`                                                                             NA
## SourceSECcountry.com                                                                                     NA
## `SourceSecrecy News (blog)`                                                                              NA
## `SourceSecurity Intelligence (blog)`                                                                     NA
## `SourceSee It Market (blog)`                                                                             NA
## SourceSeeker                                                                                             NA
## `SourceSeeker (registration) (blog)`                                                                     NA
## `SourceSeeking Alpha`                                                                             7.078e-01
## `SourceSeeNews (subscription)`                                                                           NA
## `SourceSeeNews Renewables`                                                                               NA
## SourceSegmentNext                                                                                        NA
## SourceSelectButton                                                                                       NA
## `SourceSentinel & Enterprise`                                                                            NA
## `SourceServer Watch`                                                                                     NA
## `SourceSETHLUI.com via Yahoo! Singapore News`                                                            NA
## `SourceSevier News Messenger`                                                                            NA
## `SourceSeychelles News Agency`                                                                           NA
## `SourceSeymour Tribune`                                                                                  NA
## `SourceSF Weekly (blog)`                                                                                 NA
## SourceSFGate                                                                                             NA
## `SourceSFGate (blog)`                                                                                    NA
## SourceSFist                                                                                              NA
## SourceShacknews                                                                                          NA
## `SourceShanghai Daily (subscription)`                                                                    NA
## Sourceshanghaidaily                                                                                      NA
## SourceShanghaiist                                                                                        NA
## `Sourceshare market updates (press release)`                                                             NA
## `SourceShareCafe (registration)`                                                                         NA
## SourceShareCast                                                                                          NA
## `SourceSharecast via Yahoo UK & Ireland Finance`                                                         NA
## SourceShareChat                                                                                          NA
## SourceSharekhan                                                                                          NA
## SourceSheKnows.com                                                                                       NA
## `SourceSherwood Park News`                                                                               NA
## `SourceShields Gazette`                                                                                  NA
## `SourceShillong Times`                                                                                   NA
## `SourceShiny Shiny`                                                                                      NA
## `SourceShreveport Times`                                                                                 NA
## SourceSHRM                                                                                               NA
## `SourceShropshire Star`                                                                                  NA
## Sourceshropshirestar.com                                                                                 NA
## `SourceSHU Spectrum`                                                                                     NA
## `SourceSierra Leone Telegraph`                                                                           NA
## `SourceSify News`                                                                                        NA
## `SourceSilicon Valley Business Journal`                                                                  NA
## `SourceSilicon Valley Business Journal (blog)`                                                           NA
## SourceSiliconANGLE                                                                                4.504e+15
## `SourceSiliconANGLE (blog)`                                                                              NA
## SourceSiliconBeat                                                                                        NA
## SourceSiliconera                                                                                         NA
## SourceSiliconIndia                                                                                       NA
## SourceSiliconindia.com                                                                                   NA
## SourceSiliconrepublic.com                                                                                NA
## SourceSILive.com                                                                                         NA
## `SourceSilver City Sun-News`                                                                             NA
## SourceSimcoe.com                                                                                         NA
## `SourceSin Chew Jit Poh`                                                                                 NA
## `SourceSingapore Business Review`                                                                        NA
## `SourceSingapore Business Review via Yahoo! Finance`                                                     NA
## `SourceSingapore Government Online (press release)`                                                      NA
## `SourceSioux City Journal`                                                                               NA
## `SourceSioux Falls Argus Leader`                                                                         NA
## `SourceSiouxland Matters`                                                                                NA
## `SourceSiskiyou Daily News`                                                                              NA
## `SourceSITE Intelligence Group (subscription)`                                                           NA
## SourceSitePoint                                                                                          NA
## SourceSkift                                                                                              NA
## `SourceSky News`                                                                                         NA
## `SourceSky News Australia`                                                                               NA
## `SourceSky News via Yahoo Canada News`                                                                   NA
## `SourceSky News via Yahoo UK & Ireland Finance`                                                          NA
## `SourceSky News via Yahoo UK & Ireland News`                                                             NA
## SourceSkySports                                                                                          NA
## `SourceSLAM Online`                                                                                      NA
## SourceSlashdot                                                                                           NA
## SourceSlashGear                                                                                   1.124e+00
## `SourceSlate Magazine`                                                                                   NA
## `SourceSlate Magazine (blog)`                                                                            NA
## SourceSlate.fr                                                                                           NA
## `SourceSleepy Eye Herald Dispatch`                                                                       NA
## `SourceSlipped Disc`                                                                                     NA
## `SourceSlugger O'Toole`                                                                                  NA
## `SourceSmall Business Computing`                                                                         NA
## `SourceSmall Business Times`                                                                             NA
## `SourceSmall Business Trends`                                                                            NA
## SourceSmallBusiness.co.uk                                                                                NA
## `Sourcesmallwarsjournal (blog)`                                                                          NA
## SourceSmartCompany.com.au                                                                                NA
## `SourceSmarter Analyst`                                                                                  NA
## `SourceSME Insider`                                                                                      NA
## SourceSmithsonian                                                                                        NA
## `SourceSNAPPA Celebrity via Yahoo UK & Ireland News`                                                     NA
## `SourceSNAPPA Technology via Yahoo UK & Ireland News`                                                    NA
## Sourcesnopes.com                                                                                         NA
## `SourceSocial Europe`                                                                                    NA
## `SourceSocialist Alternative`                                                                            NA
## `SourceSocialist Project`                                                                                NA
## `SourceSocialist Worker`                                                                                 NA
## `SourceSocialist Worker Online`                                                                          NA
## SourceSocialTimes                                                                                        NA
## `SourceSoftonic EN (blog)`                                                                               NA
## `SourceSoftpedia News`                                                                                   NA
## `SourceSoftpedia News (blog)`                                                                            NA
## SourceSOHH                                                                                               NA
## SourceSojourners                                                                                         NA
## `SourceSolomon Star`                                                                                     NA
## `SourceSonoma State Star`                                                                                NA
## `SourceSonoran Weekly Review`                                                                            NA
## SourceSooToday.com                                                                                       NA
## `SourceSOS Children`                                                                                     NA
## `SourceSounder At Heart`                                                                                 NA
## SourceSoundersFC.com                                                                                     NA
## Sourcesourcingfocus.com                                                                                  NA
## `SourceSouth Africa.info`                                                                                NA
## `SourceSouth African Broadcasting Corporation`                                                           NA
## `SourceSouth Bend Tribune`                                                                               NA
## `SourceSouth Carolina SC (press release) (blog)`                                                         NA
## `SourceSouth China Morning Post`                                                                         NA
## `SourceSouth China Morning Post (registration)`                                                          NA
## `SourceSouth China Morning Post (subscription)`                                                          NA
## `SourceSouth Florida Business Journal`                                                                   NA
## `SourceSouth Leeds Life`                                                                                 NA
## `SourceSouth Wales Argus`                                                                                NA
## `SourceSouth Wales Evening Post`                                                                         NA
## SourceSouthCoastToday.com                                                                                NA
## `SourceSoutheast Asia GLOBE`                                                                             NA
## `SourceSoutheast Missourian`                                                                             NA
## `SourceSoutheast Texas Record`                                                                           NA
## `SourceSouthern Political Report`                                                                        NA
## SourceSouthernminn.com                                                                                   NA
## SourceSouthtownStar                                                                                      NA
## `SourceSouthwest Times`                                                                                  NA
## `SourceSowetan Live (press release) (registration) (blog)`                                               NA
## `SourceSpace Daily`                                                                                      NA
## `SourceSpace War`                                                                                        NA
## SourceSpace.com                                                                                          NA
## SourceSpaceDaily                                                                                         NA
## SourceSpaceNews                                                                                          NA
## SourceSpaceRef                                                                                           NA
## `SourceSpalding Guardian`                                                                                NA
## `SourceSPAMfighter News (press release)`                                                                 NA
## `SourceSpartanburg Herald-Journal`                                                                       NA
## SourceSpectator.co.uk                                                                                    NA
## `SourceSpectator.co.uk (blog)`                                                                           NA
## `SourceSpend Matters`                                                                                    NA
## SourceSpiked                                                                                             NA
## SourceSpin                                                                                               NA
## `SourceSplice Today`                                                                                     NA
## SourceSport24                                                                                            NA
## `SourceSporting Life`                                                                                    NA
## `SourceSporting News`                                                                                    NA
## `SourceSporting News via Yahoo UK & Ireland Sport`                                                       NA
## `SourceSporting News via Yahoo! Sports`                                                                  NA
## SourceSportingNews                                                                                       NA
## SourceSportingNews.com                                                                                   NA
## `SourceSports Illustrated`                                                                               NA
## `SourceSportsBusiness Daily (subscription)`                                                              NA
## SourceSportsGrid                                                                                         NA
## SourceSportskeeda                                                                                        NA
## `SourceSportskeeda via Yahoo! India News`                                                                NA
## SourceSportsnet.ca                                                                                       NA
## SourceSportTechie                                                                                        NA
## `SourceSpringfield News-Leader`                                                                          NA
## `SourceSputnik France`                                                                                   NA
## `SourceSputnik International`                                                                            NA
## `SourceSputnik UK`                                                                                       NA
## `SourceSputnik US`                                                                                       NA
## `SourceSQL Server Pro (blog)`                                                                            NA
## `SourceSri Lanka Guardian`                                                                               NA
## `SourceSt, Thomas Source`                                                                                NA
## `SourceSt. Albert Gazette`                                                                               NA
## `SourceSt. Augustine Record`                                                                             NA
## `SourceSt. Catharines Standard`                                                                          NA
## `SourceSt. Cloud Times`                                                                                  NA
## `SourceSt. George Daily Spectrum`                                                                        NA
## `SourceSt. Joseph News-Press`                                                                            NA
## `SourceSt. Louis Business Journal`                                                                       NA
## `SourceSt. Louis Business Journal (blog)`                                                                NA
## `SourceSt. Louis Jewish Light`                                                                           NA
## `SourceSt. Lucia News Online`                                                                            NA
## `SourceSt. Lucia Times Online News (press release)`                                                      NA
## `SourceSt. Petersburg Times Blogs`                                                                       NA
## `SourceSt. Thomas Times-Journal`                                                                         NA
## `SourceSTA - Slovenska Tiskovna Agencija (subscription)`                                                 NA
## `SourceStabroek News`                                                                                    NA
## `SourceStaff Newsletter`                                                                                 NA
## `SourceStaffing Industry Analysts`                                                                       NA
## `SourceStamford Advocate`                                                                                NA
## `SourceStanford Social Innovation Review (subscription)`                                                 NA
## `SourceStanford University News`                                                                         NA
## `SourceStanly News & Press`                                                                              NA
## SourceStar2.com                                                                                          NA
## SourceStarAfrica.com                                                                                     NA
## SourceStarpulse.com                                                                                      NA
## `SourceStarr 103.5 FM`                                                                                   NA
## `SourceStars and Stripes`                                                                                NA
## SourceStartups.co.uk                                                                                     NA
## SourceStartupSmart                                                                                       NA
## SourceSTAT                                                                                               NA
## `SourceState-Journal.com`                                                                                NA
## `SourceState Journal`                                                                                    NA
## `SourceState of the State KS (subscription)`                                                             NA
## `SourceStateImpact Oklahoma`                                                                             NA
## `SourceStatesman Journal`                                                                                NA
## `SourceSteelers Lounge (blog)`                                                                           NA
## SourceStepFeed                                                                                           NA
## SourceStevenspointjournal                                                                                NA
## SourceStevivor                                                                                           NA
## `SourceStillwater News Press`                                                                            NA
## `Sourcestiripesurse.ro (Comunicat de Pres\\u009d\\u009d)`                                                NA
## Sourcestjoechannel.com                                                                                   NA
## SourceSTLtoday.com                                                                                       NA
## `SourceStock & Land`                                                                                     NA
## `SourceStock Transcript`                                                                                 NA
## `SourceStock World`                                                                                      NA
## SourceStockhouse                                                                                         NA
## `SourceStockton Record (blog)`                                                                           NA
## SourceStorypick                                                                                          NA
## SourceStraight.com                                                                                       NA
## `SourceStraight.com (blog)`                                                                              NA
## `SourceStrategy Page`                                                                                    NA
## `Sourcestrategy+business (registration) (blog)`                                                          NA
## SourceSTRATFOR                                                                                           NA
## SourceStreamingMedia.com                                                                                 NA
## `SourceStreet Updates`                                                                                   NA
## `SourceStreetAuthority Network via Yahoo! Finance`                                                       NA
## SourceStreetInsider.com                                                                                  NA
## `SourceStreetInsider.com (blog)`                                                                         NA
## `SourceStreetsblog New York (blog)`                                                                      NA
## `SourceStreetWise Report`                                                                                NA
## `SourceStreetWise Report (press release)`                                                                NA
## SourceStuff                                                                                       1.411e+00
## SourceStuff.co.nz                                                                                        NA
## `SourceSturgis Journal`                                                                                  NA
## `SourceSTV News`                                                                                         NA
## Sourcestv.tv                                                                                             NA
## `SourceStyle News - StyleWatch - People.com`                                                             NA
## `SourceSud Ouest`                                                                                        NA
## `SourceSudan Tribune`                                                                                    NA
## SourceSudbury.com                                                                                        NA
## `SourceSun-Sentinel`                                                                                     NA
## `SourceSun Sentinel`                                                                                     NA
## `SourceSun Times National`                                                                               NA
## SourceSun.Star                                                                                           NA
## `SourceSunbury Daily Item`                                                                               NA
## `SourceSunday Business Post`                                                                             NA
## `SourceSunday Leader`                                                                                    NA
## `SourceSunday Observer`                                                                                  NA
## `SourceSunday World`                                                                                     NA
## `SourceSunderland Echo`                                                                                  NA
## SourceSunLive                                                                                            NA
## `SourceSunshine State News`                                                                              NA
## `SourceSupermarket News`                                                                                 NA
## `SourceSuperSite for Windows`                                                                            NA
## `SourceSupply Chain Management Review`                                                                   NA
## SourceSurferToday                                                                                        NA
## `SourceSustainable Brands`                                                                               NA
## `SourceSutherland Northern Times`                                                                        NA
## SourceSwampland                                                                                          NA
## SourceSwarajya                                                                                           NA
## `SourceSwarthmore College The Phoenix Online`                                                            NA
## Sourceswissinfo.ch                                                                                       NA
## `SourceSwitzer Financial News`                                                                           NA
## `SourceSydney Morning Herald`                                                                            NA
## `SourceSyracuse University News`                                                                         NA
## SourceSyracuse.com                                                                                       NA
## `SourceSyria Deeply`                                                                                     NA
## `Sourcet-online.de`                                                                                      NA
## `SourceT.H.E. Journal`                                                                                   NA
## SourceT3                                                                                                 NA
## `SourceTablet Magazine`                                                                                  NA
## `SourceTablet PC Review`                                                                                 NA
## `SourceTaipei Times`                                                                                     NA
## `SourceTaiwan Today`                                                                                     NA
## SourceTakePart                                                                                           NA
## `SourceTakePart.com via Yahoo! News`                                                                     NA
## `SourceTalkin' Cloud`                                                                                    NA
## SourceTallahassee.com                                                                                    NA
## SourceTameBay                                                                                            NA
## `SourceTampa Bay Business Journal`                                                                       NA
## `SourceTampa Bay Review`                                                                                 NA
## `SourceTampa Bay Times`                                                                                  NA
## SourceTampabay.com                                                                                       NA
## `SourceTampabay.com (blog)`                                                                              NA
## `SourceTaranaki Daily News`                                                                              NA
## `SourceTasmania Examiner`                                                                                NA
## `SourceTasnim News Agency (press release)`                                                               NA
## SourceTASS                                                                                               NA
## `SourceTax-News.com`                                                                                     NA
## SourceTBO.com                                                                                            NA
## SourceTCC                                                                                                NA
## SourceTCPalm                                                                                             NA
## SourceTDM.com                                                                                            NA
## `SourceTeague Chronicle`                                                                                 NA
## `SourceTech Cocktail`                                                                                    NA
## `SourceTech in Asia`                                                                                     NA
## `SourceTech Insider`                                                                                     NA
## `SourceTech Insider (blog)`                                                                              NA
## `SourceTech Insider via Yahoo UK & Ireland News`                                                         NA
## `SourceTech Media Network (Laptop) via Yahoo! News`                                                      NA
## `SourceTech Media Network (Tom&#39;s Guide) via Yahoo! News`                                             NA
## `SourceTech News Today`                                                                                  NA
## `SourceTech Page One`                                                                                    NA
## `SourceTech Pinas`                                                                                       NA
## `SourceTech Pro Research via Yahoo! News`                                                                NA
## `SourceTech Times`                                                                                       NA
## SourceTech.Co                                                                                            NA
## SourceTech2                                                                                              NA
## SourceTechCentral                                                                                        NA
## SourceTechcrunch                                                                                         NA
## SourceTechCrunch                                                                                  4.215e-01
## SourceTechdirt                                                                                           NA
## SourceTechEye                                                                                            NA
## SourceTechFrag                                                                                           NA
## SourceTechGadgetCentral                                                                                  NA
## SourceTechHive                                                                                           NA
## `SourceTechJuice (press release) (blog)`                                                                 NA
## SourceTechland                                                                                           NA
## SourceTechly                                                                                             NA
## `SourceTechnabob (blog)`                                                                                 NA
## SourceTechNewsWorld                                                                                      NA
## SourceTechNewsWorld.com                                                                                  NA
## SourceTechnical.ly                                                                                       NA
## `SourceTechnical.ly Brooklyn`                                                                            NA
## `SourceTechnical.ly Philly`                                                                              NA
## SourceTechnoBuffalo                                                                                      NA
## `SourceTechnology Personalized`                                                                          NA
## `SourceTechnology Review`                                                                                NA
## `SourceTechnology Zimbabwe`                                                                              NA
## `SourceTechpoint.ng (blog)`                                                                              NA
## SourceTechRadar                                                                                  -3.812e-01
## `SourceTechradar India`                                                                                  NA
## SourceTechRepublic                                                                                       NA
## `SourceTechRepublic (blog)`                                                                              NA
## `SourceTechRepublic via Yahoo! Finance`                                                                  NA
## `SourceTechRepublic via Yahoo! News`                                                                     NA
## SourceTechRez                                                                                            NA
## SourceTechRitual                                                                                         NA
## SourceTechSpot                                                                                           NA
## SourceTechTarget                                                                                         NA
## `SourceTechTarget (blog)`                                                                                NA
## `SourceTechvibes (blog)`                                                                                 NA
## `SourceTechWeekEurope UK`                                                                                NA
## SourceTechwire.net                                                                                       NA
## SourceTechWorld                                                                                          NA
## SourceTechworm                                                                                           NA
## SourceTeenVogue.com                                                                                      NA
## `SourceTehran Times`                                                                                     NA
## `SourceTelecom Asia`                                                                                     NA
## `SourceTelecom Reseller (press release)`                                                                 NA
## Sourcetelecomasia.net                                                                                    NA
## `SourceTelecompaper (subscription)`                                                                      NA
## SourceTeleGeography                                                                                      NA
## `SourceTelegraph via Yahoo UK & Ireland Finance`                                                         NA
## SourceTelegraph.co.uk                                                                                    NA
## `SourceTelegraphStandard.com (blog)`                                                                     NA
## `SourceteleSUR English`                                                                                  NA
## SourceTempo                                                                                              NA
## SourceTempo.co                                                                                           NA
## `SourceTen Eyewitness News`                                                                              NA
## `SourceTerre Haute Tribune Star`                                                                         NA
## `SourceTES News`                                                                                         NA
## `SourceTest Tube`                                                                                        NA
## `SourceTewkesbury ADMAG`                                                                                 NA
## `SourceTexarkana Gazette`                                                                                NA
## `SourceTexas A&M The Battalion`                                                                          NA
## `SourceTexas Tribune`                                                                                    NA
## `SourceTG Daily`                                                                                         NA
## `SourceThaiVisa News`                                                                                    NA
## `SourceThanh Ni\\u009d\\u009dn`                                                                          NA
## `SourceThanh Nien Daily`                                                                                 NA
## `SourceThe-review`                                                                                       NA
## `SourceThe `                                                                                             NA
## `SourceThe Abbotsford News`                                                                              NA
## `SourceThe Actuary`                                                                                      NA
## `SourceThe Adam Smith Institute (blog)`                                                                  NA
## `SourceThe Advertiser`                                                                                   NA
## `SourceThe Advocate`                                                                                     NA
## `SourceThe Aero-News Network`                                                                            NA
## `SourceThe Africa Report`                                                                                NA
## `SourceThe Age`                                                                                          NA
## `SourceThe Albany Herald`                                                                                NA
## `SourceThe American Bazaar`                                                                              NA
## `SourceThe American Conservative`                                                                        NA
## `SourceThe American Genius`                                                                              NA
## `SourceThe American Lawyer`                                                                              NA
## `SourceThe American Prospect`                                                                            NA
## `SourceThe Ames Tribune`                                                                                 NA
## `SourceThe Arab Daily News`                                                                              NA
## `SourceThe Architect's Newspaper`                                                                        NA
## `SourceThe Arctic Journal`                                                                               NA
## `SourceThe Argentina Independent`                                                                        NA
## `SourceThe Argus-Press`                                                                                  NA
## `SourceThe Art Newspaper`                                                                                NA
## `SourceThe Art of Gears`                                                                                 NA
## `SourceThe Asia Foundation - In Asia`                                                                    NA
## `SourceThe Asia Sentinel`                                                                                NA
## `SourceThe Asian Age`                                                                                    NA
## `SourceThe Associated Press via Yahoo Canada Sports`                                                     NA
## `SourceThe Associated Press via Yahoo! Sports`                                                           NA
## `SourceThe Atlantic`                                                                                     NA
## `SourceThe Atlantic via Yahoo Canada News`                                                               NA
## `SourceThe Atlantic via Yahoo UK & Ireland News`                                                         NA
## `SourceThe Atlantic via Yahoo! News`                                                                     NA
## `SourceThe Augusta Chronicle`                                                                            NA
## `SourceThe Australian`                                                                                   NA
## `SourceThe Australian (blog)`                                                                            NA
## `SourceThe Australian (subscription)`                                                                    NA
## `SourceThe Australian (subscription) (blog)`                                                             NA
## `SourceThe Australian Financial Review`                                                                  NA
## `SourceThe Auto Channel`                                                                                 NA
## `SourceThe Bakersfield Californian`                                                                      NA
## `SourceThe Baltic Course`                                                                                NA
## `SourceThe Barrie Examiner`                                                                              NA
## `SourceThe Beacon`                                                                                       NA
## `SourceThe Bellingham Herald`                                                                            NA
## `SourceThe Big Lead`                                                                                     NA
## `SourceThe Biloxi Sun Herald`                                                                            NA
## `SourceThe Bitbag`                                                                                       NA
## `SourceThe Boar`                                                                                         NA
## `SourceThe Bolton News`                                                                                  NA
## `SourceThe Bookseller`                                                                                   NA
## `SourceThe Bookseller (blog)`                                                                            NA
## `SourceThe Border Mail`                                                                                  NA
## `SourceThe Borneo Post`                                                                                  NA
## `SourceThe Boston Globe`                                                                                 NA
## `SourceThe Bottom Line`                                                                                  NA
## `SourceThe Bournemouth Daily Echo`                                                                       NA
## `SourceThe Bozeman Daily Chronicle`                                                                      NA
## `SourceThe Bradford Era`                                                                                 NA
## `SourceThe Brantford Expositor`                                                                          NA
## `SourceThe BRICS Post`                                                                                   NA
## `SourceThe Brown Daily Herald`                                                                           NA
## `SourceThe Brussels Times`                                                                               NA
## `SourceThe Bubble`                                                                                       NA
## `SourceThe Buffalo News`                                                                                 NA
## `SourceThe Bulletin`                                                                                     NA
## `SourceThe Business of Fashion`                                                                          NA
## `SourceTHE BUSINESS TIMES`                                                                               NA
## `SourceThe Business Times Singapore`                                                                     NA
## `SourceThe Cairo Review of Global Affairs (blog)`                                                        NA
## `SourceThe California Aggie`                                                                             NA
## `SourceThe Cambodia Daily`                                                                               NA
## `SourceThe Cameron Herald`                                                                               NA
## `SourceThe Canadian Press via Yahoo Canada Finance`                                               6.704e-01
## `SourceThe Canadian Press via Yahoo Canada News`                                                         NA
## `SourceThe Canadian Press via Yahoo Canada Sports`                                                       NA
## `SourceThe Canberra Times`                                                                               NA
## `SourceThe Canton Repository`                                                                            NA
## `SourceThe Capital Journal`                                                                              NA
## `SourceThe Capitol Fax Blog (blog)`                                                                      NA
## `SourceThe Car Connection`                                                                               NA
## `SourceThe Cerbat Gem`                                                                                   NA
## `SourceThe Charleston Gazette`                                                                           NA
## `SourceThe Charlotte Post`                                                                               NA
## `SourceThe Chattanoogan`                                                                                 NA
## `SourceThe Cheat Sheet`                                                                                  NA
## `SourceThe Cherokeean Herald`                                                                            NA
## `SourceThe Chicago Maroon`                                                                               NA
## `SourceThe Chicago Monitor`                                                                              NA
## `SourceThe Christian Post`                                                                               NA
## `SourceThe Christian Science Monitor`                                                                    NA
## `SourceThe Christian Times`                                                                              NA
## `SourceThe Chronicle-Journal`                                                                            NA
## `SourceThe Chronicle-Telegram`                                                                           NA
## `SourceThe Chronicle Herald`                                                                             NA
## `SourceThe Chronicle Journal`                                                                            NA
## `SourceThe Citizen`                                                                                      NA
## `SourceThe Citizens&#39; Voice`                                                                          NA
## `SourceThe Climate Group`                                                                                NA
## `SourceThe Climate Group (blog)`                                                                         NA
## `SourceThe Coast`                                                                                        NA
## `SourceThe Coast Halifax`                                                                                NA
## `SourceThe Coldwater Daily Reporter`                                                                     NA
## `SourceThe College Fix`                                                                                  NA
## `SourceThe Colorado Independent`                                                                         NA
## `SourceThe Coloradoan`                                                                                   NA
## `SourceThe Columbian`                                                                                    NA
## `SourceThe Commercial Dispatch`                                                                          NA
## `SourceThe Compass`                                                                                      NA
## `SourceThe Concordian (subscription)`                                                                    NA
## `SourceThe Connecticut College Voice`                                                                    NA
## `SourceThe Connexion`                                                                                    NA
## `SourceThe Conroe Courier`                                                                               NA
## `SourceThe Consumerist`                                                                                  NA
## `SourceThe Conversation AU`                                                                              NA
## `SourceThe Conversation UK`                                                                              NA
## `SourceThe Conversation US`                                                                              NA
## `SourceThe Conversation via Yahoo!7 Finance`                                                             NA
## `SourceThe Copenhagen Post - Danish news in english`                                                     NA
## `SourceThe Corner Economic`                                                                              NA
## `SourceThe Cornishman`                                                                                   NA
## `SourceThe Courier`                                                                                      NA
## `SourceThe Courier-Journal`                                                                              NA
## `SourceThe Courier Life News`                                                                            NA
## `SourceThe Courier Mail`                                                                                 NA
## `SourceThe CT Mirror`                                                                                    NA
## `SourceThe Cubic Lane`                                                                                   NA
## `SourceThe Daily Advertiser`                                                                             NA
## `SourceThe Daily Banter`                                                                                 NA
## `SourceThe Daily Breeze`                                                                                 NA
## `SourceThe Daily Buzz via Yahoo Canada News`                                                             NA
## `SourceThe Daily Collegian Online`                                                                       NA
## `SourceThe Daily Comet`                                                                                  NA
## `SourceThe Daily Cougar`                                                                                 NA
## `SourceThe Daily Courier`                                                                                NA
## `SourceThe Daily Dot`                                                                                    NA
## `SourceThe Daily Free Press`                                                                             NA
## `SourceThe Daily Freeman`                                                                                NA
## `SourceThe Daily Gazette`                                                                                NA
## `SourceThe Daily Herald (press release)`                                                                 NA
## `SourceThe Daily Mercury`                                                                                NA
## `SourceThe Daily Mining Gazette`                                                                         NA
## `SourceThe Daily News Journal`                                                                           NA
## `SourceThe Daily News of Newburyport`                                                                    NA
## `SourceThe Daily Pennsylvanian`                                                                          NA
## `SourceThe Daily Progress`                                                                               NA
## `SourceThe Daily Reckoning`                                                                              NA
## `SourceThe Daily Record`                                                                                 NA
## `SourceThe Daily Reflector`                                                                              NA
## `SourceThe Daily Star`                                                                                   NA
## `SourceThe Daily Voice`                                                                                  NA
## `SourceThe Daily Vox (blog)`                                                                             NA
## `SourceThe Daily World`                                                                                  NA
## `SourceThe Day`                                                                                          NA
## `SourceThe Denver Channel`                                                                               NA
## `SourceThe Denver Post`                                                                                  NA
## `SourceThe Denver Post (blog)`                                                                           NA
## `SourceThe Desert Sun`                                                                                   NA
## `SourceThe Detroit News`                                                                                 NA
## `SourceThe Diane Rehm Show`                                                                              NA
## `SourceThe Dickinson Press`                                                                              NA
## `SourceThe Diplomat`                                                                                     NA
## `SourceThe Dismal Scientist (subscription)`                                                              NA
## `SourceThe Dominion Post`                                                                                NA
## `SourceThe Dorset Echo`                                                                                  NA
## `SourceThe Drive`                                                                                        NA
## `SourceThe Drum`                                                                                         NA
## `SourceThe Durango Herald`                                                                               NA
## `SourceThe Eagle Online`                                                                                 NA
## `SourceThe Echo`                                                                                         NA
## `SourceThe Ecologist`                                                                                    NA
## `SourceThe Economic Times`                                                                               NA
## `SourceThe Economist`                                                                                    NA
## `SourceThe Economist (blog)`                                                                             NA
## `SourceThe Edge`                                                                                         NA
## `SourceThe Edge Markets`                                                                                 NA
## `SourceThe Edge Markets MY`                                                                              NA
## `SourceThe Electronic Intifada`                                                                          NA
## `SourceThe Electronic Intifada (blog)`                                                                   NA
## `SourceThe Elkhart Truth`                                                                                NA
## `SourceThe Elkhart Truth (blog)`                                                                         NA
## `SourceThe Emory Wheel`                                                                                  NA
## `SourceThe Epoch Times`                                                                                  NA
## `SourceThe Escapist`                                                                                     NA
## `SourceThe Evening Sun`                                                                                  NA
## `SourceThe Examiner`                                                                                     NA
## `SourceThe Exponent Telegram (press release) (registration)`                                             NA
## `SourceThe Express Tribune`                                                                              NA
## `SourceThe Express Tribune (blog)`                                                                       NA
## `SourceThe FADER`                                                                                        NA
## `SourceThe Fayetteville Observer`                                                                        NA
## `SourceThe Federalist`                                                                                   NA
## `SourceThe FINANCIAL`                                                                                    NA
## `SourceThe Financial Express via Yahoo! Finance India`                                                   NA
## `SourceThe Fiscal Times`                                                                                 NA
## `SourceThe Fiscal Times via Yahoo UK & Ireland Finance`                                                  NA
## `SourceThe Fiscal Times via Yahoo! Finance`                                                              NA
## `SourceThe Fiscal Times via Yahoo! New Zealand Finance`                                                  NA
## `SourceThe Fiscal Times via Yahoo! News`                                                                 NA
## `SourceThe Fiscal Times via Yahoo!7 Finance`                                                             NA
## `SourceThe Flagship`                                                                                     NA
## `SourceThe Flamborough Review (press release) (registration)`                                            NA
## `SourceThe Flinders News`                                                                                NA
## `SourceThe Fort Campbell Courier`                                                                        NA
## `SourceThe Forward`                                                                                      NA
## `SourceThe Fresno Bee`                                                                                   NA
## `SourceThe Gadgeteer`                                                                                    NA
## `SourceThe Gadsden Times`                                                                                NA
## `SourceThe Gainesville Times`                                                                            NA
## `SourceThe Garden City Telegram`                                                                         NA
## `SourceThe GATE`                                                                                         NA
## `SourceThe Gateway Online`                                                                               NA
## `SourceThe Gazette`                                                                                      NA
## `SourceThe Gazette  Western University's Student Newspaper`                                              NA
## `SourceThe Gazette: Eastern Iowa Breaking News and Headlines`                                            NA
## `SourceThe Gilmer Mirror`                                                                                NA
## `SourceThe Gleaner`                                                                                      NA
## `SourceThe Global Herald`                                                                                NA
## `SourceThe Globalist`                                                                                    NA
## `SourceThe Globe and Mail`                                                                               NA
## `SourceThe Globe and Mail (subscription)`                                                                NA
## `SourceThe Grio`                                                                                         NA
## `SourceThe Guardian`                                                                                     NA
## `SourceThe Guardian (Australia)`                                                                         NA
## `SourceThe Guardian (blog)`                                                                              NA
## `SourceThe Guardian Charlottetown`                                                                       NA
## `SourceThe Guardian Nigeria (satire) (press release) (blog)`                                             NA
## `SourceThe Guru Investor`                                                                                NA
## `SourceThe Hacked News`                                                                                  NA
## `SourceThe Hamilton Journal News`                                                                        NA
## `SourceThe Hankyoreh`                                                                                    NA
## `SourceThe Hans India`                                                                                   NA
## `SourceThe Harvard Crimson`                                                                              NA
## `SourceThe Hazleton Standard-Speaker`                                                                    NA
## `SourceThe Heartland Institute`                                                                          NA
## `SourceThe Hechinger Report`                                                                             NA
## `SourceThe Heights`                                                                                      NA
## `SourceThe Henderson Daily News`                                                                         NA
## `SourceThe Hendersonville Times-News`                                                                    NA
## `SourceThe Herald`                                                                                       NA
## `SourceThe Herald-News`                                                                                  NA
## `SourceThe Herald-Times (subscription)`                                                                  NA
## `SourceThe Herald Bulletin`                                                                              NA
## `SourceThe Herald News`                                                                                  NA
## `SourceThe Hereford Times`                                                                               NA
## `SourceThe Hill`                                                                                         NA
## `SourceThe Hill (blog)`                                                                                  NA
## `SourceThe Hillsdale Daily News`                                                                         NA
## `SourceThe Hilltop News`                                                                                 NA
## `SourceThe Hindu`                                                                                        NA
## `SourceThe Hollywood Reporter`                                                                           NA
## `SourceThe Hollywood Reporter via Yahoo! News`                                                           NA
## `SourceThe Hollywood Source`                                                                             NA
## `SourceThe Holmes Report`                                                                                NA
## `SourceThe Houma Courier`                                                                                NA
## `SourceThe Hub at Johns Hopkins`                                                                         NA
## `SourceThe Huffington Post`                                                                              NA
## `SourceThe Huffington Post UK`                                                                           NA
## `SourceThe Huntington News`                                                                              NA
## `SourceThe Independent`                                                                                  NA
## `SourceThe Independent Florida Alligator`                                                                NA
## `SourceThe Indian Express`                                                                               NA
## `SourceThe Indian Express (blog)`                                                                        NA
## `SourceThe Indian Express via Yahoo! India News`                                                         NA
## `SourceThe Indian Panorama`                                                                              NA
## `SourceThe Indianapolis Star`                                                                            NA
## `SourceThe indy100`                                                                                      NA
## `SourceThe Inquirer`                                                                                     NA
## `SourceThe Inquisitr`                                                                                    NA
## `SourceThe Intelligencer / Wheeling News-Register`                                                       NA
## `SourceThe Intercept`                                                                                    NA
## `SourceThe Interpreter`                                                                                  NA
## `SourceThe Irish Catholic`                                                                               NA
## `Sourcethe Irish News`                                                                                   NA
## `SourceThe Irish Times`                                                                                  NA
## `SourceThe Irrawaddy News Magazine`                                                                      NA
## `SourceThe Ithaca Voice`                                                                                 NA
## `SourceThe Jacksonville Daily News`                                                                      NA
## `SourceThe Japan News`                                                                                   NA
## `SourceThe Japan Times`                                                                                  NA
## `SourceThe Jewish Journal of Greater Los Angeles`                                                        NA
## `SourceThe Jewish Press`                                                                                 NA
## `SourceThe Jewish Press (blog)`                                                                          NA
## `SourceThe Jewish Standard`                                                                              NA
## `SourceThe Jewish Star`                                                                                  NA
## `SourceThe Jewish Voice`                                                                                 NA
## `SourceThe Jewish Week`                                                                                  NA
## `SourceThe Journal`                                                                                      NA
## `SourceThe Journal News | LoHud.com`                                                                     NA
## `SourceThe Justice`                                                                                      NA
## `SourceThe Kansas City Star`                                                                             NA
## `SourceThe Keene Sentinel`                                                                               NA
## `SourceThe Killeen Daily Herald`                                                                         NA
## `SourceThe Kingston Whig-Standard`                                                                       NA
## `SourceThe Korea Herald`                                                                                 NA
## `SourceThe Korea Observer`                                                                               NA
## `SourceThe Lakeland Ledger`                                                                              NA
## `SourceThe Lawton Constitution`                                                                          NA
## `SourceThe Lawyer`                                                                                       NA
## `SourceThe Lawyer (registration)`                                                                        NA
## `SourceThe Ledger`                                                                                       NA
## `SourceThe Lens`                                                                                         NA
## `SourceThe Libertarian Republic`                                                                         NA
## `SourceThe Link`                                                                                         NA
## `SourceThe Local`                                                                                        NA
## `SourceThe Local Denmark`                                                                                NA
## `SourceThe Local.ch`                                                                                     NA
## `SourceThe Local.de`                                                                                     NA
## `SourceThe Local.es`                                                                                     NA
## `SourceThe Local.fr`                                                                                     NA
## `SourceThe Local.it`                                                                                     NA
## `SourceThe Local.se`                                                                                     NA
## `SourceThe London News Review`                                                                           NA
## `SourceThe Longview News-Journal`                                                                        NA
## `SourceThe Louisville Cardinal`                                                                          NA
## `SourceThe Mac Observer`                                                                                 NA
## `SourceThe Maitland Mercury`                                                                             NA
## `SourceThe Malay Mail Online via Yahoo! Singapore News`                                                  NA
## `SourceThe Malaysian Insider`                                                                            NA
## `SourceThe Malaysian Insider via Yahoo! Singapore News`                                                  NA
## `SourceThe Mancunion`                                                                                    NA
## `SourceThe Manila Times`                                                                                 NA
## `SourceThe Marijuana Times`                                                                              NA
## `SourceThe Market Mogul`                                                                                 NA
## `SourceThe Market Oracle`                                                                                NA
## `SourceThe Marshalltown`                                                                                 NA
## `SourceThe Mary Sue`                                                                                     NA
## `SourceThe Mass Media`                                                                                   NA
## `SourceThe Massachusetts Daily Collegian`                                                                NA
## `SourceThe McDowell News`                                                                                NA
## `SourceThe McGill International Review`                                                                  NA
## `SourceThe Mckeesport Daily News`                                                                        NA
## `SourceThe Media Line`                                                                                   NA
## `SourceThe Medina County Gazette`                                                                        NA
## `SourceThe Memo`                                                                                         NA
## `SourceThe Memphis Daily News`                                                                           NA
## `SourceThe Mercury`                                                                                      NA
## `SourceThe Mercury News`                                                                                 NA
## `SourceThe Merkle (blog)`                                                                                NA
## `SourceThe MetroWest Daily News`                                                                         NA
## `SourceThe Michigan Daily`                                                                               NA
## `SourceThe Milpitas Post`                                                                                NA
## `SourceThe Minnesota Daily`                                                                              NA
## `SourceThe Mission City Record`                                                                          NA
## `SourceThe Missoulian`                                                                                   NA
## `SourceThe MIT Tech`                                                                                     NA
## `SourceThe Moderate Voice`                                                                               NA
## `SourceThe Moose Jaw Times Herald`                                                                       NA
## `SourceThe Morganton News Herald`                                                                        NA
## `SourceThe Morning Call`                                                                                 NA
## `SourceThe Moscow Times`                                                                                 NA
## `SourceThe Moscow Times (registration)`                                                                  NA
## `SourceThe Motley Fool`                                                                                  NA
## `SourceThe Motley Fool Canada`                                                                           NA
## `SourceThe Muslim News`                                                                                  NA
## `SourceThe Narco News Bulletin`                                                                          NA
## `SourceThe Nashua Telegraph`                                                                             NA
## `SourceThe Nation`                                                                                       NA
## `SourceThe Nation - Thailand&#39;s English news`                                                  1.783e-01
## `SourceThe Nation (blog)`                                                                                NA
## `SourceThe Nation Newspaper`                                                                             NA
## `SourceThe Nation.`                                                                                      NA
## `SourceThe Nation. (blog)`                                                                               NA
## `SourceThe National`                                                                                     NA
## `SourceThe National Business Review`                                                                     NA
## `SourceThe National Enquirer`                                                                            NA
## `SourceThe National Interest Online`                                                                     NA
## `SourceThe National Interest Online (blog)`                                                              NA
## `SourceThe National Law Review`                                                                          NA
## `SourceThe National Memo (blog)`                                                                         NA
## `SourceThe Native American Times`                                                                        NA
## `SourceThe Nelson Mail`                                                                                  NA
## `SourceThe Neosho Daily News`                                                                            NA
## `SourceThe New American`                                                                                 NA
## `SourceThe New Canaan News`                                                                              NA
## `SourceThe New Civil Rights Movement`                                                                    NA
## `SourceThe New Daily`                                                                                    NA
## `SourceThe New Indian Express`                                                                           NA
## `SourceThe New Mexico Daily Lobo`                                                                        NA
## `SourceThe New Orleans Advocate`                                                                         NA
## `SourceThe New School News (blog)`                                                                       NA
## `SourceThe New Statesman`                                                                                NA
## `SourceThe New Times`                                                                                    NA
## `SourceThe New York Observer`                                                                            NA
## `SourceThe New York Review of Books`                                                                     NA
## `SourceThe New Yorker`                                                                                   NA
## `SourceThe New Yorker (satire)`                                                                          NA
## `SourceThe New Zealand Herald`                                                                           NA
## `SourceThe News`                                                                                         NA
## `SourceThe News-Press`                                                                                   NA
## `SourceThe News-Times`                                                                                   NA
## `SourceThe News & Observer`                                                                              NA
## `SourceThe News Center`                                                                                  NA
## `SourceThe News Herald`                                                                                  NA
## `SourceThe News Hub`                                                                                     NA
## `SourceThe News International`                                                                           NA
## `SourceThe News Journal`                                                                                 NA
## `SourceThe News Minute`                                                                                  NA
## `SourceThe News Tribune`                                                                                 NA
## `SourceThe News Tribune (blog)`                                                                          NA
## `SourceThe Next Digit`                                                                                   NA
## `SourceThe Next Silicon Valley`                                                                          NA
## `SourceThe Next Web`                                                                                     NA
## `SourceThe Nonprofit Quarterly (blog)`                                                                   NA
## `SourceThe Nordic Page`                                                                                  NA
## `SourceThe North Bay Nugget`                                                                             NA
## `SourceThe Northern Echo (registration)`                                                                 NA
## `SourceThe Northwest Florida Daily News`                                                                 NA
## `SourceThe Oakland Press`                                                                                NA
## `SourceThe Oberlin Review`                                                                               NA
## `SourceThe Observer-Dispatch`                                                                            NA
## `SourceThe Oceanside Post`                                                                               NA
## `SourceThe Oklahoma Daily`                                                                               NA
## `SourceThe Olympian`                                                                                     NA
## `SourceThe Onion (satire)`                                                                               NA
## `SourceThe Orator`                                                                                       NA
## `SourceThe Oshkosh Northwestern`                                                                         NA
## `SourceThe Ottawa Times`                                                                                 NA
## `SourceThe Oxford Times`                                                                                 NA
## `SourceThe Palm Beach Post`                                                                              NA
## `SourceThe Panther`                                                                                      NA
## `SourceThe Pappas Post`                                                                                  NA
## `SourceThe Pasadena Star-News`                                                                           NA
## `SourceThe Peak`                                                                                         NA
## `SourceThe People's Voice`                                                                               NA
## `SourceThe Philadelphia Inquirer`                                                                        NA
## `SourceThe Players Tribune`                                                                              NA
## `SourceThe Point Review`                                                                                 NA
## `SourceThe Portugal News`                                                                                NA
## `SourceThe Post`                                                                                         NA
## `SourceThe Post and Courier`                                                                             NA
## `SourceThe Predictive Analytics Times`                                                                   NA
## `SourceThe Press`                                                                                        NA
## `SourceThe Press-Enterprise`                                                                             NA
## `SourceThe Prince Albert Daily Herald`                                                                   NA
## `SourceThe Progressive Pulse`                                                                            NA
## `SourceThe Providence Journal`                                                                           NA
## `SourceThe Province`                                                                                     NA
## `SourceThe Province - BC - Victoria`                                                                     NA
## `SourceThe Punch`                                                                                        NA
## `SourceThe Queensland Times`                                                                             NA
## `SourceThe Rancher`                                                                                      NA
## `SourceThe Randolph County Herald-Tribune`                                                               NA
## `SourceThe Real News Network`                                                                            NA
## `SourceThe Real News Network (blog)`                                                                     NA
## `SourceThe Rebel`                                                                                        NA
## `SourceThe Record`                                                                                       NA
## `SourceThe Record (New Westminster)`                                                                     NA
## `SourceThe Recorder`                                                                                     NA
## `SourceThe Register`                                                                              6.888e-01
## `SourceThe Register-Guard`                                                                               NA
## `SourceThe Republic`                                                                                     NA
## `SourceThe Review`                                                                                       NA
## `SourceThe Ridgefield Press`                                                                             NA
## `SourceThe Ringer (blog)`                                                                                NA
## `SourceThe Rio Times`                                                                                    NA
## `SourceThe Robesonian`                                                                                   NA
## `SourceThe Rock Hill Herald`                                                                             NA
## `SourceThe Root`                                                                                         NA
## `SourceThe Root (blog)`                                                                                  NA
## `SourceThe Rude Baguette`                                                                                NA
## `SourceThe Rushville Republican`                                                                         NA
## `SourceThe Russellville Courier`                                                                         NA
## `SourceThe Sacramento Bee`                                                                               NA
## `SourceThe Salem News`                                                                                   NA
## `SourceThe Salinas Californian`                                                                          NA
## `SourceThe Salt Lake Tribune`                                                                            NA
## `SourceThe San Diego Union-Tribune`                                                                      NA
## `SourceThe San Gabriel Valley Tribune`                                                                   NA
## `SourceThe San Luis Obispo Tribune`                                                                      NA
## `SourceThe Sarasota Herald-Tribune`                                                                      NA
## `SourceThe Saratogian`                                                                                   NA
## `SourceThe Scotsman`                                                                                     NA
## `SourceThe Scranton Times-Tribune`                                                                       NA
## `SourceThe Seattle Times`                                                                                NA
## `SourceThe Sheboygan Press`                                                                              NA
## `SourceThe Shillong Times`                                                                               NA
## `SourceThe Siasat Daily`                                                                                 NA
## `SourceThe Simcoe Reformer`                                                                              NA
## `SourceThe Siver Times`                                                                                  NA
## `SourceThe Skanner`                                                                                      NA
## `SourceThe Slovak Spectator`                                                                             NA
## `SourceThe Sofia Globe`                                                                                  NA
## `SourceThe Source`                                                                                       NA
## `SourceThe Southern`                                                                                     NA
## `SourceThe Southland Times`                                                                              NA
## `SourceThe Spinoff`                                                                                      NA
## `SourceThe Spokesman-Review`                                                                             NA
## `SourceThe Spokesman Review (registration)`                                                              NA
## `SourceThe Stack`                                                                                        NA
## `SourceThe Standard`                                                                                     NA
## `SourceThe Standard Digital News (press release) (blog)`                                                 NA
## `SourceThe Standard Digital News (satire) (press release) (registration) (blog)`                         NA
## `Sourcethe star`                                                                                         NA
## `SourceThe Star`                                                                                         NA
## `SourceThe Star-Ledger`                                                                                  NA
## `SourceThe Star Online`                                                                                  NA
## `SourceThe Star, Kenya`                                                                                  NA
## `SourceThe State`                                                                                        NA
## `SourceThe State (blog)`                                                                                 NA
## `SourceThe State Journal-Register`                                                                       NA
## `SourceThe State News`                                                                                   NA
## `SourceThe Statesman`                                                                                    NA
## `SourceThe Straits Times`                                                                                NA
## `SourceThe Sudbury Star`                                                                                 NA
## `SourceThe Sun`                                                                                          NA
## `SourceThe Sun Daily`                                                                                    NA
## `SourceThe Sun Herald`                                                                                   NA
## `SourceThe Sunday Business Post`                                                                         NA
## `SourceThe Sunday Post`                                                                                  NA
## `SourceThe Sunday Times`                                                                                 NA
## `SourceThe Sunday Times Sri Lanka`                                                                       NA
## `SourceThe Sunshine Coast Daily`                                                                         NA
## `SourceThe Swedish Wire`                                                                                 NA
## `SourceThe Sydney Morning Herald`                                                                        NA
## `SourceThe Tablet`                                                                                       NA
## `SourceThe Takeaway (blog)`                                                                              NA
## `SourceThe Tampa  Tribune`                                                                               NA
## `SourceThe Tand D.com`                                                                                   NA
## `SourceThe Tech Portal`                                                                                  NA
## `SourceThe Tech Report, LLC`                                                                             NA
## `SourceThe Tech Report, LLC (blog)`                                                                      NA
## `SourceThe TechNews`                                                                                     NA
## `SourceThe Telegram`                                                                                     NA
## `SourceThe Telegraph`                                                                                    NA
## `SourceThe Temple News`                                                                                  NA
## `SourceThe Tennessean`                                                                                   NA
## `SourceThe Tico Times`                                                                                   NA
## `SourceThe Tidings`                                                                                      NA
## `SourceThe Times (subscription)`                                                                         NA
## `SourceThe Times and Democrat`                                                                           NA
## `SourceThe Times of India`                                                                               NA
## `SourceThe Times of Isra\\u009d\\u009dl`                                                                 NA
## `SourceThe Times of Israel`                                                                              NA
## `SourceThe Times of Israël`                                                                              NA
## `SourceThe Times of Israel (blog)`                                                                       NA
## `SourceThe Toledo Blade`                                                                                 NA
## `SourceThe Trace`                                                                                        NA
## `SourceThe Tribune`                                                                                      NA
## `SourceThe Trinidad Guardian`                                                                            NA
## `SourceThe Truro Daily News`                                                                             NA
## `SourceThe Tuscaloosa News`                                                                              NA
## `SourceThe Tyee`                                                                                         NA
## `SourceThe UCSD Guardian Online`                                                                         NA
## `SourceThe Ulster Herald`                                                                                NA
## `SourceThe Undefeated`                                                                                   NA
## `SourceThe Union Leader`                                                                                 NA
## `SourceThe Union of Grass Valley`                                                                        NA
## `SourceThe Uniontown Herald Standard`                                                                    NA
## `SourceThe University of Hawaii Kaleo`                                                                   NA
## `SourceThe Unofficial Apple Weblog`                                                                      NA
## `SourceThe VAR Guy`                                                                                      NA
## `SourceThe Verge`                                                                                        NA
## `SourceThe Verge via Yahoo Canada News`                                                                  NA
## `SourceThe Verge via Yahoo! News`                                                                -4.284e+03
## `SourceThe Vermilion`                                                                                    NA
## `SourceThe Vermont Standard`                                                                             NA
## `SourceThe Victoria Advocate`                                                                            NA
## `SourceThe Vista Voice`                                                                                  NA
## `SourceThe Voice Herald (blog)`                                                                          NA
## `SourceThe Voice Observer (blog)`                                                                        NA
## `SourceThe Voice of Millions`                                                                            NA
## `SourceThe Wahpeton Daily News`                                                                          NA
## `SourceThe Wall Street Journal`                                                                   4.504e+15
## `SourceThe Wall Street Journal via Yahoo Canada Finance`                                                 NA
## `SourceThe Wall Street Journal via Yahoo UK & Ireland Finance`                                           NA
## `SourceThe Wall Street Journal via Yahoo! Finance`                                                       NA
## `SourceThe Wall Street Journal via Yahoo! Finance India`                                                 NA
## `SourceThe Wall Street Journal via Yahoo! New Zealand Finance`                                           NA
## `SourceThe Wall Street Journal via Yahoo! News`                                                          NA
## `SourceThe Wall Street Journal via Yahoo!7 Finance`                                                      NA
## `SourceThe Washington Times`                                                                             NA
## `SourceThe Wayne Independent`                                                                            NA
## `SourceThe Weather Channel`                                                                              NA
## `SourceThe Weather Network`                                                                              NA
## `SourceThe Weed Blog (blog)`                                                                             NA
## `SourceThe Week Magazine`                                                                                NA
## `SourceThe Week UK`                                                                                      NA
## `SourceThe Weekly Standard`                                                                              NA
## `SourceThe Weekly Standard (blog)`                                                                       NA
## `SourceThe Wesleyan Argus`                                                                               NA
## `SourceThe West Australian`                                                                              NA
## `SourceThe West Australian via Yahoo!7 News`                                                             NA
## `SourceThe Westerly Sun`                                                                                 NA
## `SourceThe Whistler`                                                                                     NA
## `SourceThe White House`                                                                                  NA
## `SourceThe White House (blog)`                                                                           NA
## `SourceThe Wire`                                                                                         NA
## `SourceThe Worldfolio`                                                                                   NA
## `SourceThe Wrap via Yahoo Celebrity`                                                                     NA
## `SourceThe Youngstown Vindicator`                                                                        NA
## `SourceThe Yucatan Times`                                                                                NA
## `SourceThe Zimbabwe Standard`                                                                            NA
## `SourceThe Zimbabwean`                                                                                   NA
## SourceTheBlaze.com                                                                                       NA
## SourceTheCable                                                                                           NA
## SourceTheChronicleHerald.ca                                                                              NA
## SourceTheCork.ie                                                                                         NA
## SourceThefairfieldrecorder                                                                               NA
## SourceThegardenisland.com                                                                                NA
## SourceTheHorse.com                                                                                       NA
## `SourceTheHostingNews.com (press release) (blog)`                                                        NA
## SourceThehour.com                                                                                        NA
## Sourcetheifp.ca                                                                                          NA
## Sourcethejournal.ie                                                                                      NA
## `SourceTheJournal.ie via Yahoo UK & Ireland Finance`                                                     NA
## `SourceTheJournal.ie via Yahoo UK & Ireland News`                                                        NA
## SourceThelakeandeswave                                                                                   NA
## Sourcethenews.pl                                                                                         NA
## SourceTheParliamentMagazine.eu                                                                           NA
## SourceThePoultrySite.com                                                                                 NA
## Sourcethepridela.com                                                                                     NA
## SourceTheSouthAfrican                                                                                    NA
## SourceTheSportsCampus.com                                                                                NA
## SourceTheStranger.com                                                                                    NA
## `SourceTheStranger.com (blog)`                                                                           NA
## SourceTheStreet.com                                                                               5.359e+01
## SourceTheTower.org                                                                                       NA
## SourcetheTrumpet.com                                                                                     NA
## SourceTheTyee.ca                                                                                         NA
## SourceThevillagessuntimes                                                                                NA
## SourceTheWrap                                                                                            NA
## SourceThinkAdvisor                                                                                       NA
## SourceThinkProgress                                                                                      NA
## `SourceThird Sector`                                                                                     NA
## `SourceThis is Bristol`                                                                                  NA
## `SourceThis is Money`                                                                                    NA
## `SourceThis Is Money`                                                                                    NA
## `SourceThis is Oxfordshire`                                                                              NA
## `SourceTHISDAY Live`                                                                                     NA
## `SourceThomas Reuters Fondation`                                                                         NA
## SourceThomasNet                                                                                   4.504e+15
## `SourceThomson Reuters Foundation`                                                                       NA
## `SourceThomson Reuters StreetEvents via Yahoo! Finance`                                                  NA
## SourceThreatpost                                                                                         NA
## `SourceThurrott.com (blog)`                                                                              NA
## SourceTHV11.com                                                                                          NA
## `SourceTickerTV News (press release)`                                                                    NA
## SourceTidBITS                                                                                            NA
## `SourceTimaru Herald`                                                                                    NA
## SourceTIME                                                                                               NA
## `SourceTime Magazine`                                                                             5.345e+01
## `SourceTimes Colonist`                                                                                   NA
## `SourceTimes Daily`                                                                                      NA
## `SourceTimes Higher Education (THE)`                                                                     NA
## `SourceTimes Leader`                                                                                     NA
## `SourceTimes LIVE`                                                                                       NA
## `SourceTimes News`                                                                                       NA
## `SourceTimes Now.tv`                                                                                     NA
## `SourceTimes of India`                                                                                   NA
## `SourceTimes of India (blog)`                                                                            NA
## `SourceTimes of Malta`                                                                                   NA
## `SourceTimes of Malta (blog)`                                                                            NA
## `SourceTimes of Oman`                                                                                    NA
## `SourceTimes Record`                                                                                     NA
## `SourceTimes Record (subscription)`                                                                      NA
## `SourceTimes Record News`                                                                                NA
## SourceTimesonline.com                                                                                    NA
## `SourceTimmins Press`                                                                                    NA
## SourceTMZ.com                                                                                            NA
## SourceTnooz                                                                                              NA
## `SourceToday's Zaman`                                                                                    NA
## `SourceToday in Bermuda`                                                                                 NA
## SourceToday.com                                                                                          NA
## SourceTODAY.ng                                                                                           NA
## SourceTODAYonline                                                                                        NA
## `SourceToledo Blade`                                                                                     NA
## `SourceToledo News Now`                                                                                  NA
## `SourceTom's Guide`                                                                                      NA
## `SourceTom's Hardware`                                                                                   NA
## `SourceToowoomba Chronicle`                                                                              NA
## `SourceTop Tech News`                                                                                    NA
## `SourceTopeka Capital Journal`                                                                           NA
## `SourceTopsail Voice`                                                                                    NA
## `SourceToronto Star`                                                                                     NA
## `SourceToronto Sun`                                                                                      NA
## `SourceTorque News`                                                                                      NA
## SourceTorrentFreak                                                                                       NA
## `SourceTouch Arcade`                                                                                     NA
## `SourceToward Freedom`                                                                                   NA
## SourceTowleroad                                                                                          NA
## `SourceTown Hall`                                                                                        NA
## `SourceTownsville Bulletin`                                                                              NA
## SourceTPM                                                                                                NA
## `SourceTPM (blog)`                                                                                       NA
## `SourceTrade Arabia`                                                                                     NA
## `SourceTrade Calls`                                                                                      NA
## `SourceTrades Union Congress`                                                                            NA
## SourceTradingFloor.com                                                                                   NA
## `SourceTrak.in (blog)`                                                                                   NA
## `SourceTransport Topics Online`                                                                          NA
## `SourceTravel Daily News International`                                                                  NA
## `SourceTravel Weekly`                                                                                    NA
## `SourceTravel+Leisure`                                                                                   NA
## SourceTravelersToday                                                                                     NA
## `SourceTravelGBI (press release) (blog)`                                                                 NA
## SourceTraveller                                                                                          NA
## `SourceTraverse City Record Eagle`                                                                       NA
## SourceTravolution                                                                                        NA
## SourceTreehugger                                                                                         NA
## SourceTrefis                                                                                             NA
## `SourceTrend News Agency`                                                                                NA
## `SourceTri-City Herald`                                                                                  NA
## `SourceTri County Leader`                                                                                NA
## `SourceTriad Business Journal (blog)`                                                                    NA
## `SourceTriangle Business Journal`                                                                        NA
## `SourceTribune-Review`                                                                                   NA
## SourceTrinicenter.com                                                                                    NA
## `SourceTrinidad & Tobago Express`                                                                        NA
## `SourceTrinidad Guardian`                                                                                NA
## `SourceTriple Pundit (registration) (blog)`                                                              NA
## SourceTristatehomepage.com                                                                               NA
## `SourceTriValley Central`                                                                                NA
## `SourceTRT World`                                                                                        NA
## SourceTruckingInfo.com                                                                                   NA
## SourceTrueAchievements                                                                                   NA
## SourceTRUNEWS                                                                                            NA
## SourceTrustedReviews                                                                                     NA
## `SourceTruth-Out`                                                                                        NA
## `SourceTruth In Media`                                                                                   NA
## SourceTruthdig                                                                                           NA
## `SourceTSA - Tout Sur l'Alg\\u009d\\u009drie`                                                            NA
## `SourceTucson News Now`                                                                                  NA
## `SourceTucson Weekly`                                                                                    NA
## SourceTudocelular.com                                                                                    NA
## `SourceTufts Daily`                                                                                      NA
## `SourceTulsa World`                                                                                      NA
## `SourceTunisia Live`                                                                                     NA
## `SourceTuoitrenews (press release)`                                                                      NA
## `SourceTurkish Review`                                                                                   NA
## `SourceTuscaloosa News (subscription)`                                                                   NA
## `SourceTV Guide (blog)`                                                                                  NA
## `SourceTV Newsroom`                                                                                      NA
## `SourceTV Technology`                                                                                    NA
## SourceTVbytheNumbers                                                                                     NA
## SourceTVLine                                                                                             NA
## SourceTVNewser                                                                                           NA
## SourceTVNZ                                                                                               NA
## SourceTVPredictions.com                                                                                  NA
## `SourceTWC News`                                                                                         NA
## `SourceTWCN Tech News (blog)`                                                                            NA
## SourceTweakTown                                                                                          NA
## SourceTwice                                                                                              NA
## `SourceTwin Falls Times-News`                                                                            NA
## `SourceTwinCities.com-Pioneer Press`                                                                     NA
## SourceTwinfinite                                                                                         NA
## `SourceTwitchFilm (blog)`                                                                                NA
## SourceTwitchy                                                                                            NA
## SourceTwoCircles.net                                                                                     NA
## `SourceTyler Morning Telegraph`                                                                          NA
## `SourceU-T San Diego`                                                                                    NA
## `SourceU of M News Service`                                                                              NA
## `SourceU.S. Department of Education (press release)`                                                     NA
## `SourceU.S. Department of Education (press release) (blog)`                                              NA
## `SourceU.S. EPA.gov (press release)`                                                                     NA
## `SourceU.S. News & World Report`                                                                         NA
## `SourceU.S. News & World Report (blog)`                                                                  NA
## `SourceU.S.News & World Report via Yahoo! News`                                                          NA
## SourceU.TV                                                                                               NA
## SourceUbergizmo                                                                                          NA
## `SourceUC Davis`                                                                                         NA
## `SourceUC Los Angeles`                                                                                   NA
## `SourceUC Merced University News`                                                                        NA
## `SourceUCalgary News`                                                                                    NA
## `SourceUChicago News`                                                                                    NA
## `SourceUD Daily`                                                                                         NA
## `SourceUGA Today`                                                                                        NA
## `SourceUK Fundraising`                                                                                   NA
## `SourceUKNow (press release)`                                                                            NA
## `SourceUkraine Today`                                                                                    NA
## `SourceUloop News`                                                                                       NA
## `SourceUltimate-Guitar.Com`                                                                              NA
## Sourceummid.com                                                                                          NA
## `SourceUN Dispatch`                                                                                      NA
## `SourceUN News Centre`                                                                                   NA
## `SourceUncover California`                                                                               NA
## SourceUNCTAD                                                                                             NA
## `SourceUND The Dakota Student`                                                                           NA
## `SourceUndercurrent News`                                                                                NA
## `SourceUnion of Concerned Scientists`                                                                    NA
## `SourceUnionOracle.com (blog)`                                                                           NA
## `SourceUniontown Herald Standard`                                                                        NA
## `SourceUnited Nations`                                                                                   NA
## `SourceUniverse Today`                                                                                   NA
## `SourceUniversity Herald`                                                                                NA
## `SourceUniversity of Delaware`                                                                           NA
## `SourceUniversity of Delaware Review`                                                                    NA
## `SourceUniversity of St. Thomas Newsroom`                                                                NA
## `SourceUniversity of Virginia`                                                                           NA
## `SourceUniversity of Virginia The Cavalier Daily`                                                        NA
## `SourceUniversity World News`                                                                            NA
## `SourceUNM Newsroom`                                                                                     NA
## SourceUPI                                                                                                NA
## SourceUPI.com                                                                                            NA
## SourceUpperMichigansSource.com                                                                           NA
## SourceUPROXX                                                                                             NA
## `SourceUPROXX via Yahoo! News`                                                                           NA
## `SourceUPROXX via Yahoo! Sports`                                                                         NA
## SourceUpstart                                                                                            NA
## `SourceUpstate Business Journal`                                                                         NA
## `SourceUpstream Online`                                                                                  NA
## SourceUpvoted                                                                                            NA
## SourceUpworthy                                                                                           NA
## `SourceUQ News`                                                                                          NA
## `SourceUrban Land`                                                                                       NA
## `SourceUrgent Communications`                                                                            NA
## `SourceUS 99.5`                                                                                          NA
## `SourceUS News & World Report`                                                                           NA
## `SourceUs Weekly`                                                                                        NA
## `SourceUS Weekly`                                                                                        NA
## `SourceUSA Today`                                                                                        NA
## `SourceUSA TODAY`                                                                                -9.007e+15
## `SourceUSA TODAY College`                                                                                NA
## `SourceUSA TODAY High School Sports`                                                                     NA
## `SourceUSAPP American Politics and Policy (blog)`                                                        NA
## `SourceUSDA.gov (press release)`                                                                         NA
## `SourceUSDA.gov (press release) (blog)`                                                                  NA
## `SourceUSgamer (satire) (registration) (blog)`                                                           NA
## `SourceUSNI News`                                                                                        NA
## `SourceuSwitch.com (Tech)`                                                                               NA
## `SourceUT The Daily Texan`                                                                               NA
## `SourceUTA The Shorthorn`                                                                                NA
## `SourceUtah Business`                                                                                    NA
## SourceUTDailyBeacon.com                                                                                  NA
## `SourceUtility Dive`                                                                                     NA
## `SourceUtne Reader Online`                                                                               NA
## `SourceUTV Ireland`                                                                                      NA
## `SourceUTV Ireland (blog)`                                                                               NA
## Sourceuuworld.org                                                                                        NA
## `SourceUW Badger Herald`                                                                                 NA
## `SourceUW Today`                                                                                         NA
## SourceV3.co.uk                                                                                           NA
## `SourceValdosta Daily Times`                                                                             NA
## `SourceValley Advocate`                                                                                  NA
## `SourceValley morning Star`                                                                              NA
## `SourceValley News`                                                                                      NA
## `SourceValley News Live`                                                                                 NA
## SourceValueWalk                                                                                          NA
## `SourceVancity Buzz`                                                                                     NA
## `SourceVancouver Sun`                                                                                    NA
## `SourceVancouver Sun (blog)`                                                                             NA
## SourceVanguard                                                                                           NA
## `SourceVanity Fair`                                                                                      NA
## SourceVariety                                                                                            NA
## `SourceVariety via Yahoo! Finance`                                                                6.582e-01
## `SourceVatican Radio`                                                                                    NA
## SourceVatorNews                                                                                          NA
## SourceVEJA.com                                                                                           NA
## SourceVenezuelanalysis.com                                                                               NA
## `SourceVentura County Star`                                                                              NA
## `SourceVenture Capital Post`                                                                             NA
## SourceVentureBeat                                                                                        NA
## `SourceVentures Africa`                                                                                  NA
## SourceVentureVillage                                                                                     NA
## `SourceVenues Today`                                                                                     NA
## `SourceVera Files`                                                                                       NA
## `SourceVermont Public Radio`                                                                             NA
## SourceVG247                                                                                              NA
## SourceVibe                                                                                               NA
## `SourceVibe Magazine`                                                                                    NA
## SourceVICE                                                                                               NA
## `SourceVICE (blog)`                                                                                      NA
## `SourceVICE News`                                                                                        NA
## `SourceVictor Post`                                                                                      NA
## SourceVideogamer.com                                                                                     NA
## SourceVideoNewsUs                                                                                        NA
## `SourceViet Nam News`                                                                                    NA
## `SourceVietnam Plus`                                                                                     NA
## `SourceVietNamNet Bridge`                                                                                NA
## `SourceVillage Voice`                                                                                    NA
## `SourceVine Report`                                                                                      NA
## `SourceVineland Daily Journal`                                                                           NA
## `SourceVineyard Gazette`                                                                                 NA
## `SourceVirgin Islands Daily News`                                                                        NA
## `SourceVirginia Gazette`                                                                                 NA
## `SourceVirginian-Pilot`                                                                                  NA
## `SourceVirtualization Review`                                                                            NA
## `SourceVirtualization Review (blog)`                                                                     NA
## `SourceVisionMobile (blog)`                                                                              NA
## SourceVnExpress                                                                                          NA
## `SourceVOA Khmer (English)`                                                                              NA
## `SourceVOA Learning English`                                                                             NA
## `SourceVOA News`                                                                                         NA
## `SourceVOA Ting Vit`                                                                                     NA
## `SourceVOA Zimbabwe`                                                                                     NA
## SourceVocativ                                                                                            NA
## SourceVOCM                                                                                               NA
## SourceVogue.co.uk                                                                                        NA
## SourceVogue.com                                                                                          NA
## `SourceVoice & Data Online`                                                                              NA
## `SourceVoice Chronicle`                                                                                  NA
## `SourceVoice of America`                                                                                 NA
## `SourceVoice of America (blog)`                                                                          NA
## `SourceVoice of San Diego`                                                                               NA
## Sourcevoiceofdetroit                                                                                     NA
## `SourceVoltaire Network`                                                                                 NA
## SourceVox                                                                                                NA
## `SourceVR-Zone`                                                                                          NA
## `SourceVR World`                                                                                         NA
## SourceVRFocus                                                                                            NA
## Sourcevtdigger.org                                                                                       NA
## `SourceVulcan Post (press release)`                                                                      NA
## SourceVulture                                                                                            NA
## `SourceW*USA 9`                                                                                          NA
## `SourceWA today`                                                                                         NA
## `SourceWABC-TV`                                                                                          NA
## `SourceWABC-TV New York`                                                                                 NA
## `SourceWABE 90.1 FM`                                                                                     NA
## SourceWACH.com                                                                                           NA
## `SourceWaco Tribune-Herald`                                                                              NA
## `SourceWAFA - Palestine News Agency`                                                                     NA
## SourceWAFF                                                                                               NA
## `SourceWAFF 48 News Huntsville`                                                                          NA
## `SourceWaging Nonviolence`                                                                               NA
## SourceWAGM                                                                                               NA
## `SourceWaikato Times`                                                                                    NA
## Sourcewajr                                                                                               NA
## `SourceWakefield Express`                                                                                NA
## `SourceWakey Wakey News`                                                                                 NA
## `SourceWALB Albany`                                                                                      NA
## SourceWalesOnline                                                                                        NA
## `SourceWall Street 24`                                                                                   NA
## `SourceWall Street Daily`                                                                                NA
## `SourceWall Street Journal`                                                                              NA
## `SourceWall Street Journal (blog)`                                                                       NA
## `SourceWall Street Journal (subscription)`                                                               NA
## `SourceWall Street Journal (subscription) (blog)`                                                        NA
## `SourceWall Street Journal Blogs`                                                                        NA
## `SourceWall Street Pit`                                                                                  NA
## `SourceWalla Walla Union-Bulletin`                                                                       NA
## SourceWaltonian                                                                                          NA
## SourceWAMC                                                                                               NA
## SourceWamda                                                                                              NA
## SourceWAND                                                                                               NA
## `SourceWandsworth Guardian`                                                                              NA
## SourceWANE                                                                                               NA
## SourceWAOW                                                                                               NA
## `SourceWAPT Jackson`                                                                                     NA
## SourceWarc                                                                                               NA
## `SourceWard's Auto`                                                                                      NA
## SourceWareable                                                                                           NA
## `SourceWarsaw Business Journal`                                                                          NA
## `SourceWashington Blade`                                                                                 NA
## `SourceWashington Business Journal`                                                                      NA
## `SourceWashington City Paper`                                                                            NA
## `SourceWashington City Paper (blog)`                                                                     NA
## `SourceWashington Examiner`                                                                              NA
## `SourceWashington Free Beacon`                                                                           NA
## `SourceWashington Free Beacon (blog)`                                                                    NA
## `SourceWashington News Wire`                                                                             NA
## `SourceWashington Post`                                                                           5.969e-01
## `SourceWashington Post (blog)`                                                                           NA
## `SourceWashington Times`                                                                                 NA
## SourceWashingtonian.com                                                                                  NA
## `SourceWaste Management World`                                                                           NA
## Sourcewaste360                                                                                           NA
## SourceWatchdog.org                                                                                       NA
## `SourceWATE 6 On Your Side`                                                                              NA
## `SourceWaterbury Republican American`                                                                    NA
## `SourceWaterloo Cedar Falls Courier`                                                                     NA
## `SourceWaterloo Record`                                                                                  NA
## `SourceWatertown Daily Times`                                                                            NA
## SourceWatertownDailyTimes.com                                                                            NA
## `SourceWausau Daily Herald`                                                                              NA
## `SourceWAVE 3`                                                                                           NA
## `SourceWAVE 3 Louisville`                                                                                NA
## `SourceWAVY-TV`                                                                                          NA
## `SourceWaxahachie Daily Light`                                                                           NA
## `SourceWaynesville Daily Guide`                                                                          NA
## `SourceWBAL-TV Baltimore`                                                                                NA
## `SourceWBAL Baltimore`                                                                                   NA
## `SourceWBAL Radio`                                                                                       NA
## SourceWBAY                                                                                               NA
## SourceWBEZ                                                                                               NA
## `SourceWBEZ 91.5 Chicago`                                                                                NA
## SourceWBFO                                                                                               NA
## `SourceWBIR-TV`                                                                                          NA
## SourceWBIR.com                                                                                           NA
## `SourceWBNS-10TV Columbus`                                                                               NA
## `SourceWBOC TV 16`                                                                                       NA
## `SourceWBOY-TV`                                                                                          NA
## `SourceWBRC FOX6 News - WBRC.com`                                                                        NA
## SourceWBT                                                                                                NA
## SourceWBTV                                                                                               NA
## `SourceWBTV Charlotte`                                                                                   NA
## SourceWBUR                                                                                               NA
## `SourceWBUR Boston`                                                                                      NA
## SourceWBXH                                                                                               NA
## `SourceWCAV Charlottesville`                                                                             NA
## SourceWCAX                                                                                               NA
## `SourceWCAX-TV Vermont`                                                                                  NA
## `SourceWCBD News 2`                                                                                      NA
## SourceWCCFtech                                                                                           NA
## `SourceWCCFtech (blog)`                                                                                  NA
## SourceWCPO                                                                                               NA
## `SourceWCSH-TV`                                                                                          NA
## SourceWCSH6.com                                                                                          NA
## `SourceWCSM Radio`                                                                                       NA
## SourceWCTV                                                                                               NA
## `SourceWCVB Boston`                                                                              -4.504e+15
## SourceWCYB                                                                                               NA
## `SourceWDAM-TV`                                                                                          NA
## SourceWDAY                                                                                               NA
## SourceWDBJ7                                                                                              NA
## `SourceWDIV Detroit`                                                                                     NA
## SourceWDRB                                                                                               NA
## `SourceWDSU New Orleans`                                                                                 NA
## SourceWDTN                                                                                               NA
## SourceWDTV                                                                                               NA
## `SourceWe Got This Covered`                                                                              NA
## `SourceWe Live Security (blog)`                                                                          NA
## `SourceWe Up It`                                                                                         NA
## SourceWeAreGreenBay.com                                                                                  NA
## `SourceWeAreTheCity (press release) (blog)`                                                              NA
## SourceWeatherWatch.co.nz                                                                                 NA
## SourceWEAU                                                                                               NA
## `SourceWEAU Eau Claire`                                                                                  NA
## `SourceWeb Host Industry Review`                                                                         NA
## `SourceWeb India`                                                                                        NA
## SourceWebMD                                                                                              NA
## SourceWebProNews                                                                                         NA
## `SourceWebster Journal`                                                                                  NA
## `SourceWECT-TV6`                                                                                         NA
## `SourceWECT 6 Wilmington`                                                                                NA
## `SourceWeekly Times Now`                                                                                 NA
## `SourceWESH 2 Orlando`                                                                                   NA
## `SourceWESH Orlando`                                                                                     NA
## `SourceWest Central Tribune`                                                                             NA
## `SourceWest Virginia MetroNews`                                                                          NA
## `SourceWestern Advocate`                                                                                 NA
## `SourceWestern Journalism`                                                                               NA
## `SourceWestern Morning News`                                                                             NA
## `SourceWestern Producer (subscription)`                                                                  NA
## `SourceWestern Star`                                                                                     NA
## `SourceWestern Telegraph`                                                                                NA
## SourceWesternSlopeNow                                                                                    NA
## `SourceWestfair Online`                                                                                  NA
## `SourceWestlaw Insider (blog)`                                                                           NA
## `SourceWestside Gazette`                                                                                 NA
## `SourceWestside Today`                                                                                   NA
## `SourceWeyburn Review`                                                                                   NA
## SourceWFAA                                                                                               NA
## SourceWFAA.com                                                                                           NA
## SourceWFDD                                                                                               NA
## `SourceWFLX FOX 29`                                                                                      NA
## SourceWFMJ                                                                                               NA
## `SourceWFMJ Youngstown`                                                                                  NA
## SourceWFMYNews2.com                                                                                      NA
## `SourceWFMZ Allentown`                                                                                   NA
## `SourceWFMZ Eastern Pennsylvania and Western New Jersey`                                                 NA
## SourceWFSB                                                                                               NA
## `SourceWFTV Orlando`                                                                                     NA
## SourceWFXG.com                                                                                           NA
## `SourceWGAL 8 Susquehanna Valley`                                                                        NA
## `SourceWGBA-TV`                                                                                          NA
## SourceWGEM                                                                                               NA
## `SourceWGEM Quincy`                                                                                      NA
## SourceWGME                                                                                               NA
## `SourceWGN-TV`                                                                                           NA
## `SourceWGN Radio`                                                                                        NA
## `SourceWGN TV Chicago`                                                                                   NA
## SourceWGNO                                                                                               NA
## SourceWGRZ.com                                                                                           NA
## `SourceWHAS 11.com (subscription)`                                                                       NA
## SourceWHAS11.com                                                                                         NA
## SourceWhatCulture                                                                                        NA
## SourceWhaTech                                                                                            NA
## `SourceWHDH-TV`                                                                                          NA
## SourceWheels.ca                                                                                          NA
## `SourceWhich-50 (blog)`                                                                                  NA
## `SourceWHIO-TV 7 Dayton`                                                                                 NA
## `SourceWhite House Dossier`                                                                              NA
## `SourceWhitehorse Star (subscription)`                                                                   NA
## `SourceWhitehouse.gov (press release)`                                                                   NA
## `SourceWHNT-TV Huntsville`                                                                               NA
## Sourcewhnt.com                                                                                           NA
## `SourceWHO-TV 13 Des Moines`                                                                             NA
## Sourcewhotv.com                                                                                          NA
## `SourceWhoWhatWhy / RealNewsProject (blog)`                                                              NA
## SourceWHSV                                                                                               NA
## `SourceWhyalla News`                                                                                     NA
## `SourceWIAT 42`                                                                                          NA
## SourceWIBW                                                                                               NA
## `SourceWichita Eagle`                                                                                    NA
## `SourceWicked Local`                                                                                     NA
## `SourceWicked Local Natick`                                                                              NA
## `SourceWicked Local Wellesley`                                                                           NA
## SourceWIFR                                                                                               NA
## `SourceWIFR Rockford`                                                                                    NA
## Sourcewigantoday.net                                                                                     NA
## `SourceWii U Daily`                                                                                      NA
## SourceWikinews                                                                                           NA
## `SourceWillamette Week`                                                                                  NA
## `SourceWilts and Gloucestershire Standard`                                                               NA
## `SourceWILX-TV`                                                                                          NA
## `SourceWILX 10 Lansing`                                                                                  NA
## `SourceWINA AM 1070 (press release)`                                                                     NA
## SourceWinBeta                                                                                            NA
## `SourceWindows Central`                                                                                  NA
## `SourceWindows IT Pro`                                                                                   NA
## `SourceWindows IT Pro (blog)`                                                                            NA
## `SourceWindows Report`                                                                                   NA
## `SourceWindowsItPro (subscription)`                                                                      NA
## `SourceWindowsItPro (subscription) (blog)`                                                               NA
## `SourceWindpower Engineering (press release)`                                                            NA
## `SourceWindsor Star`                                                                                     NA
## `SourceWink News`                                                                                        NA
## `SourceWinnipeg Free Press`                                                                              NA
## `SourceWinnipeg Sun`                                                                                     NA
## `SourceWinona Daily News`                                                                                NA
## `SourceWinston-Salem Chronicle`                                                                          NA
## `SourceWinston-Salem Journal`                                                                            NA
## SourceWIRED                                                                                              NA
## `SourceWired News`                                                                                5.375e+01
## `SourceWired UK`                                                                                         NA
## SourceWired.co.uk                                                                                        NA
## `SourceWireless Week`                                                                                    NA
## SourceWirtschaftsWoche                                                                                   NA
## `SourceWIS News 10 Columbia`                                                                             NA
## `SourceWISC-TV Madison`                                                                                  NA
## `SourceWisconsin Gazette`                                                                                NA
## `SourceWisconsin Public Radio News`                                                                      NA
## `SourceWISH-TV`                                                                                          NA
## `SourceWISH-TV Indianapolis`                                                                             NA
## `SourceWISN 12 Milwaukee`                                                                                NA
## `SourceWISN Milwaukee`                                                                                   NA
## SourceWITN                                                                                               NA
## Sourcewivb.com                                                                                           NA
## `SourceWJBF-TV`                                                                                          NA
## SourceWJLA                                                                                               NA
## SourceWJTV                                                                                               NA
## `SourceWJXT Jacksonville`                                                                        -4.504e+15
## SourceWKBN.com                                                                                           NA
## `SourceWKBW-TV`                                                                                          NA
## SourceWKOW                                                                                               NA
## SourceWKRG                                                                                               NA
## `SourceWKRG News 5 Mobile`                                                                               NA
## `SourceWKSU News`                                                                                        NA
## `SourceWKYC-TV`                                                                                          NA
## SourceWKYT                                                                                               NA
## `SourceWLBT 3 Jackson`                                                                                   NA
## SourceWLBZ2.com                                                                                          NA
## Sourcewlfi.com                                                                                           NA
## `SourceWLKY Louisville`                                                                                  NA
## SourceWLNS                                                                                               NA
## `SourceWLOX-TV Biloxi`                                                                                   NA
## SourceWLRN                                                                                               NA
## `SourceWLS-TV`                                                                                           NA
## `SourceWLWT-TV Cincinnati`                                                                               NA
## `SourceWLWT Cincinnati`                                                                                  NA
## `SourceWMBD - FOX 43 Peoria`                                                                             NA
## `SourceWMBF News Myrtle Beach`                                                                           NA
## `SourceWMC Action News 5`                                                                                NA
## `SourceWMCTV Memphis`                                                                                    NA
## SourceWMPoweruser.com                                                                                    NA
## SourceWMTV                                                                                               NA
## `SourceWMTW Portland`                                                                                    NA
## `SourceWMUR Manchester`                                                                                  NA
## `SourceWN Philippines`                                                                                   NA
## SourceWNAX                                                                                               NA
## SourceWNBA.com                                                                                           NA
## SourceWNCN                                                                                               NA
## SourceWNCT                                                                                               NA
## SourceWND.com                                                                                            NA
## `SourceWNDU-TV`                                                                                          NA
## `SourceWNEP 16 Pennsylvania`                                                                             NA
## Sourcewnep.com                                                                                           NA
## `SourceWNIJ and WNIU`                                                                                    NA
## SourceWNYC                                                                                               NA
## `SourceWNYC New York Public Radio`                                                                       NA
## SourceWNYT                                                                                               NA
## SourceWOAI                                                                                               NA
## SourceWOAI.com                                                                                           NA
## `SourceWonkette (satire) (blog)`                                                                         NA
## `SourceWoodstock Sentinel-Review`                                                                        NA
## SourceWOODTV.com                                                                                         NA
## `SourceWorcester Telegram`                                                                               NA
## `SourceWorkers World`                                                                                    NA
## SourceWorkpermit.com                                                                                     NA
## `SourceWorld Affairs (blog)`                                                                             NA
## `SourceWorld Bank Group`                                                                                 NA
## `SourceWorld Bank Group (blog)`                                                                          NA
## `SourceWorld Fishing`                                                                                    NA
## `SourceWorld Highways`                                                                                   NA
## `SourceWorld Intellectual Property Review (subscription)`                                                NA
## `SourceWorld Nuclear News`                                                                               NA
## `SourceWorld Policy Institute (blog)`                                                                    NA
## `SourceWorld Politics Review`                                                                            NA
## `SourceWorld Socialist Web Site`                                                                         NA
## `SourceWorld Tribune`                                                                                    NA
## SourceWorldcrunch                                                                                        NA
## `SourceWorthing Herald`                                                                                  NA
## `SourceWorthington Daily Globe`                                                                          NA
## `SourceWOWK-TV West Virginia`                                                                            NA
## SourceWOWT                                                                                               NA
## `SourceWPBF West Palm Beach`                                                                             NA
## SourceWPEC                                                                                               NA
## `SourceWPIX 11 New York`                                                                                 NA
## `SourceWPRI 12 Eyewitness News`                                                                          NA
## SourceWPRO                                                                                               NA
## SourceWPTV.com                                                                                           NA
## SourceWPTZ                                                                                               NA
## `SourceWPTZ Burlington`                                                                                  NA
## `SourceWPTZ The Champlain Valley`                                                                        NA
## `SourceWPVI-TV`                                                                                          NA
## `SourceWPVI – Philadelphia via Yahoo! News`                                                              NA
## `SourceWPVI 6abc Philadelphia`                                                                           NA
## `SourceWPXI Pittsburgh`                                                                                  NA
## `SourceWQAD Moline`                                                                                      NA
## SourceWQAD.com                                                                                           NA
## `SourceWQOW Eau Claire`                                                                                  NA
## `SourceWRAL Tech Wire`                                                                                   NA
## SourceWRAL.com                                                                                           NA
## SourceWRBL                                                                                               NA
## `SourceWRCB-TV`                                                                                          NA
## `SourceWRDW-TV`                                                                                          NA
## `SourceWREG-TV Memphis`                                                                                  NA
## Sourcewreg.com                                                                                           NA
## SourceWrestlezone                                                                                        NA
## `SourceWREX-TV`                                                                                          NA
## SourceWRGB                                                                                               NA
## SourceWRIC                                                                                               NA
## `SourceWRTV Indianapolis`                                                                                NA
## `SourceWSAZ-TV`                                                                                          NA
## `SourceWSB Atlanta`                                                                                      NA
## `SourceWSBT-TV`                                                                                          NA
## SourceWSET                                                                                               NA
## `SourceWSFA 12 Montgomery`                                                                               NA
## SourceWSLS                                                                                               NA
## `SourceWSOC Charlotte`                                                                                   NA
## `SourceWSYM-TV`                                                                                          NA
## SourceWSYR                                                                                               NA
## `SourceWT VOX`                                                                                           NA
## `SourceWTAE-TV Pittsburgh`                                                                               NA
## `SourceWTAE Pittsburgh`                                                                                  NA
## SourceWTAJ                                                                                               NA
## SourceWTAW                                                                                               NA
## SourceWTHR                                                                                               NA
## `SourceWTHR Indianapolis`                                                                        -1.287e+04
## `SourceWTKR Norfolk`                                                                                     NA
## Sourcewtkr.com                                                                                           NA
## SourceWTMA                                                                                               NA
## `SourceWTMJ-TV (press release) (registration) (blog)`                                                    NA
## `SourceWTMJ (press release) (subscription) (blog)`                                                       NA
## `SourceWTNH Connecticut News (press release)`                                                            NA
## SourceWTOC                                                                                               NA
## `SourceWTOC 11 Savannah`                                                                                 NA
## SourceWTOK                                                                                               NA
## SourceWTOL.com                                                                                           NA
## SourceWTOP                                                                                               NA
## `SourceWTOV Steubenville`                                                                                NA
## `SourceWTSP 10 News`                                                                                     NA
## SourceWTSP.com                                                                                           NA
## `SourceWTTV CBS4Indy`                                                                                    NA
## SourceWTVA                                                                                               NA
## SourceWTVC                                                                                               NA
## `SourceWTVD-TV`                                                                                          NA
## SourceWTVM                                                                                               NA
## `SourceWTXL ABC 27`                                                                                      NA
## `SourceWUIS 91.9`                                                                                        NA
## SourceWUSA9.com                                                                                          NA
## SourceWVLT                                                                                               NA
## SourceWVTM13                                                                                             NA
## `SourceWVVA Bluefield`                                                                                   NA
## `SourceWVVA TV (registration)`                                                                           NA
## `SourceWWAY NewsChannel 3`                                                                               NA
## `SourceWWBT NBC12 News`                                                                                  NA
## SourceWWD                                                                                                NA
## SourceWWL                                                                                                NA
## Sourcewwlp.com                                                                                           NA
## `SourceWWMT-TV`                                                                                          NA
## `SourceWWNY TV 7`                                                                                        NA
## `SourceWWSB ABC 7`                                                                                       NA
## Sourcewww.breakbulk.com                                                                                  NA
## `Sourcewww.kingstonregion.com/`                                                                          NA
## Sourcewww.worldbulletin.net                                                                              NA
## `SourceWXIA-TV`                                                                                          NA
## `SourceWXII-TV Winston-Salem`                                                                            NA
## SourceWXIX                                                                                               NA
## `SourceWXOW 19 La Crosse`                                                                                NA
## `SourceWXXI News`                                                                                        NA
## SourceWXYZ                                                                                               NA
## `SourceWXYZ-TV Detroit`                                                                                  NA
## `SourceWYFF 4 Greenville`                                                                                NA
## `SourceWyoming Business Report`                                                                          NA
## `SourceWyoming Tribune`                                                                                  NA
## SourceWYTV                                                                                               NA
## `SourceWZZM 13 Grand Rapids`                                                                             NA
## SourceWZZM13.com                                                                                         NA
## `SourceXãLun.com tin tc vit nam 24h cp nht`                                                              NA
## SourceXconomy                                                                                            NA
## `SourceXDA Developers (blog)`                                                                            NA
## SourceXinhua                                                                                             NA
## SourceXXLMAG.COM                                                                                         NA
## `SourceYa Libnan`                                                                                        NA
## `SourceYahoo Autos`                                                                                      NA
## `SourceYahoo Canada Finance - Insight (blog)`                                                            NA
## `SourceYahoo Canada Sports (blog)`                                                                       NA
## `SourceYahoo Celebrity UK`                                                                               NA
## `SourceYahoo Finance`                                                                                    NA
## `SourceYahoo Finance UK`                                                                                 NA
## `SourceYahoo Finance via Yahoo! Finance`                                                                 NA
## `SourceYahoo Finance via Yahoo! News`                                                                    NA
## `SourceYahoo Food`                                                                                       NA
## `SourceYahoo Health`                                                                                     NA
## `SourceYahoo Katie Couric`                                                                               NA
## `SourceYahoo Movies (blog)`                                                                              NA
## `SourceYahoo Music`                                                                                      NA
## `SourceYahoo New Zealand via Yahoo! New Zealand News`                                                    NA
## `SourceYahoo New Zealand via Yahoo!7 News`                                                               NA
## `SourceYahoo News`                                                                                       NA
## `SourceYahoo News Canada (blog)`                                                                         NA
## `SourceYahoo News Digest`                                                                                NA
## `SourceYahoo News UK`                                                                                    NA
## `SourceYahoo News via Yahoo Canada News`                                                                 NA
## `SourceYahoo News via Yahoo UK & Ireland News`                                                           NA
## `SourceYahoo News via Yahoo! News`                                                                       NA
## `SourceYahoo Parenting`                                                                                  NA
## `SourceYahoo Politics`                                                                                   NA
## `SourceYahoo Singapore News`                                                                             NA
## `SourceYahoo Singapore on Tumblr via Yahoo! Singapore News`                                              NA
## `SourceYahoo Sports`                                                                                     NA
## `SourceYahoo Sports (blog)`                                                                              NA
## `SourceYahoo Tech`                                                                                       NA
## `SourceYahoo Tech via Yahoo! News`                                                                       NA
## `SourceYahoo Travel`                                                                                     NA
## `SourceYahoo TV (blog)`                                                                                  NA
## `SourceYahoo! Maktoob News`                                                                              NA
## `SourceYahoo7 and Agencies via Yahoo! New Zealand News`                                                  NA
## `SourceYahoo7 and Agencies via Yahoo!7 News`                                                             NA
## `SourceYahoo7 Finance via Yahoo!7 Finance`                                                               NA
## `SourceYahoo7 News`                                                                                      NA
## `SourceYakima Herald-Republic`                                                                           NA
## `SourceYale Environment 360`                                                                             NA
## `SourceYaleGlobal Online`                                                                                NA
## `SourceYarmouth County Vanguard`                                                                         NA
## `SourceYellowhammer News`                                                                                NA
## `SourceYeni \\u009d\\u009dafak English (press release)`                                                  NA
## `SourceYES! Magazine`                                                                                    NA
## `SourceYeshiva World News`                                                                               NA
## `SourceYibada (English Edition)`                                                                         NA
## `SourceYIBADA English`                                                                                   NA
## `SourceYLE News`                                                                                         NA
## SourceYNaija                                                                                             NA
## SourceYnetnews                                                                                           NA
## `SourceYonhap News`                                                                                      NA
## `SourceYork Daily Record/Sunday News`                                                                    NA
## `SourceYork Dispatch`                                                                                    NA
## `SourceYork Press`                                                                                       NA
## SourceYorkRegion.com                                                                                     NA
## `SourceYorkshire Evening Post`                                                                           NA
## `SourceYorkshire Post`                                                                                   NA
## `SourceYorkton News Review`                                                                              NA
## `SourceYorkton This Week`                                                                                NA
## `SourceYorkton This Week (press release)`                                                                NA
## `SourceYouGov US`                                                                                        NA
## `SourceYoungstown Vindicator`                                                                            NA
## `SourceYour EDM`                                                                                         NA
## `SourceYour Hometown Lima Stations`                                                                      NA
## `SourceYour Houston News`                                                                                NA
## `SourceYour Houston News (blog)`                                                                         NA
## `SourceYour Middle East`                                                                                 NA
## `SourceYour News Now`                                                                                    NA
## Sourceyourcentralvalley.com                                                                              NA
## SourceYourErie                                                                                           NA
## SourceYourStory.com                                                                                      NA
## SourceYourWestValley.com                                                                                 NA
## `SourceYouth Health Magzine`                                                                             NA
## `SourceYouth Ki Awaaz`                                                                                   NA
## SourceYubaNet                                                                                            NA
## SourceYugaTech                                                                                           NA
## `SourceYuma Sun`                                                                                         NA
## `SourceZacks via Yahoo Canada Finance`                                                                   NA
## `SourceZacks via Yahoo UK & Ireland Finance`                                                             NA
## `SourceZacks via Yahoo! Finance`                                                                         NA
## `SourceZacks via Yahoo! Finance India`                                                                   NA
## `SourceZacks via Yahoo! New Zealand Finance`                                                             NA
## `SourceZacks via Yahoo!7 Finance`                                                                        NA
## SourceZacks.com                                                                                          NA
## SourceZap2It                                                                                             NA
## `SourceZawya (registration)`                                                                             NA
## SourceZDNet                                                                                              NA
## `SourceZDNet (blog)`                                                                                     NA
## `SourceZDNet UK`                                                                                         NA
## `SourceZee News`                                                                                         NA
## SourceZergwatch                                                                                          NA
## `SourceZero Hedge`                                                                                       NA
## SourceZIK                                                                                                NA
## `SourceZimbabwe Independent`                                                                             NA
## `SourceZimEye - Zimbabwe News`                                                                           NA
## `SourceZME Science`                                                                                      NA
## SourceZNBC                                                                                               NA
## SourceZolmax                                                                                             NA
##                                                                                                  Std. Error
## (Intercept)                                                                                       1.771e+05
## Topiceconomy                                                                                      1.775e+05
## Topicmicrosoft                                                                                    1.771e+05
## Topicobama                                                                                        6.711e+07
## Topicpalestine                                                                                           NA
## `Source `                                                                                                NA
## `Source/FILM`                                                                                            NA
## `Source+972 Magazine`                                                                                    NA
## `Source\\u009d\\u009d \\u009d\\u009d`                                                                    NA
## Source10News                                                                                             NA
## Source10TV                                                                                               NA
## Source11alive.com                                                                                        NA
## `Source12 News Phoenix`                                                                                  NA
## Source12news.com                                                                                         NA
## Source12NewsNow.Com                                                                                      NA
## `Source1340 WJOL`                                                                                        NA
## `Source13abc Action News`                                                                                NA
## Source13newsnow.com                                                                                      NA
## Source13WMAZ                                                                                             NA
## Source13WMAZ.com                                                                                         NA
## `Source14 News WFIE Evansville`                                                                          NA
## `Source14 WFIE Evansville`                                                                               NA
## `Source19 Action News Cleveland`                                                                         NA
## Source20minutes.fr                                                                                       NA
## Source21Alive                                                                                            NA
## `Source24/7 Wall St.`                                                                                    NA
## `Source24/7 Wall St. via Yahoo! Finance`                                                                 NA
## Source247Sports                                                                                          NA
## Source2paragraphs.com                                                                                    NA
## `Source3ders.org (blog)`                                                                                 NA
## Source3DPrint.com                                                                                        NA
## Source3news                                                                                              NA
## `Source3News NZ`                                                                                         NA
## `Source41 NBC News`                                                                                      NA
## Source4k                                                                                                 NA
## Source4NI                                                                                                NA
## `Source5 Eyewitness News St. Paul`                                                                       NA
## `Source550 KTSA`                                                                                         NA
## `Source570 News`                                                                                         NA
## `Source580 CFRA Radio`                                                                                   NA
## Source5newsonline.com                                                                                    NA
## `Source6 On Your Side`                                                                                   NA
## Source630ched.com                                                                                        NA
## `Source660 News`                                                                                         NA
## `Source680 News`                                                                                         NA
## Source6abc.com                                                                                           NA
## `Source7Online WSVN-TV`                                                                                  NA
## Source7sur7                                                                                              NA
## `Source88Nine Radio Milwaukee (blog)`                                                                    NA
## `Source89.3 KPCC`                                                                                        NA
## `Source89.3 WFPL`                                                                                        NA
## `Source9 News Denver`                                                                                    NA
## `Source9 to 5 Google`                                                                                    NA
## `Source9 to 5 Mac`                                                                                       NA
## `Source9 to 5 Mac (press release)`                                                                       NA
## `Source9&10 News`                                                                                        NA
## `Source93.1 WIBC Indianapolis`                                                                           NA
## Source9NEWS.com                                                                                          NA
## Source9news.com.au                                                                                       NA
## `SourceA.V. Club`                                                                                        NA
## `SourceA.V. Club (blog)`                                                                                 NA
## `SourceA.V. Club Denver/Boulder`                                                                         NA
## `SourceAaj Tv (press release) (blog)`                                                                    NA
## `SourceAAP via Yahoo! New Zealand Finance`                                                               NA
## `SourceAAP via Yahoo! New Zealand News`                                                                  NA
## `SourceAAP via Yahoo!7 Finance`                                                                          NA
## `SourceAAP via Yahoo!7 News`                                                                             NA
## `SourceAbbotsford News (registration) (blog)`                                                            NA
## `SourceABC 13 Houston`                                                                                   NA
## `SourceABC 15 Phoenix`                                                                                   NA
## `SourceABC 26 New Orleans`                                                                               NA
## `SourceABC 6 Providence`                                                                                 NA
## `SourceABC 7 Chicago`                                                                                    NA
## `SourceABC 7 Gulfshore News`                                                                             NA
## `SourceABC Action News Tampa Bay`                                                                        NA
## `SourceABC FOX Montana News`                                                                             NA
## `SourceABC Local`                                                                                        NA
## `SourceABC Montana`                                                                                      NA
## `SourceABC News`                                                                                         NA
## `SourceABC NEWS 4`                                                                                       NA
## `SourceABC News via Yahoo! News`                                                                         NA
## `SourceABC Online`                                                                                       NA
## `SourceABC Online (blog)`                                                                                NA
## SourceABC10.com                                                                                          NA
## `SourceABC11 Raleigh-Durham-Fayetteville`                                                                NA
## `SourceABC12 Mid-Michigan`                                                                               NA
## `SourceABC15 Arizona`                                                                                    NA
## SourceABC17News.com                                                                                      NA
## `SourceABC2 News`                                                                                        NA
## Sourceabc27                                                                                              NA
## SourceABC6OnYourSide.com                                                                                 NA
## Sourceabc7news.com                                                                                       NA
## `SourceAberdeen Press and Journal`                                                                       NA
## `SourceABI Research (press release) (subscription) (blog)`                                               NA
## `SourceAbove the Law`                                                                                    NA
## `SourceABP Live`                                                                                         NA
## `SourceABS-CBNNEWS.com`                                                                                  NA
## `SourceABS CBN News`                                                                                     NA
## `SourceAccess Hollywood`                                                                                 NA
## `SourceAccess Washington`                                                                                NA
## `SourceAccesswire via Yahoo! Finance`                                                                    NA
## `SourceAccounting Today`                                                                                 NA
## `SourceAccuracy in Academia`                                                                             NA
## `SourceAccuracy In Media`                                                                                NA
## `SourceAccuracy In Media (blog)`                                                                         NA
## `SourceACN Newswire via Yahoo! New Zealand Finance`                                                      NA
## `SourceACN Newswire via Yahoo!7 Finance`                                                                 NA
## `SourceAction Forex`                                                                                     NA
## SourceActionNewsJax.com                                                                                  NA
## SourceACTmedia                                                                                           NA
## `SourceActon Institute (blog)`                                                                           NA
## SourceAdAge.com                                                                                          NA
## `SourceAdAge.com (blog)`                                                                                 NA
## SourceAdExchanger                                                                                        NA
## SourceAdNews                                                                                             NA
## `SourceADT Magazine`                                                                                     NA
## `SourceAdvanced Television`                                                                              NA
## SourceAdvisor.ca                                                                                         NA
## SourceAdvocate.com                                                                                       NA
## SourceAdweek                                                                                             NA
## SourceAdWeek                                                                                             NA
## Sourceafaqs                                                                                              NA
## SourceAFKInsider                                                                                         NA
## `SourceAFL-CIO (blog)`                                                                                   NA
## `SourceAFP News via Yahoo! Philippines News`                                                             NA
## `SourceAFP News via Yahoo! Singapore News`                                                               NA
## `SourceAFP Relax News via Yahoo! News`                                                            6.711e+07
## `SourceAFP Relax via Yahoo! Philippines News`                                                     6.711e+07
## `SourceAFP Relax via Yahoo! Singapore News`                                                              NA
## `SourceAFP via Yahoo Maktoob News`                                                                       NA
## `SourceAFP via Yahoo UK & Ireland Finance`                                                               NA
## `SourceAFP via Yahoo UK & Ireland News`                                                                  NA
## `SourceAFP via Yahoo! Finance`                                                                           NA
## `SourceAFP via Yahoo! India News`                                                                 6.711e+07
## `SourceAFP via Yahoo! New Zealand News`                                                                  NA
## `SourceAFP via Yahoo! News`                                                                       6.711e+07
## `SourceAFP via Yahoo! Sports`                                                                            NA
## `SourceAFP via Yahoo!7 Finance`                                                                          NA
## `SourceAFP via Yahoo!7 News`                                                                             NA
## `SourceAfrica Middle East`                                                                               NA
## `SourceAfrican Arguments (registration)`                                                                 NA
## `SourceAfrican Manager (press release) (registration) (blog)`                                            NA
## SourceAfricanews                                                                                         NA
## SourceAfricaNews                                                                                         NA
## `SourceAfricanews (press release)`                                                                       NA
## SourceAfrik.com                                                                                          NA
## SourceAfterDawn                                                                                          NA
## `SourceAG Week`                                                                                          NA
## `SourceAgence France-Presse via Yahoo Canada News`                                                       NA
## SourceAgencySpy                                                                                          NA
## SourceAgenda.ge                                                                                          NA
## SourceAGERPRES                                                                                           NA
## SourceAgoraVox                                                                                           NA
## SourceAgriculture.com                                                                                    NA
## SourceAgriland                                                                                           NA
## SourceAgWeb                                                                                              NA
## `SourceAhlul Bayt News Agency (press release)`                                                           NA
## `SourceAhram Online`                                                                                     NA
## `SourceAir Force Link`                                                                                   NA
## `SourceAir Transport World`                                                                              NA
## `SourceAircraft Maintenance Technology`                                                                  NA
## SourceAirForceTimes.com                                                                                  NA
## `SourceAirline Reporter`                                                                                 NA
## `SourceAJIB.fr L'actualit\\u009d\\u009d de l'Islam et des musulmans en France`                           NA
## `SourceAkron Beacon Journal`                                                                             NA
## `SourceAl-Ahram Weekly`                                                                                  NA
## `SourceAl-Arabiya`                                                                                       NA
## `SourceAl-Arabiya (blog)`                                                                                NA
## `SourceAl-Bawaba`                                                                                        NA
## `SourceAl-Fanar Media`                                                                                   NA
## `SourceAl-Jazeerah.info`                                                                                 NA
## `SourceAl-Manar TV`                                                                                      NA
## `SourceAl-Monitor`                                                                                       NA
## `SourceAl-Resalah`                                                                                       NA
## `SourceAl Bawaba`                                                                                        NA
## `SourceAl Huffington Post`                                                                               NA
## `SourceAl Jazeera America`                                                                               NA
## `SourceAl Jazeera via Yahoo Maktoob News`                                                                NA
## `SourceAl Jazeera via Yahoo UK & Ireland News`                                                           NA
## SourceAL.com                                                                                             NA
## `SourceAlabama's News Leader`                                                                            NA
## `SourceAlabama NewsCenter`                                                                               NA
## `SourceAlaska Dispatch News`                                                                             NA
## `SourceAlaska Public Radio Network`                                                                      NA
## `SourceAlbanian Daily News`                                                                              NA
## `SourceAlbany Business Review`                                                                           NA
## `SourceAlbany Democrat Herald`                                                                           NA
## `SourceAlbany Times Union`                                                                               NA
## `SourceAlbany Times Union (blog)`                                                                        NA
## `SourceAlberni Valley News`                                                                              NA
## `SourceAlberta Daily Herald Tribune`                                                                     NA
## `SourceAlbuquerque Business First (blog)`                                                                NA
## `SourceAlbuquerque Journal`                                                                              NA
## `SourceAlex News (blog)`                                                                                 NA
## `SourceAlexandria Town Talk`                                                                             NA
## `SourceAlg\\u009d\\u009drie Presse Service`                                                              NA
## SourceAlgemeiner                                                                                         NA
## `Sourcealgerie-focus.com`                                                                                NA
## `SourceAlgérie Presse Service`                                                                           NA
## `SourceAliran Monthly`                                                                                   NA
## `SourceAliran Online`                                                                                    NA
## SourceAljazeera.com                                                                                      NA
## `SourceAljazeera.com (blog)`                                                                             NA
## `SourceAll About Hawke's Bay`                                                                            NA
## SourceAllAfrica.com                                                                                      NA
## `SourceAllCoinsNews.com (blog)`                                                                          NA
## `SourceAllentown Morning Call`                                                                           NA
## SourceAllGov                                                                                             NA
## `SourceAllure Magazine (blog)`                                                                           NA
## SourceAlphr                                                                                              NA
## `SourceAltEnergyMag (press release)`                                                                     NA
## `SourceAlternative Information Center (AIC)`                                                             NA
## `SourceAlternative Information Center (AIC) (blog)`                                                      NA
## SourceAlterNet                                                                                           NA
## `SourceAlton Telegraph`                                                                                  NA
## `SourceAlyaexpress-News`                                                                                 NA
## `SourceAmarillo Globe-News`                                                                              NA
## SourceAmarillo.com                                                                                       NA
## `SourceAmazinessNet (blog)`                                                                              NA
## SourceAMEinfo                                                                                            NA
## `SourceAmerica Magazine`                                                                                 NA
## `SourceAmerican Action Forum (blog)`                                                                     NA
## `SourceAmerican Banker`                                                                                  NA
## `SourceAmerican Center for Law and Justice (blog)`                                                       NA
## `SourceAmerican Enterprise Institute`                                                                    NA
## `SourceAmerican Free Press`                                                                              NA
## `SourceAmerican Journal of Transportation`                                                               NA
## `SourceAmerican Kennel Club (blog)`                                                                      NA
## `SourceAmerican Libraries (blog)`                                                                        NA
## `SourceAmerican Spectator`                                                                               NA
## `SourceAmerican Spectator (blog)`                                                                        NA
## `SourceAmerican Thinker`                                                                                 NA
## `SourceAmerican Thinker (blog)`                                                                          NA
## `SourceAmerican Trade Journal`                                                                           NA
## `SourceAmericans for Tax Reform (blog)`                                                                  NA
## `SourceAmericas Quarterly`                                                                               NA
## `SourceAmericas Quarterly (blog)`                                                                        NA
## SourceAmeriPublications                                                                                  NA
## `SourceAmes Tribune`                                                                                     NA
## SourceAmigobulls                                                                                         NA
## `SourceAmmoLand Shooting Sports News`                                                                    NA
## SourceamNewYork                                                                                          NA
## SourceamNY                                                                                               NA
## `SourceAn Phoblacht`                                                                                     NA
## `SourceAnadolu Agency`                                                                                   NA
## SourceAnandTech                                                                                          NA
## SourceAnarkismo.net                                                                                      NA
## `SourceAnchorage Daily News`                                                                             NA
## `SourceAndean Airmail & PERUVIAN TIMES`                                                                  NA
## `SourceAnderson Independent Mail`                                                                        NA
## `SourceAndroid Authority (blog)`                                                                         NA
## `SourceAndroid Central`                                                                                  NA
## `SourceAndroid Community`                                                                                NA
## `SourceAndroid Headlines - Android News`                                                                 NA
## `SourceAndroid Police`                                                                                   NA
## SourceAndroidOrigin                                                                                      NA
## `SourceAndroidPIT US (blog)`                                                                             NA
## SourceAngolaPress                                                                                        NA
## `SourceANI via Yahoo! India News`                                                                        NA
## `SourceAnimation World Network`                                                                          NA
## `SourceAnime News Network`                                                                               NA
## SourceANINEWS                                                                                            NA
## SourceAnorak                                                                                             NA
## `SourceANSA (registration)`                                                                              NA
## SourceANSAmed                                                                                            NA
## SourceANTARA                                                                                             NA
## `SourceAntigua Observer`                                                                                 NA
## SourceAntiwar.com                                                                                        NA
## `SourceAntiwar.com (blog)`                                                                               NA
## `SourceAOL Money UK`                                                                                     NA
## `SourceAOL News`                                                                                         NA
## `SourceAP S\\u009d\\u009dn\\u009d\\u009dgalaise`                                                         NA
## `SourceAP via Yahoo! New Zealand News`                                                                   NA
## `SourceAP via Yahoo!7 News`                                                                              NA
## SourceAPA                                                                                                NA
## `SourceAPEX Media`                                                                                       NA
## SourceAppAdvice                                                                                          NA
## `SourceAppeal-Democrat`                                                                                  NA
## `SourceApple Insider`                                                                                    NA
## `SourceAppleInsider (press release) (blog)`                                                              NA
## `SourceAppleton Post Crescent`                                                                           NA
## `SourceArab American News`                                                                               NA
## `SourceArab News`                                                                                        NA
## `SourceArab News via Yahoo Maktoob News`                                                                 NA
## `SourceArab Times Kuwait English Daily`                                                                  NA
## SourceArabianBusiness.com                                                                                NA
## SourceARC                                                                                                NA
## SourceArchinect                                                                                          NA
## `SourceArchitectural Digest`                                                                             NA
## SourceArcticStartup                                                                                      NA
## `SourceArizona Capitol Times`                                                                            NA
## `SourceArizona Daily Star`                                                                               NA
## `SourceArizona Daily Sun`                                                                                NA
## `SourceArkansas Business`                                                                                NA
## `SourceArkansas Democrat-Gazette`                                                                        NA
## `SourceArkansas News`                                                                                    NA
## `SourceArkansas Online`                                                                                  NA
## SourceArmeniaNow.com                                                                                     NA
## SourceArmenpress.am                                                                                      NA
## SourceArmyTimes.com                                                                                      NA
## SourceARNnet                                                                                             NA
## `SourceAround the Rings (subscription)`                                                                  NA
## `SourceArs Technica`                                                                              2.166e+03
## `SourceArs Technica UK`                                                                                  NA
## `SourceArt Newspaper`                                                                                    NA
## `SourceArtesia Daily Press`                                                                              NA
## SourceArtforum                                                                                           NA
## SourceArtLyst                                                                                            NA
## `Sourceartnet News`                                                                                      NA
## `SourceArtslink.co.za News (press release)`                                                              NA
## `SourceArutz Sheva`                                                                                      NA
## `SourceAS/COA Online`                                                                                    NA
## `SourceAsahi Shimbun`                                                                                    NA
## SourceAsahi.com                                                                                          NA
## `SourceAsbarez Armenian News`                                                                            NA
## `SourceAsbury Park Press`                                                                                NA
## `SourceAsharq Al-awsat (blog)`                                                                           NA
## `SourceAsharq Al-awsat English`                                                                          NA
## `SourceAsharq Alawsat`                                                                                   NA
## `SourceAsheboro Courier Tribune`                                                                         NA
## `SourceAsheville Citizen-Times`                                                                          NA
## `SourceAsia Pacific Report`                                                                              NA
## `SourceAsia Society`                                                                                     NA
## `SourceAsia Society (blog)`                                                                              NA
## `SourceAsia Times`                                                                                       NA
## `SourceAsian Correspondent`                                                                              NA
## `SourceAsian Image`                                                                                      NA
## `SourceAsian Tribune`                                                                                    NA
## SourceAsiaNews.it                                                                                        NA
## SourceAsiaOne                                                                                            NA
## `SourceAspen Times`                                                                                      NA
## `SourceAssociated Press of Pakistan`                                                                     NA
## `SourceAssociated Press via Yahoo Maktoob News`                                                          NA
## `SourceAssociated Press via Yahoo UK & Ireland Finance`                                                  NA
## `SourceAssociated Press via Yahoo UK & Ireland News`                                                     NA
## `SourceAssociated Press via Yahoo! Finance`                                                       2.036e+03
## `SourceAssociated Press via Yahoo! Finance India`                                                        NA
## `SourceAssociated Press via Yahoo! India News`                                                           NA
## `SourceAssociated Press via Yahoo! New Zealand Finance`                                                  NA
## `SourceAssociated Press via Yahoo! News`                                                          2.284e+03
## `SourceAssociated Press via Yahoo! Philippines News`                                                     NA
## `SourceAssociated Press via Yahoo! Philippines Sports`                                                   NA
## `SourceAssociated Press via Yahoo! Singapore News`                                                       NA
## `SourceAssociated Press via Yahoo! Singapore Sports`                                                     NA
## `SourceAssociated Press via Yahoo!7 Finance`                                                             NA
## `SourceAssociation France Palestine Solidarit\\u009d\\u009d`                                             NA
## `SourceAssociation France Palestine Solidarité`                                                          NA
## `SourceAstana Times`                                                                                     NA
## `SourceAstro Awani`                                                                                      NA
## `SourceAthens Banner-Herald`                                                                             NA
## `SourceAthens Daily Review`                                                                              NA
## `SourceAtlanta Black Star`                                                                               NA
## `SourceAtlanta Business Chronicle`                                                                       NA
## `SourceAtlanta Intown`                                                                                   NA
## `SourceAtlanta Journal-Constitution`                                                                     NA
## `SourceAtlanta Journal Constitution`                                                                     NA
## `SourceAtlanta Journal Constitution (blog)`                                                              NA
## `SourceAtlas Obscura`                                                                                    NA
## `SourceAttack of the Fanboy`                                                                             NA
## SourceATTN                                                                                               NA
## SourceATWOnline                                                                                          NA
## `SourceAuburn Citizen`                                                                                   NA
## `SourceAuburn Citizen (blog)`                                                                            NA
## `SourceAuckland stuff.co.nz`                                                                             NA
## `SourceAugusta Free Press`                                                                               NA
## SourceAusdroid                                                                                           NA
## `SourceAustin American-Statesman`                                                                        NA
## `SourceAustin Business Journal`                                                                          NA
## `SourceAustin Chronicle`                                                                                 NA
## `SourceAustin Inno`                                                                                      NA
## `SourceAustralia-Israel Jewish Affairs Council`                                                          NA
## `SourceAustralia Network News`                                                                           NA
## `SourceAustralian Aviation`                                                                              NA
## `SourceAustralian Broadcasting Corporation`                                                              NA
## `SourceAustralian Business Traveller`                                                                    NA
## `SourceAustralian FourFourTwo`                                                                           NA
## `SourceAustralian Jewish News`                                                                           NA
## `SourceAustralian Policy Online`                                                                         NA
## `SourceAutoblog (blog)`                                                                                  NA
## SourceAutocar                                                                                            NA
## `SourceAutocar India`                                                                                    NA
## Sourceautoevolution                                                                                      NA
## SourceAutoExpress                                                                                        NA
## SourceAutoGuide.com                                                                                      NA
## `SourceAutomation World`                                                                                 NA
## `SourceAutomotive News`                                                                                  NA
## `SourceAutomotive News Europe (registration)`                                                            NA
## `SourceAutomotiveIT International`                                                                       NA
## SourceAutooMobile.com                                                                                    NA
## SourceAutoweek                                                                                           NA
## `SourceAviation Week`                                                                                    NA
## SourceAviationPros.com                                                                                   NA
## `SourceAwful Announcing`                                                                                 NA
## `SourceAxis of Logic`                                                                                    NA
## Sourceazcentral.com                                                                                      NA
## SourceAzerNews                                                                                           NA
## SourceAZFamily                                                                                           NA
## `SourceB\\u009d\\u009do D\\u009d\\u009dn Vit`                                                            NA
## `SourceB2B Marketing Online`                                                                             NA
## SourceB92                                                                                                NA
## `SourceBABW News`                                                                                        NA
## `SourceBahamas Tribune`                                                                                  NA
## `SourceBahrain News Agency`                                                                              NA
## `SourceBalitang America`                                                                                 NA
## `SourceBalkan Insight`                                                                                   NA
## `SourceBalkans.com Business News`                                                                        NA
## `SourceBaltic Times`                                                                                     NA
## `SourceBaltimore Business Journal (blog)`                                                                NA
## `SourceBaltimore Sun`                                                                                    NA
## `SourceBaltimore Sun (blog)`                                                                             NA
## SourceBaltimoreRavens.com                                                                                NA
## `SourceBangalore Mirror`                                                                                 NA
## `SourceBangkok Post`                                                                                     NA
## `SourceBangladesh News 24 hours`                                                                         NA
## `SourceBangor Daily News`                                                                                NA
## `SourceBank of Canada`                                                                                   NA
## `SourceBanking Technology`                                                                               NA
## SourceBankrate.com                                                                                       NA
## `SourceBankrate.com via Yahoo Canada Finance`                                                            NA
## `SourceBankrate.com via Yahoo! Finance`                                                                  NA
## `SourceBarbados Advocate`                                                                                NA
## `SourceBarca Blaugranes (blog)`                                                                          NA
## `SourceBarre Montpelier Times Argus`                                                                     NA
## `SourceBarron's`                                                                                         NA
## `SourceBarron's (blog)`                                                                                  NA
## `SourceBarron&#39;s Online`                                                                              NA
## SourceBaseline                                                                                           NA
## `SourceBaseline (blog)`                                                                                  NA
## `SourceBasic Income News`                                                                                NA
## `SourceBasingstoke Gazette`                                                                              NA
## `SourceBasta !`                                                                                          NA
## `SourceBath Chronicle`                                                                                   NA
## `SourceBattle Creek Enquirer`                                                                            NA
## `SourceBaxter Bulletin`                                                                                  NA
## `SourceBay Area Indymedia`                                                                               NA
## `SourceBay News 9`                                                                                       NA
## `SourceBay Today`                                                                                        NA
## `SourceBaytown Sun`                                                                                      NA
## `SourceBBC News`                                                                                  6.711e+07
## `SourceBBC NI`                                                                                           NA
## `SourceBBC Sport`                                                                                        NA
## `SourceBBC world`                                                                                        NA
## SourceBCBusiness                                                                                         NA
## SourceBDlive                                                                                             NA
## `SourceBeacon Examiner`                                                                                  NA
## SourceBeanstockd                                                                                         NA
## `SourceBearing Arms`                                                                                     NA
## `SourceBeatrice Daily Sun`                                                                               NA
## `SourceBeaumont Enterprise`                                                                              NA
## `SourceBecker's Hospital Review`                                                                         NA
## `SourceBecker's Orthopedic & Spine`                                                                      NA
## `SourceBeckley Register-Herald`                                                                          NA
## `SourceBedford Today`                                                                                    NA
## `SourceBeef Magazine (blog)`                                                                             NA
## `SourceBelarus Digest`                                                                                   NA
## `SourceBelarus News (BelTA)`                                                                             NA
## `SourceBelfast Newsletter`                                                                               NA
## `SourceBelfast Telegraph`                                                                                NA
## `SourceBella Naija`                                                                                      NA
## SourceBellaciao                                                                                          NA
## `SourceBelleville News-Democrat`                                                                         NA
## `SourceBellevue Reporter`                                                                                NA
## `SourceBeloit Daily News`                                                                                NA
## `SourceBenchmark Monitor`                                                                                NA
## `SourceBend Bulletin`                                                                                    NA
## `SourceBenefits Canada`                                                                                  NA
## `SourceBenton Evening News`                                                                              NA
## SourceBenzinga                                                                                           NA
## `SourceBenzinga via Yahoo! Finance`                                                                      NA
## `SourceBerkshire Eagle (subscription)`                                                                   NA
## SourceBernama                                                                                            NA
## SourceBernews                                                                                            NA
## `SourceBerwick Advertiser`                                                                               NA
## `SourceBerwick Today`                                                                                    NA
## SourceBET                                                                                                NA
## `SourceBET (blog)`                                                                                       NA
## SourceBetaBoston                                                                                         NA
## SourceBetaKit                                                                                            NA
## SourceBetaNews                                                                                    6.711e+07
## SourceBGR                                                                                                NA
## `SourceBGR India`                                                                                        NA
## `SourceBGR News via Yahoo! News`                                                                  2.005e+03
## `SourceBharat Press`                                                                                     NA
## `SourceBharat Times`                                                                                     NA
## `SourceBi-College News`                                                                                  NA
## `SourceBidness ETC`                                                                                      NA
## `SourceBig Island Now`                                                                                   NA
## `SourceBig Issue`                                                                                        NA
## `SourceBig News Network.com`                                                                             NA
## `SourceBig Think`                                                                                        NA
## `SourceBig Think (blog)`                                                                                 NA
## `SourceBigPond News`                                                                                     NA
## `SourceBigPond Sport`                                                                                    NA
## SourceBILD                                                                                               NA
## SourceBillboard                                                                                          NA
## `SourceBillings Gazette`                                                                                 NA
## SourceBillMoyers.com                                                                                     NA
## SourceBiography                                                                                          NA
## `SourceBiomass Magazine`                                                                                 NA
## `SourceBiometric Update`                                                                                 NA
## `SourceBirmingham Business Journal`                                                                      NA
## `SourceBirmingham Mail`                                                                                  NA
## `SourceBirmingham Post`                                                                                  NA
## `SourceBismarck Tribune`                                                                                 NA
## SourceBisnow                                                                                             NA
## `Sourcebit-tech.net`                                                                                     NA
## SourceBitbag                                                                                             NA
## `SourceBitcoin Magazine`                                                                                 NA
## SourceBitcoinist.net                                                                                     NA
## `SourcebizEDGE NZ`                                                                                       NA
## SourceBizNews                                                                                            NA
## `SourceBizPac Review`                                                                                    NA
## SourceBizReport                                                                                          NA
## `SourceBizTech Magazine`                                                                                 NA
## `SourceBizTimes.com (Milwaukee)`                                                                         NA
## SourceBLABBERMOUTH.NET                                                                                   NA
## `SourceBlack Agenda Report`                                                                              NA
## `SourceBlack Enterprise`                                                                                 NA
## `SourceBlack Mountain News`                                                                              NA
## SourceBlackburnNews.com                                                                                  NA
## `SourceBlackmore Vale Magazine`                                                                          NA
## SourceBlackNews.com                                                                                      NA
## `SourceBlackNews.com (press release)`                                                                    NA
## `SourceBlasting News`                                                                                    NA
## SourceBlastr                                                                                             NA
## `SourceBleacher Report`                                                                                  NA
## `SourceBleeding Cool News`                                                                               NA
## SourceBlic                                                                                               NA
## `SourceBlockchain News`                                                                                  NA
## `SourceBlogging Censorship`                                                                              NA
## `SourceBloody Disgusting`                                                                                NA
## SourceBloomberg                                                                                   4.745e+07
## `SourceBloomberg Big Law Business`                                                                       NA
## `SourceBloomberg BNA`                                                                                    NA
## `SourceBloomberg Government (blog)`                                                                      NA
## `SourceBloomberg via Yahoo UK & Ireland Finance`                                                         NA
## `SourceBloomberg via Yahoo! Finance`                                                                     NA
## `SourceBloomberg via Yahoo! Finance India`                                                               NA
## `SourceBloomberg via Yahoo! New Zealand Finance`                                                         NA
## `SourceBloomberg via Yahoo!7 Finance`                                                                    NA
## `SourceBloomberg View`                                                                                   NA
## `SourceBloomer Advance (subscription)`                                                                   NA
## `SourceBloomington Pantagraph`                                                                           NA
## SourceBlorge                                                                                             NA
## `SourceBlue Nation Review`                                                                               NA
## `SourceBluefield Daily Telegraph`                                                                        NA
## `SourceBluffton Today`                                                                                   NA
## `SourceBMWBLOG (blog)`                                                                                   NA
## SourceBnet.com.au                                                                                        NA
## Sourcebnn.ca                                                                                             NA
## `SourceBNO News`                                                                                         NA
## `SourceBob Sullivan.net`                                                                                 NA
## `SourceBobsguide (press release)`                                                                        NA
## `SourceBoing Boing`                                                                                      NA
## `SourceBonham Journal`                                                                                   NA
## `SourceBonner County Daily Bee`                                                                          NA
## `SourceBooks LIVE (blog)`                                                                                NA
## SourceBorderstan                                                                                         NA
## SourceBostInno                                                                                           NA
## `SourceBoston Business Journal`                                                                          NA
## `SourceBoston Business Journal (blog)`                                                                   NA
## `SourceBoston Herald`                                                                                    NA
## `SourceBoston Review`                                                                                    NA
## SourceBoston.com                                                                                         NA
## `SourceBoulder Daily Camera`                                                                             NA
## `SourceBoulder Weekly`                                                                                   NA
## `SourceBournemouth Echo`                                                                                 NA
## `SourceBowling Green Daily News`                                                                         NA
## SourceBoxscore                                                                                           NA
## `SourceBrad Jones, Digital Trends via Yahoo! News`                                                       NA
## `SourceBradenton Herald`                                                                                 NA
## `SourceBradford Telegraph`                                                                               NA
## `SourceBradford Telegraph and Argus`                                                                     NA
## `SourceBrampton Guardian`                                                                                NA
## `SourceBrandon Sun`                                                                                      NA
## `SourceBrattleboro Reformer`                                                                             NA
## `SourceBrave New Coin`                                                                                   NA
## `SourceBrazil-Arab News Agency (ANBA)`                                                                   NA
## `SourceBreaking Belize News (blog)`                                                                      NA
## `SourceBreaking Israel News`                                                                             NA
## SourceBreakingNews.com                                                                                   NA
## SourceBreakingNews.ie                                                                                    NA
## SourceBreakingviews                                                                                      NA
## SourceBREATHEcast                                                                                        NA
## `SourceBreitbart News`                                                                                   NA
## `SourceBretton Woods Observer`                                                                           NA
## `SourceBrian Madden (blog)`                                                                              NA
## `SourceBrides.com (blog)`                                                                                NA
## `SourceBriefing.com via Yahoo! Finance`                                                                  NA
## SourceBright                                                                                             NA
## `SourceBright Green`                                                                                     NA
## `SourceBrisbane Times`                                                                                   NA
## `SourceBristol Herald Courier`                                                                           NA
## `SourceBristol Herald Courier (press release) (blog)`                                                    NA
## `SourceBristol Post`                                                                                     NA
## `SourceBristol Press`                                                                                    NA
## `SourceBritish Journal of Photography`                                                                   NA
## `SourceBroadband TV News`                                                                                NA
## SourceBroadcaster                                                                                        NA
## `SourceBroadcasting & Cable`                                                                             NA
## SourceBroadly                                                                                            NA
## `SourceBrookings Institution`                                                                            NA
## `SourceBrookings Institution (blog)`                                                                     NA
## `SourceBrookson (press release) (blog)`                                                                  NA
## `SourceBrown County Democrat`                                                                            NA
## `SourceBrownwood Bulletin`                                                                               NA
## SourceBruDirect.com                                                                                      NA
## `SourceBryan-College Station Eagle`                                                                      NA
## SourceBT.com                                                                                             NA
## `SourceBU Today`                                                                                         NA
## `SourceBuckingham Advertiser`                                                                            NA
## SourceBucks.com                                                                                          NA
## `SourceBudapest Business Journal`                                                                        NA
## `SourceBudapest Times`                                                                                   NA
## `SourceBuenos Aires Herald`                                                                              NA
## `SourceBuffalo Business First`                                                                           NA
## `SourceBuffalo News`                                                                                     NA
## `SourceBuilder Magazine`                                                                                 NA
## `SourceBullard Banner News`                                                                              NA
## `SourceBulletin of the Atomic Scientists`                                                                NA
## `SourceBunbury Mail`                                                                                     NA
## `SourceBundaberg News Mail`                                                                              NA
## `SourceBurlington County Times (subscription)`                                                           NA
## `SourceBurlington Times News`                                                                            NA
## SourceBurlingtonFreePress.com                                                                            NA
## `SourceBusiness 2 Community`                                                                             NA
## `SourceBusiness Cloud News`                                                                              NA
## `SourceBusiness Cornwall Magazine`                                                                       NA
## `SourceBusiness Finance News`                                                                            NA
## `SourceBusiness Green`                                                                                   NA
## `SourceBusiness Green (blog)`                                                                            NA
## `SourceBusiness In Savannah`                                                                             NA
## `SourceBusiness in Vancouver`                                                                            NA
## `SourceBusiness Insider`                                                                          1.900e+03
## `SourceBusiness Insider Australia`                                                                       NA
## `SourceBusiness Insider Nordic`                                                                          NA
## `SourceBusiness Insider UK`                                                                              NA
## `SourceBusiness Insider UK Finance via Yahoo Canada Finance`                                      1.532e+04
## `SourceBusiness Insider UK Finance via Yahoo UK & Ireland Finance`                                1.794e+04
## `SourceBusiness Insider UK Finance via Yahoo! Finance India`                                             NA
## `SourceBusiness Insider via Yahoo Canada Finance`                                                        NA
## `SourceBusiness Insider via Yahoo Maktoob News`                                                          NA
## `SourceBusiness Insider via Yahoo UK & Ireland Finance`                                                  NA
## `SourceBusiness Insider via Yahoo! Finance`                                                       3.355e+07
## `SourceBusiness Insider via Yahoo! Finance India`                                                        NA
## `SourceBusiness Insider via Yahoo! India News`                                                           NA
## `SourceBusiness Insurance`                                                                               NA
## `SourceBusiness Management Daily`                                                                        NA
## `SourceBusiness MattersBusiness Matters`                                                                 NA
## `SourceBusiness Mirror`                                                                                  NA
## `SourceBusiness News`                                                                                    NA
## `SourceBusiness News Americas`                                                                           NA
## `SourceBusiness News Americas (subscription)`                                                            NA
## `SourceBusiness News Daily`                                                                              NA
## `SourceBusiness News Wales (press release)`                                                              NA
## `SourceBusiness Recorder`                                                                                NA
## `SourceBusiness Recorder (press release) (registration) (blog)`                                          NA
## `SourceBusiness Reporter`                                                                                NA
## `SourceBusiness Review`                                                                                  NA
## `SourceBusiness Solutions Magazine`                                                                      NA
## `SourceBusiness Spectator`                                                                               NA
## `SourceBusiness Standard`                                                                                NA
## `SourceBusiness Standard (press release) (registration) (blog)`                                          NA
## `SourceBusiness Standard India`                                                                          NA
## `SourceBusiness Times of Western Colorado`                                                               NA
## `SourceBusiness Today`                                                                                   NA
## `SourceBusiness Travel News`                                                                             NA
## `SourceBusiness Traveller`                                                                               NA
## `SourceBusiness Weekly`                                                                                  NA
## `SourceBusiness Wire`                                                                                    NA
## `SourceBusiness Wire (press release)`                                                                    NA
## `SourceBusiness Wire via Yahoo Canada Finance`                                                           NA
## `SourceBusiness Wire via Yahoo UK & Ireland Finance`                                                     NA
## `SourceBusiness Wire via Yahoo! Finance`                                                                 NA
## `SourceBusiness Wire via Yahoo! Finance India`                                                           NA
## `SourceBusiness Wire via Yahoo! New Zealand Finance`                                                     NA
## SourceBusiness.com                                                                                       NA
## SourceBusinessBecause                                                                                    NA
## SourceBusinessDay                                                                                        NA
## `SourceBusinessDesk via Yahoo! New Zealand Finance`                                                      NA
## `SourceBusinessinsider India`                                                                            NA
## SourceBusinessKorea                                                                                      NA
## SourceBusinessNorth.com                                                                                  NA
## SourceBusinessTech                                                                                       NA
## `SourceBusinessWorld Online`                                                                             NA
## `SourceBusinessWorld Online Edition`                                                                     NA
## SourceBustle                                                                                             NA
## `SourceBuying Business Travel`                                                                           NA
## `SourceBuzzFeed News`                                                                                    NA
## SourceBwog                                                                                               NA
## `SourceByron Shire News`                                                                                 NA
## SourceCainTV                                                                                             NA
## `SourceCaixin Media`                                                                                     NA
## `SourceCalcutta News`                                                                                    NA
## `SourceCalcutta Telegraph`                                                                               NA
## `SourceCalgary Herald`                                                                                   NA
## `SourceCalgary Sun`                                                                                      NA
## `SourceCalifornia Economy Reporting`                                                                     NA
## `SourceCambridge Community Television`                                                                   NA
## `SourceCambridge Evening News`                                                                           NA
## `SourceCambridge News`                                                                                   NA
## `SourceCampaign Asia-Pacific`                                                                            NA
## SourceCampaignLive                                                                                       NA
## `SourceCampus Reform`                                                                                    NA
## `SourceCampus Technology`                                                                                NA
## `SourceCampus Watch`                                                                                     NA
## `SourceCanada Free Press`                                                                                NA
## `SourceCanada NewsWire (press release)`                                                                  NA
## `SourceCanada Politics via Yahoo Canada News`                                                            NA
## SourceCanada.com                                                                                         NA
## `SourceCanadian HR Reporter`                                                                             NA
## `SourceCanadian Jewish News`                                                                             NA
## `SourceCanadian Jewish News (blog)`                                                                      NA
## `SourceCanadian Mining Journal`                                                                          NA
## `SourceCanadian Mortgage Broker News`                                                                    NA
## `SourceCanadian Reviewer`                                                                                NA
## SourceCanadianBusiness.com                                                                               NA
## `SourceCanadianBusiness.com (blog)`                                                                      NA
## `SourceCanberra Times`                                                                                   NA
## SourceCanoe                                                                                       1.952e+03
## `SourceCAPA - Centre for Aviation`                                                                       NA
## `SourceCape Breton Post`                                                                                 NA
## `SourceCape Business News`                                                                               NA
## `SourceCape Business News South Africa Business`                                                         NA
## SourceCapeTalk                                                                                           NA
## `SourceCapital City Weekly`                                                                              NA
## `SourceCapital FM Kenya (press release) (blog)`                                                          NA
## `SourceCapital Public Radio News`                                                                        NA
## `SourceCapital.gr (press release)`                                                                       NA
## SourceCapitalGazette.com                                                                                 NA
## `SourceCar and Driver (blog)`                                                                            NA
## SourceCarAdvice                                                                                          NA
## `SourceCarbon Brief`                                                                                     NA
## `SourceCarbonated.tv (blog)`                                                                             NA
## SourceCarBuzz                                                                                            NA
## SourceCardPlayer.com                                                                                     NA
## SourceCare2.com                                                                                          NA
## `SourceCaribbean360.com (subscription)`                                                                  NA
## `SourceCarlisle Sentinel`                                                                                NA
## `SourceCarlsbad Current-Argus`                                                                           NA
## `SourceCarnegie Endowment for International Peace`                                                       NA
## `SourceCarnegie Europe`                                                                                  NA
## SourceCarolinacoastonline                                                                                NA
## `SourceCarroll County Times`                                                                             NA
## `SourceCarscoops (blog)`                                                                                 NA
## `SourceCarteret County News-Times`                                                                       NA
## `SourceCasper Star-Tribune Online`                                                                       NA
## SourceCastanet.net                                                                                       NA
## `SourceCatch News`                                                                                       NA
## `SourceCatholic Culture`                                                                                 NA
## `SourceCatholic Herald`                                                                                  NA
## `SourceCatholic Herald Online`                                                                           NA
## `SourceCatholic New York`                                                                                NA
## `SourceCatholic News Agency`                                                                             NA
## `SourceCatholic News Service`                                                                            NA
## `SourceCatholic Online`                                                                                  NA
## `SourceCatholic University of America The Tower`                                                         NA
## `SourceCato Institute`                                                                                   NA
## `SourceCato Institute (blog)`                                                                            NA
## `SourceCayman Compass (press release) (registration)`                                                    NA
## `SourceCayman News Service`                                                                              NA
## `SourceCBBC Newsround`                                                                                   NA
## `SourceCBC Edmonton`                                                                                     NA
## `SourceCBC Montreal`                                                                                     NA
## `SourceCBC Newfoundland and Labrador`                                                                    NA
## `SourceCBC via Yahoo Canada News`                                                                        NA
## SourceCBC.ca                                                                                             NA
## `SourceCBS 19 Tyler`                                                                                     NA
## `SourceCBS 2 Los Angeles`                                                                                NA
## `SourceCBS 46 News Atlanta`                                                                              NA
## `SourceCBS 5 Phoenix`                                                                                    NA
## `SourceCBS 6 Richmond`                                                                                   NA
## `SourceCBS 8 San Diego`                                                                                  NA
## `SourceCBS Baltimore`                                                                                    NA
## `SourceCBS Chicago`                                                                                      NA
## `SourceCBS Dallas - Fort Worth`                                                                          NA
## `SourceCBS Denver`                                                                                       NA
## `SourceCBS Detroit`                                                                                      NA
## `SourceCBS Local`                                                                                        NA
## `SourceCBS Miami`                                                                                        NA
## `SourceCBS Minnesota`                                                                                    NA
## `SourceCBS MoneyWatch`                                                                                   NA
## `SourceCBS MoneyWatch via Yahoo! Finance`                                                                NA
## `SourceCBS New York`                                                                                     NA
## `SourceCBS News`                                                                                         NA
## `SourceCBS Philadelphia`                                                                                 NA
## `SourceCBS Pittsburgh`                                                                                   NA
## `SourceCBS San Francisco`                                                                                NA
## `SourceCBS Sports`                                                                                       NA
## `SourceCBS sports.com (blog)`                                                                            NA
## SourceCBSSports.com                                                                                      NA
## SourceCCM                                                                                                NA
## SourceCCTV                                                                                               NA
## `SourceCCTV-America`                                                                                     NA
## `SourceCDA News`                                                                                         NA
## `SourceCebu Daily News`                                                                                  NA
## `SourceCebu Tech Blogger`                                                                                NA
## `SourceCecil Whig`                                                                                       NA
## SourceCedarCreekLake.com                                                                                 NA
## `SourceCelebrating Progress Africa`                                                                      NA
## `SourceCellular News`                                                                                    NA
## `SourceCentenary News`                                                                                   NA
## `SourceCenter For American Progress`                                                                     NA
## `SourceCenter for Research on Globalization`                                                             NA
## `SourceCenter for Strategic and International Studies`                                                   NA
## `SourceCentral Chronicle`                                                                                NA
## `SourceCentral Florida Future`                                                                           NA
## `SourceCentral Penn Business Journal`                                                                    NA
## `SourceCentral Washington University`                                                                    NA
## `SourceCentre Daily Times`                                                                               NA
## `SourceCeylon Daily News`                                                                                NA
## `SourceCFA Institute Enterprising Investor (blog)`                                                       NA
## `SourceCFJC Today Kamloops`                                                                              NA
## SourceCFO                                                                                                NA
## `SourceCGMA Magazine`                                                                                    NA
## `SourceChampaign/Urbana News-Gazette`                                                                    NA
## SourceChampion                                                                                           NA
## `SourceChandigarh Tribune`                                                                               NA
## `SourceChannel 24`                                                                                       NA
## `SourceChannel 4 News`                                                                                   NA
## `SourceChannel 4 News (blog)`                                                                            NA
## `SourceChannel 8 San Diego`                                                                              NA
## `SourceChannel Insider`                                                                                  NA
## `SourceChannel News Asia`                                                                                NA
## `SourceChannel NewsAsia`                                                                                 NA
## `SourceChannel Partners`                                                                                 NA
## `SourceChannel Partners (blog)`                                                                          NA
## `SourceChannel Pro`                                                                                      NA
## `SourceChannel3000.com - WISC-TV3`                                                                       NA
## SourceChannel4000.com                                                                                    NA
## SourceChannelBiz                                                                                         NA
## SourceChannelBuzz.ca                                                                                     NA
## `SourceChannelLife Australia`                                                                            NA
## `SourceChannelLife NZ`                                                                                   NA
## SourceChannelnomics                                                                                      NA
## `SourceChannelnomics EU (registration)`                                                                  NA
## `SourceCHANNELS TELEVISION`                                                                              NA
## `SourceCharisma News`                                                                                    NA
## `SourceCharleston Gazette-Mail (subscription)`                                                           NA
## `SourceCharleston Post Courier`                                                                          NA
## `SourceCharleston Post Courier (press release)`                                                          NA
## `SourceCharlotte Business Journal`                                                                       NA
## `SourceCharlotte Business Journal (blog)`                                                                NA
## `SourceCharlotte Observer`                                                                               NA
## SourceChartAttack                                                                                        NA
## `SourceCharter 97`                                                                                       NA
## `SourceChase News & Stories`                                                                             NA
## `SourceChattanooga Times Free Press`                                                                     NA
## SourceChemicalOnline                                                                                     NA
## `SourceCherry Hill Courier Post`                                                                         NA
## `SourceCherwell Online`                                                                                  NA
## `SourceChicago Business Journal`                                                                         NA
## `SourceChicago Daily Herald`                                                                             NA
## `SourceChicago Inno`                                                                                     NA
## `SourceChicago Reader`                                                                                   NA
## `SourceChicago Sun-Times`                                                                                NA
## `SourceChicago Tonight | WTTW`                                                                           NA
## `SourceChicago Tribune`                                                                           2.196e+03
## SourceChicagoist                                                                                         NA
## `SourceChicagoNow (blog)`                                                                                NA
## `SourceChichester Observer`                                                                              NA
## `SourceChillicothe Gazette`                                                                              NA
## `SourceChilliwack Progress`                                                                              NA
## `SourceChina Daily`                                                                                      NA
## `SourceChina Daily HK Edition`                                                                           NA
## `SourceChina Digital Times`                                                                              NA
## `SourceChina Economic Net`                                                                               NA
## `SourceChina Economic Review`                                                                            NA
## `SourceChina Post`                                                                                       NA
## SourceChina.org.cn                                                                                       NA
## `SourceChinadaily USA`                                                                                   NA
## SourceChinaFile                                                                                          NA
## SourceChinapost                                                                                          NA
## SourceChinatopix                                                                                         NA
## SourceChinaTopix                                                                                         NA
## `SourceChip Chick`                                                                                       NA
## SourceCHOICE                                                                                             NA
## `SourceChristian Broadcasting Network`                                                                   NA
## `SourceChristian Daily`                                                                                  NA
## `SourceChristian News Network`                                                                           NA
## `SourceChristian Post`                                                                                   NA
## `SourceChristian Science Monitor`                                                                        NA
## `SourceChristian Science Monitor via Yahoo Canada News`                                                  NA
## `SourceChristian Science Monitor via Yahoo UK & Ireland News`                                            NA
## `SourceChristian Science Monitor via Yahoo! News`                                                        NA
## `SourceChristian Today`                                                                                  NA
## SourceChristianityToday.com                                                                              NA
## SourceChristianToday                                                                                     NA
## SourceChron.com                                                                                          NA
## `SourceChron.com (blog)`                                                                                 NA
## SourceChronicle                                                                                          NA
## `SourceChronicle of Higher Education (subscription)`                                                     NA
## `SourceChronicle of Higher Education (subscription) (blog)`                                              NA
## `SourceChronicle of Philanthropy (subscription)`                                                         NA
## SourceChronicleLive                                                                                      NA
## `SourceChurch Militant`                                                                                  NA
## `SourceChurch Times`                                                                                     NA
## `SourceCihan News Agency`                                                                                NA
## SourceCILISOS.MY                                                                                         NA
## `SourceCincinnati Business Courier`                                                                      NA
## `SourceCincinnati Business Courier (blog)`                                                               NA
## SourceCincinnati.com                                                                                     NA
## `SourceCincinnati.com (blog)`                                                                            NA
## `SourceCinema Blend`                                                                                     NA
## SourceCInewsNow                                                                                          NA
## SourceCIO                                                                                                NA
## `SourceCIO Australia`                                                                                    NA
## `SourceCIO Dive`                                                                                         NA
## `SourceCIO Insight`                                                                                      NA
## `SourceCIO New Zealand`                                                                                  NA
## `SourceCIO Today`                                                                                        NA
## `SourceCIO UK`                                                                                           NA
## `SourceCIOReview (press release)`                                                                        NA
## SourceCirculate                                                                                          NA
## `SourceCities Today`                                                                                     NA
## SourceCitifmonline                                                                                       NA
## SourceCitizen                                                                                            NA
## `SourceCitizen TV (press release)`                                                                       NA
## `SourceCitizens Voice`                                                                                   NA
## `SourceCitrus County Chronicle`                                                                          NA
## `SourceCity & County of San Francisco (press release)`                                                   NA
## `SourceCity A.M.`                                                                                        NA
## `SourceCity Limits`                                                                                      NA
## `SourceCity Pages`                                                                                       NA
## SourceCityLab                                                                                            NA
## SourceCityMetric                                                                                         NA
## SourceCityNews                                                                                           NA
## SourceCitywire.co.uk                                                                                     NA
## `SourceCivil Society Media`                                                                              NA
## `SourceCIWM Journal Online`                                                                              NA
## SourceCJOB                                                                                               NA
## `SourceCKGSB Knowledge`                                                                                  NA
## `SourceCKNW News Talk 980`                                                                               NA
## SourceClaimsJournal.com                                                                                  NA
## SourceClapway                                                                                            NA
## `SourceClaremore Daily Progress`                                                                         NA
## `SourceClarence Valley Daily Examiner`                                                                   NA
## `SourceClarksville Leaf Chronicle`                                                                       NA
## `SourceClay County Times-Democrat`                                                                       NA
## SourceCleanTechnica                                                                                      NA
## `SourceCleveland 19 News`                                                                                NA
## Sourcecleveland.com                                                                                      NA
## `SourceClick Green`                                                                                      NA
## SourceClickOnDetroit                                                                                     NA
## `SourceClimate Central`                                                                                  NA
## `SourceClimate Home`                                                                                     NA
## `SourceClinton Herald`                                                                                   NA
## `SourceCloud Computing Intelligence (registration)`                                                      NA
## `SourceCloud Pro`                                                                                        NA
## `SourceCloud Tech`                                                                                       NA
## SourceCloudTech                                                                                          NA
## SourceCloudWedge                                                                                         NA
## `SourceCLTV Chicago`                                                                                     NA
## SourceCMSWire                                                                                            NA
## SourceCNBC                                                                                        4.745e+07
## `SourceCNBC (subscription)`                                                                              NA
## `SourceCNBC via Yahoo Canada Finance`                                                                    NA
## `SourceCNBC via Yahoo! Finance`                                                                   2.204e+04
## `SourceCNBC via Yahoo! Finance India`                                                                    NA
## `SourceCNBC via Yahoo! New Zealand Finance`                                                              NA
## `SourceCNBC via Yahoo!7 Finance`                                                                         NA
## SourceCNBCAfrica.com                                                                                     NA
## SourceCNET                                                                                               NA
## `SourceCNET en español via Yahoo! News`                                                                  NA
## `SourceCNET UK`                                                                                   6.711e+07
## `SourceCNET via Yahoo! Finance`                                                                          NA
## `SourceCNET via Yahoo! News`                                                                             NA
## SourceCNN                                                                                                NA
## `SourceCNN International`                                                                                NA
## `SourceCNN Money`                                                                                        NA
## `SourceCNN Philippines`                                                                                  NA
## SourceCNN.com                                                                                            NA
## SourceCNNMoney                                                                                           NA
## SourceCNSNews.com                                                                                        NA
## `SourceCNSNews.com (blog)`                                                                               NA
## `SourceCNW Group via Yahoo Canada Finance`                                                               NA
## `SourceCNW Group via Yahoo! Finance`                                                                     NA
## `SourceCo-operative News`                                                                                NA
## SourceCo.Create                                                                                          NA
## SourceCo.Design                                                                                          NA
## `SourceCo.Design (blog)`                                                                                 NA
## SourceCo.Exist                                                                                           NA
## `SourceCoAssets via Yahoo! Singapore News`                                                               NA
## `SourceCoast Reporter`                                                                            6.712e+07
## `SourceCochrane Times`                                                                                   NA
## `SourceCoconuts Bangkok`                                                                                 NA
## `SourceCoconuts Hong Kong`                                                                               NA
## `SourceCoffs Coast Advocate`                                                                             NA
## SourceCoinDesk                                                                                           NA
## SourceCoinReport                                                                                         NA
## SourceCoinTelegraph                                                                                      NA
## `SourceColombia Reports`                                                                                 NA
## `SourceColombo Gazette`                                                                                  NA
## `SourceColorado Springs Gazette`                                                                         NA
## `SourceColorLines magazine`                                                                              NA
## `SourceColumbia Daily Herald`                                                                            NA
## `SourceColumbia Daily Tribune`                                                                           NA
## `SourceColumbia Journalism Review`                                                                       NA
## `SourceColumbia Missourian`                                                                              NA
## `SourceColumbus Business First`                                                                          NA
## `SourceColumbus Dispatch`                                                                                NA
## `SourceColumbus Dispatch (blog)`                                                                         NA
## `SourceColumbus Ledger-Enquirer`                                                                         NA
## `SourceComcast SportsNet Philadelphia`                                                                   NA
## `SourceComet 24`                                                                                         NA
## SourceComicbook.com                                                                                      NA
## `SourceCommBank MyWealth`                                                                                NA
## `SourceCommentary Magazine`                                                                              NA
## `SourceCommercial Property Executive`                                                                    NA
## `SourceCommittee for Accuracy in Middle East Reporting in America`                                       NA
## `SourceCommittee for Accuracy in Middle East Reporting in America (blog)`                                NA
## `SourceCommon Dreams (press release)`                                                                    NA
## SourceCommonDreams.org                                                                                   NA
## SourceCommonSpace                                                                                        NA
## `SourceCommonweal (blog)`                                                                                NA
## `SourceCommonWealth magazine`                                                                            NA
## `SourceCommunist Party USA`                                                                              NA
## `SourceCommunity Financial News`                                                                         NA
## `SourceComox Valley Record`                                                                              NA
## `SourceComplete Music Update`                                                                            NA
## SourceComplex                                                                                            NA
## `SourceComputer Business Review`                                                                         NA
## `SourceComputer Dealer News`                                                                             NA
## `SourceComputer Weekly`                                                                                  NA
## `SourceComputer World Australia`                                                                         NA
## SourceComputerWeekly.com                                                                                 NA
## `SourceComputerWeekly.com (blog)`                                                                        NA
## SourceComputerworld                                                                                      NA
## `SourceComputerworld Australia`                                                                          NA
## `SourceComputerworld New Zealand`                                                                        NA
## SourceComputerworldUK                                                                                    NA
## SourceComputing                                                                                          NA
## SourceComputing.co.uk                                                                                    NA
## `SourceConcord Monitor`                                                                                  NA
## `SourceConcord Transcript`                                                                               NA
## `SourceCond\\u009d\\u009d Nast Traveler`                                                                 NA
## `SourceCondé Nast Traveller`                                                                             NA
## `SourceConnecticut Jewish Ledger`                                                                        NA
## `SourceConnecticut Post`                                                                                 NA
## `SourceConsequence of Sound (blog)`                                                                      NA
## `SourceConservative Home`                                                                                NA
## `SourceConsortium News`                                                                                  NA
## Sourceconsortiumnews.com                                                                                 NA
## `SourceConstitution Daily (blog)`                                                                        NA
## `SourceConstruction Week Online`                                                                         NA
## SourceConsultancy.uk                                                                                     NA
## `SourceConsumer Reports via Yahoo Canada Finance`                                                        NA
## `SourceConsumer Reports via Yahoo! Finance`                                                              NA
## `SourceContra Costa Times`                                                                               NA
## `SourceContractor UK`                                                                                    NA
## `SourceCoos Bay World`                                                                                   NA
## `SourceCops 2.0`                                                                                         NA
## `SourceCordele Dispatch`                                                                                 NA
## `SourceCorn and Soybean Digest (blog)`                                                                   NA
## `SourceCornell Chronicle`                                                                                NA
## `SourceCornell University The Cornell Daily Sun`                                                         NA
## `SourceCornish Guardian`                                                                                 NA
## `SourceCorpus Christi Caller-Times`                                                                      NA
## `SourceCorsicana Daily Sun`                                                                              NA
## `SourceCorvallis Gazette Times`                                                                          NA
## `SourceCorvus Business Newswire`                                                                         NA
## SourceCosmopolitan.com                                                                                   NA
## `SourceCoStar Group`                                                                                     NA
## `SourceCotswold Journal`                                                                                 NA
## `SourceCouncil on Foreign Relations`                                                                     NA
## `SourceCouncil on Foreign Relations (blog)`                                                              NA
## `SourceCounsel & Heal`                                                                                   NA
## SourceCounterCurrents.org                                                                                NA
## SourceCounterPunch                                                                                       NA
## `SourceCourier Mail`                                                                                     NA
## `SourceCoventry City FC`                                                                                 NA
## `SourceCoventry Telegraph`                                                                               NA
## `SourceCP24 Toronto's Breaking News`                                                                     NA
## `SourceCPI Financial`                                                                                    NA
## `SourceCQ Politics`                                                                                      NA
## SourceCrackBerry.com                                                                                     NA
## `SourceCrain's Chicago Business`                                                                         NA
## `SourceCrain's Chicago Business (blog)`                                                                  NA
## `SourceCrain's Cleveland Business`                                                                       NA
## `SourceCrain's Detroit Business`                                                                         NA
## `SourceCrain's Detroit Business (blog)`                                                                  NA
## `SourceCrain's New York Business`                                                                        NA
## `SourceCrain's New York Business (blog)`                                                                 NA
## `SourceCrain&#39;s New York Business`                                                                    NA
## `SourceCrave Online`                                                                                     NA
## `SourceCreamer Media's Engineering News`                                                                 NA
## `SourceCreamer Media's Mining Weekly`                                                                    NA
## SourceCreativity                                                                                         NA
## `SourceCredit.com via Yahoo! Finance`                                                                    NA
## SourceCRIENGLISH.com                                                                                     NA
## SourceCrikey                                                                                             NA
## `SourceCrikey (registration)`                                                                            NA
## SourceCRN                                                                                                NA
## `SourceCRN - UK`                                                                                         NA
## `SourceCRN Australia`                                                                                    NA
## `SourceCrookston Daily Times`                                                                            NA
## `SourceCross Rhythms`                                                                                    NA
## `SourceCrowdfund Insider`                                                                                NA
## SourceCrowdsourcing.org                                                                                  NA
## `SourceCrux: Covering all things Catholic`                                                               NA
## SourceCryptoCoinsNews                                                                                    NA
## `SourceCSO Australia`                                                                                    NA
## `SourceCSO Online`                                                                                       NA
## SourceCSPnet.com                                                                                         NA
## `SourceCSRwire.com (press release)`                                                                      NA
## `SourceCT Post`                                                                                          NA
## SourceCTR                                                                                                NA
## `SourceCTV British Columbia News`                                                                        NA
## `SourceCTV Calgary News`                                                                                 NA
## `SourceCTV Montreal News`                                                                                NA
## `SourceCTV News`                                                                                         NA
## `SourceCTV Ottawa News`                                                                                  NA
## `SourceCTV Toronto`                                                                                      NA
## SourceCTV.ca                                                                                             NA
## `SourceCU Boulder News & Events`                                                                         NA
## `SourceCU Columbia Spectator`                                                                            NA
## `SourceCult of Mac`                                                                                      NA
## SourceCurbed                                                                                             NA
## `SourceCurbed Chicago`                                                                                   NA
## `SourceCurbed DC`                                                                                        NA
## `SourceCustomer Think`                                                                                   NA
## `SourceCW39 NewsFix`                                                                                     NA
## SourceCXOToday.com                                                                                       NA
## `SourceCycling Weekly`                                                                                   NA
## `SourceCyprus Mail`                                                                                      NA
## `SourceCzech Happenings`                                                                                 NA
## `SourceD Magazine`                                                                                       NA
## `SourceDaiji World`                                                                                      NA
## SourceDaijiworld.com                                                                                     NA
## `SourceDaily American Online`                                                                            NA
## `SourceDaily Astorian`                                                                                   NA
## `SourceDaily Aztec`                                                                                      NA
## `SourceDaily Beast`                                                                                      NA
## `SourceDaily Bruin`                                                                                      NA
## `SourceDaily Californian`                                                                                NA
## `SourceDaily Caller`                                                                                     NA
## `SourceDaily Capital (Capital TV)`                                                                       NA
## `SourceDaily Commercial`                                                                                 NA
## `SourceDaily Courier`                                                                                    NA
## `SourceDaily Democrat`                                                                                   NA
## `SourceDaily Echo`                                                                                       NA
## `SourceDaily Excelsior`                                                                                  NA
## `SourceDaily Express`                                                                                    NA
## `SourceDaily Free Press (subscription)`                                                                  NA
## `SourceDaily Herald`                                                                                     NA
## `SourceDaily Journal`                                                                                    NA
## `SourceDaily Kos`                                                                                        NA
## `SourceDaily Life`                                                                                       NA
## `SourceDaily Local News`                                                                                 NA
## `SourceDaily Mail`                                                                                6.711e+07
## `SourceDaily Maverick`                                                                                   NA
## `SourceDaily Mirror`                                                                                     NA
## `SourceDaily News`                                                                                       NA
## `SourceDaily News & Analysis`                                                                            NA
## `SourceDaily News | The National Newspaper (press release) (blog)`                                       NA
## `SourceDaily News Egypt`                                                                                 NA
## `SourceDaily Nexus`                                                                                      NA
## `SourceDaily NK`                                                                                         NA
## `SourceDaily Northwestern`                                                                               NA
## `SourceDaily Pakistan`                                                                                   NA
## `SourceDaily Pioneer`                                                                                    NA
## `Sourcedaily post`                                                                                       NA
## `SourceDaily Post Nigeria`                                                                               NA
## `SourceDaily Post North Wales`                                                                           NA
## `SourceDaily Press`                                                                                      NA
## `SourceDaily Reckoning - Australian Edition`                                                             NA
## `SourceDaily Record`                                                                                     NA
## `SourceDaily Sabah`                                                                                      NA
## `SourceDaily Signal`                                                                                     NA
## `SourceDaily Star`                                                                                       NA
## `SourceDaily Star Gazette`                                                                               NA
## `SourceDaily Sun`                                                                                        NA
## `SourceDaily Telegraph`                                                                                  NA
## `SourceDaily Times`                                                                                      NA
## `SourceDaily Times Nigeria`                                                                              NA
## `SourceDaily Trojan Online`                                                                              NA
## `SourceDaily Trust`                                                                                      NA
## `SourceDaily Yonder`                                                                                     NA
## SourceDailyFinance                                                                                       NA
## SourceDailyForex.com                                                                                     NA
## SourceDailyFX                                                                                            NA
## `SourceDailyFX via Yahoo! Finance`                                                                       NA
## `SourceDailyFX via Yahoo! New Zealand Finance`                                                           NA
## `SourceDailyFX via Yahoo!7 Finance`                                                                      NA
## SourceDailyNews                                                                                          NA
## SourceDailyO                                                                                             NA
## `SourceDailyPost Nigeria`                                                                                NA
## Sourcedailytelegraph.com.au                                                                              NA
## SourceDailyuw                                                                                            NA
## `SourceDakota Financial News`                                                                            NA
## `SourceDallas Business Journal`                                                                          NA
## `SourceDallas Business Journal (blog)`                                                                   NA
## `SourceDallas Morning News`                                                                              NA
## `SourceDallas Morning News (blog)`                                                                       NA
## `SourceDallas Sun Times`                                                                                 NA
## `SourceDanbury News Times`                                                                               NA
## `SourceDarien News-Review`                                                                               NA
## `SourceDark Reading`                                                                                     NA
## `SourceData Center Knowledge`                                                                            NA
## SourceDatamation                                                                                         NA
## SourceDatanami                                                                                           NA
## SourceDATAQUEST                                                                                          NA
## `SourceDavid Curry, Digital Trends via Yahoo! News`                                                      NA
## SourceDawn                                                                                               NA
## SourceDAWN.com                                                                                           NA
## `SourceDay Herald`                                                                                       NA
## `SourceDayton Business Journal`                                                                          NA
## `SourceDayton Daily News`                                                                                NA
## `SourceDaytona Beach News-Journal`                                                                       NA
## `SourceDazeinfo (blog)`                                                                                  NA
## `SourceDC Inno`                                                                                          NA
## SourceDCist.com                                                                                          NA
## `SourceDe Dagelijkse Standaard (Blog)`                                                                   NA
## `SourceDe Montfort University (press release)`                                                           NA
## SourceDeadline                                                                                           NA
## `SourceDeadline Hollywood`                                                                               NA
## SourceDeadspin                                                                                           NA
## SourceDealBreaker                                                                                        NA
## SourceDEALSTREETASIA                                                                                     NA
## `SourceDeath and Taxes`                                                                                  NA
## `SourceDEBKA file`                                                                                       NA
## SourceDEBKAfile                                                                                          NA
## `SourceDeccan Chronicle`                                                                                 NA
## `SourceDeccan Herald`                                                                                    NA
## SourceDeepika                                                                                            NA
## `SourceDefense One`                                                                                      NA
## SourceDefenseNews.com                                                                                    NA
## `SourceDeKalb Daily Chronicle`                                                                           NA
## `SourceDelaware First Media`                                                                             NA
## SourceDelimiter                                                                                          NA
## `SourceDelmarva Daily Times`                                                                             NA
## SourceDelo                                                                                               NA
## `SourceDelta Farm Press`                                                                                 NA
## `SourceDemocracy Now!`                                                                                   NA
## `SourceDemocracy Now! (blog)`                                                                            NA
## `SourceDentistry IQ`                                                                                     NA
## `SourceDenver Business Journal (blog)`                                                                   NA
## `SourceDenver Post`                                                                                      NA
## `SourceDenver Sun Times`                                                                                 NA
## `SourceDepartment of Defense`                                                                            NA
## `SourceDerby Telegraph`                                                                                  NA
## `SourceDerbyshire Times`                                                                                 NA
## `SourceDerry Journal`                                                                                    NA
## `SourceDerry Now`                                                                                        NA
## `SourceDeseret News`                                                                                     NA
## `SourceDesign & Trend`                                                                                   NA
## `SourceDesign Week`                                                                                      NA
## `SourceDesign World Network`                                                                             NA
## `SourceDesignboom (blog)`                                                                                NA
## SourceDesignNews                                                                                         NA
## SourceDESINFOS.com                                                                                       NA
## `SourceDeSmog Canada`                                                                                    NA
## SourceDesMoinesRegister.com                                                                              NA
## `SourceDestination CRM`                                                                                  NA
## SourceDestinyMan                                                                                         NA
## SourceDestructoid                                                                                        NA
## SourceDetails                                                                                            NA
## `SourceDetroit Free Press`                                                                               NA
## `SourceDetroit News`                                                                                     NA
## `SourceDeutsche Welle`                                                                                   NA
## SourceDevelop                                                                                            NA
## `SourceDeveloper Tech`                                                                                   NA
## SourceDeveloper.com                                                                                      NA
## SourceDeveloperTech                                                                                      NA
## SourceDevex                                                                                              NA
## `SourceDevils Lake Journal`                                                                              NA
## SourceDexigner                                                                                           NA
## SourceDezeen                                                                                             NA
## Sourcedh.be                                                                                              NA
## `SourceDhaka Tribune`                                                                                    NA
## SourceDhakaTribune                                                                                       NA
## `SourceDiamondback Online`                                                                               NA
## `SourceDickinson Press`                                                                                  NA
## `SourceDigi Times`                                                                                       NA
## SourceDigiday                                                                                            NA
## SourceDiginomica                                                                                         NA
## SourceDigit                                                                                              NA
## `SourceDigital Arts Online`                                                                              NA
## `SourceDigital Journal`                                                                                  NA
## `SourceDigital Music News`                                                                               NA
## `SourceDigital Spy`                                                                                      NA
## `SourceDigital Trends`                                                                                   NA
## `SourceDigital Trends via Yahoo Canada News`                                                             NA
## `SourceDigital Trends via Yahoo Maktoob News`                                                            NA
## `SourceDigital Trends via Yahoo UK & Ireland News`                                                       NA
## `SourceDigital Trends via Yahoo! Finance`                                                                NA
## `SourceDigital Trends via Yahoo! News`                                                            4.745e+07
## `SourceDigital Trends via Yahoo! Sports`                                                          3.875e+07
## SourceDigitalBroadcastingcom                                                                             NA
## SourceDIGITALLOOK                                                                                        NA
## SourceDigitalTVEurope.net                                                                                NA
## SourceDigitimes                                                                                          NA
## `SourceDin Merican`                                                                                      NA
## `SourceDirect Marketing News`                                                                            NA
## SourceDirectionsMag.com                                                                                  NA
## `SourceDirector magazine`                                                                                NA
## `SourceDisability Scoop`                                                                                 NA
## SourceDiscover                                                                                           NA
## `SourceDiscover Humboldt`                                                                                NA
## `SourceDiscover Magazine (blog)`                                                                         NA
## `SourceDiscovery News`                                                                                   NA
## `SourceDissident Voice`                                                                                  NA
## `SourceDiverse: Issues in Higher Education`                                                              NA
## SourceDividend.com                                                                                       NA
## SourceDJBooth.net                                                                                        NA
## `SourceDL-Online`                                                                                        NA
## `SourceDNA India`                                                                                        NA
## SourceDNAinfo                                                                                            NA
## SourceDOGOnews                                                                                           NA
## `SourceDoha News`                                                                                        NA
## `SourceDomain News`                                                                                      NA
## `SourceDominican Today`                                                                                  NA
## SourceDoordarshan                                                                                        NA
## `SourceDorking and Leatherhead Advertiser`                                                               NA
## `SourceDorset Echo`                                                                                      NA
## `SourceDothan Eagle`                                                                                     NA
## `SourceDothan First`                                                                                     NA
## `SourceDouglas Budget`                                                                                   NA
## `SourceDover Post`                                                                                       NA
## `SourceDownload.com via Yahoo! News`                                                                     NA
## `SourceDream Team FC`                                                                                    NA
## `SourceDreuz Info`                                                                                       NA
## `SourceDrexel University The Triangle Online`                                                            NA
## SourceDriving                                                                                            NA
## SourceDSNews.com                                                                                         NA
## `SourceDubuque Telegraph Herald`                                                                         NA
## `SourceDuluth News Tribune`                                                                              NA
## `SourceDuncan Banner`                                                                                    NA
## `SourceDunyaNews Pakistan`                                                                               NA
## `SourceDunyaNews Pakistan (blog)`                                                                        NA
## `SourceDurham Herald Sun`                                                                                NA
## SourceDutchNews.nl                                                                                       NA
## `SourceDZ Foot`                                                                                          NA
## `SourceDZone News`                                                                                       NA
## `SourceE-Commerce Times`                                                                          2.148e+03
## `SourceE-Flux`                                                                                           NA
## `SourceE-Pao.net`                                                                                        NA
## `SourceE Kantipur`                                                                                       NA
## `SourceE! Online`                                                                                        NA
## `SourceE&T magazine`                                                                                     NA
## Sourcee27                                                                                                NA
## `Sourcee27 via Yahoo! Singapore News`                                                                    NA
## `SourceEagle-Tribune`                                                                                    NA
## `SourceEagle Radio`                                                                                      NA
## `SourceEast African Business Week`                                                                       NA
## `SourceEast Anglian Daily Times`                                                                         NA
## `SourceEast Asia Forum`                                                                                  NA
## `SourceEast Bay Express`                                                                                 NA
## `SourceEast Bay Times`                                                                                   NA
## `SourceEast Coast Radio`                                                                                 NA
## `SourceEast London and West Essex Guardian Series`                                                       NA
## `SourceEast Oregonian (subscription)`                                                                    NA
## `SourceEastbourne Herald`                                                                                NA
## SourceEastday.com                                                                                        NA
## `SourceEat Out Magazine`                                                                                 NA
## SourceEater                                                                                              NA
## `SourceEater Austin`                                                                                     NA
## `SourceEater DC`                                                                                         NA
## `SourceEater Detroit (blog)`                                                                             NA
## `SourceEater Seattle`                                                                                    NA
## `SourceeCampus News`                                                                                     NA
## `SourceECB Publishing`                                                                                   NA
## SourceEcho                                                                                               NA
## SourceEchonetdaily                                                                                       NA
## SourceECNmag.com                                                                                         NA
## Sourceecns                                                                                               NA
## `Sourceeco-business.com`                                                                                 NA
## Sourceeconomia                                                                                           NA
## `SourceEconomic Calendar`                                                                                NA
## `SourceEconomic Times`                                                                                   NA
## `SourceEconomic Times (blog)`                                                                            NA
## SourceEconomics21                                                                                        NA
## `SourceEconoMonitor (blog)`                                                                              NA
## SourceEconomy                                                                                            NA
## SourceEconomyWatch.com                                                                                   NA
## SourceEconoTimes                                                                                         NA
## `SourceEContent (press release)`                                                                         NA
## SourceEcoWatch                                                                                           NA
## `SourceEcumenical News`                                                                                  NA
## Sourceedie.net                                                                                           NA
## `SourceEdmond Sun`                                                                                       NA
## `SourceEdmonton Journal`                                                                                 NA
## `SourceEdmonton Sun`                                                                                     NA
## SourceEdmunds.com                                                                                        NA
## SourceEdSurge                                                                                            NA
## `SourceEdTech Magazine: Focus on Higher Education`                                                       NA
## `SourceEducation Dive`                                                                                   NA
## `SourceEducation Week (subscription)`                                                                    NA
## `SourceEducation Week (subscription) (blog)`                                                             NA
## `SourceEducators NZ`                                                                                     NA
## `SourceEE Times`                                                                                         NA
## `SourceEE Times Asia`                                                                                    NA
## SourceEETimes                                                                                            NA
## SourceEFF                                                                                                NA
## `SourceEffingham's News Leader`                                                                          NA
## `SourceEffingham Daily News`                                                                             NA
## `SourceEgypt Independent`                                                                                NA
## `SourceEgypt SIS (press release)`                                                                        NA
## `SourceEgyptian Streets`                                                                                 NA
## `SourceEJ Insight`                                                                                       NA
## SourceEkklesia                                                                                           NA
## `SourceEl Moudjahid`                                                                                     NA
## `SourceEl Paisano`                                                                                       NA
## `SourceEl Watan`                                                                                         NA
## `Sourceelan: The Guide to Global Muslim Culture`                                                         NA
## `SourceElectronic Beats (press release) (blog)`                                                          NA
## `SourceElectronics EETimes (registration)`                                                               NA
## `SourceElectronics Weekly`                                                                               NA
## `SourceElectronics Weekly (blog)`                                                                        NA
## `SourceElite Daily`                                                                                      NA
## `SourceElite Daily (blog)`                                                                               NA
## `SourceElizabethtown News Enterprise`                                                                    NA
## `SourceElko Daily Free Press`                                                                            NA
## `SourceELLE UK`                                                                                          NA
## SourceELLE.com                                                                                           NA
## `SourceElliott Wave`                                                                                     NA
## SourceEllwoodCity.org                                                                                    NA
## `SourceEly News`                                                                                         NA
## SourceeMarketer                                                                                          NA
## `SourceEmbassy News (subscription)`                                                                      NA
## `SourceEmergency Management (blog)`                                                                      NA
## Sourceemergingmarkets.org                                                                                NA
## `SourceEmirates 24|7`                                                                                    NA
## SourceEMQ                                                                                                NA
## `SourceEN DELFI`                                                                                         NA
## `SourceEN DELFI (subscription)`                                                                          NA
## SourceeNCA                                                                                               NA
## `SourceEnergy Matters`                                                                                   NA
## `SourceEnergy Voice`                                                                                     NA
## `SourceEnergy.gov (blog)`                                                                                NA
## `SourceeNews Park Forest`                                                                                NA
## SourceEngadget                                                                                    6.711e+07
## `SourceEngadget (blog)`                                                                                  NA
## SourceENGINEERING.com                                                                                    NA
## SourceEnnahar                                                                                            NA
## `SourceEnough Project`                                                                                   NA
## `SourceEnough Project (blog)`                                                                            NA
## `SourceENPI Info Centre`                                                                                 NA
## SourceEnsia                                                                                              NA
## SourceEnstarz                                                                                            NA
## `SourceEnter Stage Right`                                                                                NA
## `SourceEnterprise Apps Tech`                                                                             NA
## `SourceEnterprise Innovation`                                                                            NA
## `SourceEnterprise Irregulars (blog)`                                                                     NA
## `SourceEnterprise Leader`                                                                                NA
## `SourceEnterprise Times`                                                                                 NA
## `SourceEnterpriseContentManagementConnection-ECM`                                                        NA
## SourceEnterpriseTech                                                                                     NA
## `SourceEntertainment Tonight`                                                                            NA
## `SourceEntertainment Tonight via Yahoo Canada News`                                                      NA
## `SourceEntertainment Weekly`                                                                             NA
## `SourceEntertainment Weekly (blog)`                                                                      NA
## SourceEntrepreneur                                                                                       NA
## `SourceEntrepreneur via Yahoo Canada Finance`                                                            NA
## `SourceEntrepreneur via Yahoo! Finance`                                                                  NA
## SourceEntrpreneur                                                                                        NA
## `SourceEnvironment & Energy Publishing`                                                                  NA
## `SourceEnvironmental Data Interactive Exchange`                                                          NA
## `SourceEnvironmental Defense Fund (blog)`                                                                NA
## `SourceEnvironmental Finance`                                                                            NA
## `SourceEnvironmental Leader`                                                                             NA
## `SourceEnvironmental News Network`                                                                       NA
## `SourceEnvironmental Working Group`                                                                      NA
## SourceeParisExtra.com                                                                                    NA
## `SourceEqual Times`                                                                                      NA
## `SourceEquilibrio Informativo`                                                                           NA
## SourceEquities.com                                                                                       NA
## `SourceErie Times-News`                                                                                  NA
## `SourceErvik.as (press release) (registration) (blog)`                                                   NA
## `Sourceeské noviny`                                                                                      NA
## SourceESPN                                                                                               NA
## `SourceESPN (blog)`                                                                                      NA
## `SourceESPN Blogs`                                                                                       NA
## `SourceESPN FC`                                                                                          NA
## `SourceESPN FC (blog)`                                                                                   NA
## SourceESPNcricinfo.com                                                                                   NA
## SourceEsquire.com                                                                                        NA
## SourceEssence.com                                                                                        NA
## `SourceEssex Chronicle`                                                                                  NA
## SourceETAuto.com                                                                                         NA
## SourceETCIO.com                                                                                          NA
## `SourceETF Daily News`                                                                                   NA
## `SourceETF Trends via Yahoo! Finance`                                                                    NA
## `SourceETF.com via Yahoo! Finance`                                                                       NA
## SourceETFinalScore.com                                                                                   NA
## `SourceETonline via Yahoo Celebrity`                                                                     NA
## SourceETRetail.com                                                                                       NA
## SourceETtech.com                                                                                         NA
## SourceETTelecom.com                                                                                      NA
## SourceeTurboNews                                                                                         NA
## `SourceEu Business`                                                                                      NA
## `SourceEU News`                                                                                          NA
## `SourceEUbusiness (press release)`                                                                       NA
## SourceEUobserver                                                                                         NA
## SourceEurActiv                                                                                           NA
## `SourceEurasia Review`                                                                                   NA
## SourceEurasiaNet                                                                                         NA
## `SourceEureka Times Standard`                                                                            NA
## `SourceEurekAlert (press release)`                                                                       NA
## `SourceEurekAlert!`                                                                                      NA
## SourceEurogamer.net                                                                                      NA
## `SourceEuromoney magazine`                                                                               NA
## Sourceeuronews                                                                                           NA
## SourceEuroNews                                                                                           NA
## `SourceEurope Online Magazine`                                                                           NA
## `SourceEuropean Council on Foreign Relations`                                                            NA
## `SourceEuropean Jewish Press`                                                                            NA
## `SourceEuropean Parliament (press release)`                                                              NA
## SourceEuropeanCEO                                                                                        NA
## `SourceEUROPP - European Politics and Policy (blog)`                                                     NA
## SourceEuroScientist                                                                                      NA
## SourceEurosport                                                                                          NA
## SourceEURweb                                                                                             NA
## SourceEurweb.com                                                                                         NA
## `SourceEvenimentul Zilei`                                                                                NA
## `SourceEvening Chronicle`                                                                                NA
## `SourceEvening Standard`                                                                                 NA
## `SourceEveningTimes Online`                                                                              NA
## `SourceEvent Magazine`                                                                                   NA
## SourceEventHubs                                                                                          NA
## `SourceEverett Herald`                                                                                   NA
## Sourceevertiq.com                                                                                        NA
## SourceEverythingLubbock.com                                                                              NA
## SourceeWeek                                                                                              NA
## `SourceExaminer Enterprise`                                                                              NA
## `SourceExaminer Gazette`                                                                                 NA
## SourceExaminer.com                                                                                       NA
## `SourceExaminerPost.com (blog)`                                                                          NA
## `SourceExcalibur Online`                                                                                 NA
## `SourceExchange News Direct`                                                                             NA
## `SourceExchange Rates UK`                                                                                NA
## `SourceExchangeWire (blog)`                                                                              NA
## `SourceExecutive Mosaic Media (blog)`                                                                    NA
## `SourceExecutiveBiz (blog)`                                                                              NA
## `SourceExpert Reviews`                                                                                   NA
## `SourceExperts Exchange (blog)`                                                                          NA
## `SourceExpress Computer`                                                                                 NA
## SourceExpress.co.uk                                                                                      NA
## Sourceexpressandstar.com                                                                                 NA
## SourceExtremeTech                                                                                        NA
## `SourceEye For Travel`                                                                                   NA
## Sourceeyefortravel.com                                                                                   NA
## `SourceEyewitness News`                                                                                  NA
## `SourceEyewitness News 3 Hartford`                                                                       NA
## SourceeZadar                                                                                             NA
## `SourceFabius Maximus website (blog)`                                                                    NA
## SourceFactCheck.org                                                                                      NA
## SourceFAIR                                                                                               NA
## `SourceFair Observer`                                                                                    NA
## `SourceFairbanks Daily News-Miner`                                                                       NA
## `SourceFairfield Daily Republic`                                                                         NA
## `SourceFamagusta Gazette`                                                                                NA
## `SourceFamily Security Matters`                                                                          NA
## SourceFanSided                                                                                           NA
## `SourceFarm Business Communications`                                                                     NA
## `SourceFarm Futures`                                                                                     NA
## `SourceFarm Weekly`                                                                                      NA
## SourceFarmersWeekly                                                                                      NA
## `SourceFarming Life`                                                                                     NA
## `SourceFarmington Daily Times`                                                                           NA
## `SourceFashionista (blog)`                                                                               NA
## `SourceFast Company`                                                                                     NA
## `SourceFast Company Magazine`                                                                            NA
## `SourceFayetteville Observer`                                                                            NA
## `SourceFC Inter.it`                                                                                      NA
## Sourcefdanewsalert.com                                                                                   NA
## `SourceFederal Computer Week`                                                                            NA
## `SourceFederal Reserve Bank of San Francisco`                                                            NA
## `SourceFederal Reserve Bank of San Francisco (blog)`                                                     NA
## `SourceFederal Times`                                                                                    NA
## SourceFederalNewsRadio.com                                                                               NA
## SourceFedScoop                                                                                           NA
## SourceFeedstuffs                                                                                         NA
## `SourceFG Insight`                                                                                       NA
## SourceFIBA                                                                                               NA
## SourceFibre2fashion.com                                                                                  NA
## `SourceFIDH (Communiqu\\u009d\\u009d de presse)`                                                         NA
## `SourceFIDH (press release)`                                                                             NA
## SourceFierceCIO                                                                                          NA
## SourceFierceContentManagement                                                                            NA
## SourceFierceEnterpriseCommunications                                                                     NA
## SourceFierceGovernmentIT                                                                                 NA
## `SourceFierceMedicalDevices (press release) (registration)`                                              NA
## SourceFierceMobileIT                                                                                     NA
## SourceFierceTelecom                                                                                      NA
## SourceFierceWireless                                                                                     NA
## SourceFIFA                                                                                               NA
## SourceFIFA.com                                                                                           NA
## `SourceFife Today`                                                                                       NA
## `SourceFight Back! Newspaper`                                                                            NA
## `SourceFiji Sun Online`                                                                                  NA
## `SourceFiji Times`                                                                                       NA
## `SourceFileHippo News`                                                                                   NA
## `SourceFinalCall.com News`                                                                               NA
## `SourceFinance and Commerce`                                                                             NA
## `SourceFinance Magnates`                                                                                 NA
## `SourceFinance Magnates (blog)`                                                                          NA
## SourceFinanceAsia                                                                                        NA
## `SourceFinancial Advisor Magazine (registration)`                                                        NA
## `SourceFinancial Director`                                                                               NA
## `SourceFinancial Express`                                                                                NA
## `SourceFinancial Express Bangladesh`                                                                     NA
## `SourceFinancial Market News`                                                                            NA
## `SourceFinancial News (subscription)`                                                                    NA
## `SourceFinancial Planning`                                                                               NA
## `SourceFinancial Post`                                                                                   NA
## `SourceFinancial Times`                                                                                  NA
## `SourceFinancial Times via Yahoo! New Zealand Finance`                                                   NA
## SourceFinancialSpots.com                                                                                 NA
## SourceFinanzen.net                                                                                       NA
## SourcefindBIOMETRICS                                                                                     NA
## Sourcefinder.com.au                                                                                      NA
## SourceFinextra                                                                                           NA
## `SourceFinextra (press release)`                                                                         NA
## `SourceFingal Independent`                                                                               NA
## `SourceFirst Things (blog)`                                                                              NA
## SourceFirstcoastnews.com                                                                                 NA
## SourceFirstpost                                                                                          NA
## `SourceFirstpost (satire)`                                                                               NA
## SourceFiveThirtyEight                                                                                    NA
## `SourceFlathead Beacon`                                                                                  NA
## SourceFlavorwire                                                                                         NA
## `SourceFleet Owner (blog)`                                                                               NA
## SourceFleetNews                                                                                          NA
## `SourceFleetwood Today`                                                                                  NA
## SourceFlightglobal                                                                                       NA
## `SourceFlorida Flambeau`                                                                                 NA
## `SourceFlorida Politics (blog)`                                                                          NA
## `SourceFlorida Times-Union`                                                                              NA
## `SourceFlorida Today`                                                                                    NA
## `SourceFlorida Trend`                                                                                    NA
## `SourceFlyer News`                                                                                       NA
## `SourceFM World`                                                                                         NA
## `SourceFocus News`                                                                                       NA
## `SourceFocus Taiwan News Channel`                                                                        NA
## `SourceFond du Lac Reporter`                                                                             NA
## `SourceFood Tank (blog)`                                                                                 NA
## SourceFoodManufacture.co.uk                                                                              NA
## `SourceFoodNavigator-Asia.com`                                                                           NA
## SourceFoodProductionDaily.com                                                                            NA
## `SourceFor The Win`                                                                                      NA
## SourceForbes                                                                                             NA
## `SourceForbes India`                                                                                     NA
## `SourceForbes via Yahoo! Finance`                                                                        NA
## `SourceForbes via Yahoo! News`                                                                           NA
## `SourceForeign Affairs`                                                                                  NA
## `SourceForeign Affairs (subscription)`                                                                   NA
## `SourceForeign Policy`                                                                                   NA
## `SourceForeign Policy (blog)`                                                                            NA
## `SourceForeign Policy Blogs (blog)`                                                                      NA
## `SourceForeign Policy In Focus`                                                                          NA
## `SourceForeign Policy Journal`                                                                           NA
## `SourceForeign Relations`                                                                                NA
## `SourceForex Factory`                                                                                    NA
## SourceForexLive                                                                                          NA
## `SourceFormtek Blog (blog)`                                                                              NA
## `SourceFort Wayne Journal Gazette`                                                                       NA
## `SourceFort Wayne Journal Gazette (blog)`                                                                NA
## `SourceFort Worth Star-Telegram`                                                                         NA
## `SourceFort Worth Star Telegram`                                                                         NA
## `SourceFort Worth Star Telegram (blog)`                                                                  NA
## SourceFortune                                                                                            NA
## `SourceFortune via Yahoo Canada Finance`                                                                 NA
## `SourceFortune via Yahoo! Finance`                                                                       NA
## SourceForward                                                                                            NA
## `SourceFoster's Daily Democrat`                                                                          NA
## SourceFourFourTwo                                                                                        NA
## `SourceFourFourTwo via Yahoo Canada Sports`                                                              NA
## `SourceFOX 11 Los Angeles`                                                                               NA
## `SourceFOX 11 Reno`                                                                                      NA
## `SourceFOX 12 Oregon`                                                                                    NA
## `SourceFOX 13 News, Tampa Bay`                                                                           NA
## `SourceFOX 13 Utah`                                                                                      NA
## `SourceFOX 19 Cincinnati`                                                                                NA
## `SourceFox 2 Detroit`                                                                                    NA
## `SourceFOX 2 News St. Louis`                                                                             NA
## `SourceFox 28`                                                                                           NA
## `SourceFOX 28 South Bend`                                                                                NA
## `SourceFOX 29 News Philadelphia`                                                                         NA
## `SourceFOX 31 Denver`                                                                                    NA
## `SourceFox 32 Chicago`                                                                                   NA
## `SourceFox 35 Orlando`                                                                                   NA
## `SourceFOX 4 Kansas City`                                                                                NA
## `SourceFOX 4 News`                                                                                       NA
## `SourceFOX 41 Louisville`                                                                                NA
## `SourceFOX 43 Harrisburg`                                                                                NA
## `SourceFOX 46 Charlotte`                                                                                 NA
## `SourceFOX 5 Atlanta`                                                                                    NA
## `SourceFOX 5 Las Vegas`                                                                                  NA
## `SourceFOX 5 San Diego`                                                                                  NA
## `SourceFox 59`                                                                                           NA
## `SourceFOX 59 Indianapolis`                                                                              NA
## `SourceFOX 6 Milwaukee`                                                                                  NA
## `SourceFOX 6 News Birmingham`                                                                            NA
## `SourceFOX 61`                                                                                           NA
## `SourceFOX 7 Austin`                                                                                     NA
## `SourceFOX 7 WTVW Evansville`                                                                            NA
## `SourceFOX 8 Cleveland`                                                                                  NA
## `SourceFOX 8 New Orleans`                                                                                NA
## `SourceFOX 8 WGHP`                                                                                       NA
## `SourceFox Business`                                                                                     NA
## `SourceFOX Business`                                                                                     NA
## `SourceFox Business via Yahoo! Finance`                                                                  NA
## `SourceFOX CT Hartford`                                                                                  NA
## `SourceFOX Illinois`                                                                                     NA
## `SourceFox News`                                                                                         NA
## `SourceFox News Insider`                                                                                 NA
## `SourceFox News Latino`                                                                                  NA
## `SourceFOX News Radio (blog)`                                                                            NA
## `SourceFox Sports`                                                                                       NA
## SourceFox11online.com                                                                                    NA
## `SourceFOX13 Memphis`                                                                                    NA
## Sourcefox13now.com                                                                                       NA
## SourceFox17                                                                                              NA
## SourceFOX21News.com                                                                                      NA
## Sourcefox2now.com                                                                                        NA
## `SourceFOX30 / CBS47 Jacksonville`                                                                       NA
## `SourceFOX31 Denver`                                                                                     NA
## SourceFOX40                                                                                              NA
## `SourceFOX40 Sacramento`                                                                                 NA
## SourceFOX43.com                                                                                          NA
## Sourcefox4kc.com                                                                                         NA
## SourceFox5NY                                                                                             NA
## Sourcefox5sandiego.com                                                                                   NA
## Sourcefox6now.com                                                                                        NA
## Sourcefox8.com                                                                                           NA
## SourceFoxReno.com                                                                                        NA
## SourceFOXSports.com                                                                                      NA
## `SourceFRANCE 24`                                                                                        NA
## `SourceFranklin Independent`                                                                             NA
## `SourceFranklin News Post`                                                                               NA
## `SourceFraser Coast Chronicle`                                                                           NA
## `SourceFrederick News Post (subscription)`                                                               NA
## SourceFredericksburg.com                                                                                 NA
## `SourceFree Malaysia Today`                                                                       6.711e+07
## `SourceFree Press Journal`                                                                               NA
## `SourceFreedom Newspaper`                                                                                NA
## SourceFreestonecountytimesonline                                                                         NA
## `SourceFresh Business Thinking`                                                                          NA
## SourceFreshPlaza                                                                                         NA
## `SourceFresno Bee`                                                                                       NA
## `SourceFresno Bee (blog)`                                                                                NA
## `SourceFresno Business Journal`                                                                          NA
## `SourceFrome Standard`                                                                                   NA
## `SourceFrome Times`                                                                                      NA
## SourceFRONTLINE                                                                                          NA
## `SourceFrontPage Magazine`                                                                               NA
## `SourceFrost Illustrated`                                                                                NA
## SourceFSView                                                                                             NA
## `SourceFT Adviser`                                                                                       NA
## `SourceFT Alphaville (registration)`                                                                     NA
## `SourceFT.com (blog)`                                                                                    NA
## `SourceFT.com (registration) (blog)`                                                                     NA
## `SourceFudzilla (blog)`                                                                                  NA
## `SourceFuelFix (blog)`                                                                                   NA
## `SourceFulton News`                                                                                      NA
## `SourceFund Strategy`                                                                                    NA
## Sourcefuse.tv                                                                                            NA
## `SourceFuseworks via Yahoo! New Zealand Finance`                                                         NA
## SourceFusion                                                                                             NA
## SourceFXStreet                                                                                           NA
## SourceGadget                                                                                             NA
## SourceGadgette                                                                                           NA
## `SourceGainesville Sun`                                                                                  NA
## `SourceGainesville Times`                                                                                NA
## `SourceGalesburg Register-Mail`                                                                          NA
## SourceGalleyCat                                                                                          NA
## SourceGallup                                                                                             NA
## SourceGallup.com                                                                                         NA
## SourceGamasutra                                                                                          NA
## `SourceGamasutra (blog)`                                                                                 NA
## `SourceGame Debate`                                                                                      NA
## `SourceGame Informer`                                                                                    NA
## `SourceGame Rant`                                                                                        NA
## `SourceGame Revolution`                                                                                  NA
## SourceGameDev.net                                                                                        NA
## SourceGamenguide                                                                                         NA
## SourceGamepur                                                                                            NA
## `SourceGameranx (blog)`                                                                                  NA
## `SourceGamereactor UK`                                                                                   NA
## `SourceGames Radar`                                                                                      NA
## Sourcegamesindustry.biz                                                                                  NA
## SourceGamesIndustry.biz                                                                                  NA
## `SourceGamesIndustry.biz (registration)`                                                                 NA
## SourceGameSpot                                                                                           NA
## `SourceGameSpot (blog)`                                                                                  NA
## `SourceGameSpot via Yahoo! News`                                                                         NA
## SourceGamespresso                                                                                        NA
## `SourceGamesRadar (blog)`                                                                                NA
## SourceGameZone                                                                                           NA
## SourceGamingBolt                                                                                         NA
## `SourceGant Daily`                                                                                       NA
## `SourceGas 2.0`                                                                                          NA
## `SourceGatestone Institute`                                                                              NA
## SourceGawker                                                                                             NA
## `SourceGazette Live`                                                                                     NA
## `SourceGazette News`                                                                                     NA
## SourceGazetteNET                                                                                         NA
## `SourceGazetteUnion,com (blog)`                                                                          NA
## Sourcegbtimes                                                                                            NA
## SourceGCaptain                                                                                           NA
## SourceGCN.com                                                                                            NA
## `SourceGear Junkie (blog)`                                                                               NA
## Sourcegearburn                                                                                           NA
## SourceGearNuke                                                                                           NA
## SourceGeek                                                                                               NA
## `SourceGeek Snack`                                                                                       NA
## SourceGeek.com                                                                                           NA
## SourceGeekSided                                                                                          NA
## SourceGeektime                                                                                           NA
## SourceGeekWire                                                                                           NA
## `SourceGeeky Gadgets`                                                                                    NA
## `SourceGeelong Advertiser`                                                                               NA
## SourceGematsu                                                                                            NA
## SourceGenomeWeb                                                                                          NA
## `SourceGeo News, Pakistan`                                                                               NA
## `SourceGeorgetown University The Hoya`                                                                   NA
## `SourceGeorgia Today`                                                                                    NA
## Sourcegetreading                                                                                         NA
## Sourcegetwestlondon                                                                                      NA
## `SourceGhacks Technology News`                                                                           NA
## `SourceGhana Broadcasting Corporation`                                                                   NA
## SourceGhanasoccernet.com                                                                                 NA
## SourceGhanaWeb                                                                                           NA
## SourceGhanaweb.com                                                                                       NA
## `SourceGia \\u009dnh Vnexpresss`                                                                         NA
## SourceGigaom                                                                                             NA
## `SourceGigaom via Yahoo! Finance`                                                                        NA
## `SourceGilmer Mirror`                                                                                    NA
## `SourceGippsland Times`                                                                                  NA
## `SourceGisborne Herald`                                                                                  NA
## SourceGizbot                                                                                             NA
## Sourcegizmag                                                                                             NA
## SourceGizmag                                                                                             NA
## SourceGizmodo                                                                                     2.075e+03
## `SourceGizmodo Australia`                                                                                NA
## `SourceGizmodo India`                                                                                    NA
## `SourceGizmodo UK`                                                                                       NA
## SourceGizmoids                                                                                           NA
## `SourceGladstone Observer`                                                                               NA
## SourceGlamour                                                                                            NA
## `SourceGlamour (blog)`                                                                                   NA
## `SourceGlasgow Daily Times`                                                                              NA
## `SourceGlasgow Evening Times`                                                                            NA
## `SourceGlens Falls Post-Star`                                                                            NA
## `SourceGlenwood Springs Post Independent`                                                                NA
## `SourceGlobal Envision`                                                                                  NA
## `SourceGlobal Grind`                                                                                     NA
## `SourceGlobal Indonesian Voices (GIVnews.com)`                                                           NA
## `SourceGlobal Investor`                                                                                  NA
## `SourceGlobal News`                                                                                      NA
## `SourceGlobal Risk Insights`                                                                             NA
## `SourceGlobal Times`                                                                                     NA
## `SourceGlobal Trade Review (GTR)`                                                                        NA
## `SourceGlobal Voices Online`                                                                             NA
## SourceGlobalMeatNews.com                                                                                 NA
## SourceGlobalnews.ca                                                                                      NA
## SourceGlobalPost                                                                                         NA
## `SourceGlobeNewswire (press release)`                                                                    NA
## `SourceGlobeNewswire via Yahoo Canada Finance`                                                           NA
## `SourceGlobeNewswire via Yahoo UK & Ireland Finance`                                                     NA
## `SourceGlobeNewswire via Yahoo! Finance`                                                                 NA
## `SourceGlobeNewswire via Yahoo! Finance India`                                                           NA
## `SourceGlobeNewswire via Yahoo! New Zealand Finance`                                                     NA
## `SourceGlobeNewswire via Yahoo!7 Finance`                                                                NA
## SourceGlobes                                                                                             NA
## `SourceGlobes Online`                                                                                    NA
## SourceGlobeSt.com                                                                                        NA
## `SourceGMA News`                                                                                         NA
## `SourceGMA News Online`                                                                                  NA
## `SourceGo Certify`                                                                                       NA
## SourceGoal.com                                                                                           NA
## `SourceGoal.com via Yahoo! Sports`                                                                       NA
## SourceGoDanRiver.com                                                                                     NA
## SourceGoErie.com                                                                                         NA
## `SourceGold Coast Bulletin`                                                                              NA
## `SourceGold Seek`                                                                                        NA
## `SourceGolden Gate Xpress`                                                                               NA
## SourceGoldSeek.com                                                                                       NA
## SourceGolf.com                                                                                           NA
## SourceGolfDigest.com                                                                                     NA
## SourceGoLocalProv                                                                                        NA
## `SourceGood Gear Guide`                                                                                  NA
## `SourceGOOD Magazine`                                                                                    NA
## `SourceGood Morning America via Yahoo! News`                                                             NA
## `SourceGood News Network`                                                                                NA
## `SourceGood News Pilipinas`                                                                              NA
## SourceGood4Utah                                                                                          NA
## `SourceGoodCall News (blog)`                                                                             NA
## `SourceGoogle (press release)`                                                                           NA
## SourceGOPUSA                                                                                             NA
## `SourceGoshen News`                                                                                      NA
## `SourceGospel Herald`                                                                                    NA
## `SourceGossip Monthly Magazine`                                                                          NA
## `SourceGotham Gazette`                                                                                   NA
## SourceGothamist                                                                                          NA
## `SourceGotta Be Mobile`                                                                                  NA
## SourceGovConWire                                                                                         NA
## `SourceGovernance Now`                                                                                   NA
## SourceGoverning                                                                                          NA
## `SourceGovernment of Canada News`                                                                        NA
## `SourceGovernment of Jamaica, Jamaica Information Service`                                               NA
## `SourceGovernment of Ontario News`                                                                       NA
## `SourceGovernment Technology`                                                                            NA
## `SourceGQ Magazine`                                                                                      NA
## SourceGQ.com                                                                                             NA
## `SourceGraham Cluley Security News`                                                                      NA
## `SourceGrand Forks Herald`                                                                               NA
## `SourceGrand Island Independent`                                                                         NA
## `SourceGrand Junction Daily Sentinel`                                                                    NA
## `SourceGrand Rapids Herald-Review`                                                                       NA
## `SourceGrand River Sachem`                                                                               NA
## `SourceGrande Prairie Daily Herald-Tribune`                                                              NA
## `SourceGreat Falls Tribune`                                                                              NA
## SourceGreatandhra.com                                                                                    NA
## `SourceGreater Baton Rouge Business Report`                                                              NA
## `SourceGreater Greater Washington`                                                                       NA
## `SourceGreater Kashmir`                                                                                  NA
## `SourceGreek Reporter`                                                                                   NA
## `SourceGreeley Tribune`                                                                                  NA
## `SourceGreen Bay Press Gazette`                                                                          NA
## `SourceGreen Car Reports`                                                                                NA
## `SourceGreen Left Weekly`                                                                                NA
## `SourceGreen Valley News`                                                                                NA
## SourceGreenBiz                                                                                           NA
## SourceGreenbot                                                                                           NA
## `SourceGreene County Messenger`                                                                          NA
## `SourceGreenfield Daily Reporter`                                                                        NA
## `SourceGreenock Telegraph`                                                                               NA
## `SourceGreensboro News & Record`                                                                         NA
## `SourceGreentech Media`                                                                                  NA
## `SourceGreenville News`                                                                                  NA
## `SourceGreenwich Time`                                                                                   NA
## `SourceGrimsby Telegraph`                                                                                NA
## SourceGrist                                                                                              NA
## `SourceGroesbeck Journal`                                                                                NA
## SourcegroovyPost                                                                                         NA
## `SourceGrub Street`                                                                                      NA
## SourceGSMArena.com                                                                                       NA
## `SourceGuardian Liberty Voice`                                                                           NA
## `SourceGuitar World Magazine`                                                                            NA
## `SourceGulf Business News`                                                                               NA
## `SourceGulf Digital News`                                                                                NA
## `SourceGulf News`                                                                                        NA
## `SourceGulf News Journal`                                                                                NA
## `SourceGulf News via Yahoo Maktoob News`                                                                 NA
## `SourceGulf Times`                                                                                       NA
## `SourceGulf Today`                                                                                       NA
## Sourcegulfnews.com                                                                                       NA
## SourceGuns.com                                                                                           NA
## `SourceGuru Focus`                                                                                       NA
## `Sourceguru3d.com (press release)`                                                                       NA
## SourceGuruFocus.com                                                                                      NA
## `SourceGuruFocus.com via Yahoo! Finance`                                                                 NA
## `SourceGW Today`                                                                                         NA
## `SourceGympie Times`                                                                                     NA
## `SourceH\\u009d\\u009d Ni Mi`                                                                            NA
## SourceHaaretz                                                                                            NA
## `SourceHaaretz Daily`                                                                                    NA
## `SourceHack Read`                                                                                        NA
## SourceHackaday                                                                                           NA
## SourceHaitilibre.com                                                                                     NA
## `SourceHamilton Journal News`                                                                            NA
## `SourceHamilton Spectator`                                                                               NA
## `SourceHampshire Chronicle`                                                                              NA
## `SourceHandelsblatt Global Edition (subscription)`                                                       NA
## `SourceHanford Sentinel`                                                                                 NA
## `SourceHardcore Gamer`                                                                                   NA
## `SourceHardOCP (press release)`                                                                          NA
## `SourceHardware Secrets`                                                                                 NA
## SourceHardwareZone                                                                                       NA
## `SourceHardwareZone via Yahoo! Philippines News`                                                         NA
## `SourceHardwareZone via Yahoo! Singapore News`                                                           NA
## SourceHarpersBAZAAR.com                                                                                  NA
## `SourceHartford Courant`                                                                                 NA
## `SourceHartlepool Mail`                                                                                  NA
## `SourceHarvard Business Review`                                                                          NA
## `SourceHarvard Gazette`                                                                                  NA
## `SourceHarvard Law Record`                                                                               NA
## `SourceHarvard Law School News`                                                                          NA
## `SourceHastings Tribune`                                                                                 NA
## `SourceHavana Times`                                                                                     NA
## Sourcehaveeruonline                                                                                      NA
## `SourceHawaii 24/7 (press release)`                                                                      NA
## `SourceHawaii News Now`                                                                                  NA
## `SourceHeadlines & Global News`                                                                          NA
## `SourceHealth Affairs (blog)`                                                                            NA
## `SourceHealth Aim`                                                                                       NA
## `SourceHealthcare IT News`                                                                               NA
## SourceHealthline                                                                                         NA
## `SourceHeat Street`                                                                                      NA
## `SourceHeavy Duty Trucking`                                                                              NA
## SourceHeavy.com                                                                                          NA
## `SourceHelena Daily World`                                                                               NA
## `SourceHelena Independent Record`                                                                        NA
## `SourceHellenic News of America`                                                                         NA
## `SourceHellenic Shipping News Worldwide`                                                                 NA
## `SourceHello Beautiful - Interactive One (blog)`                                                         NA
## Sourcehellomagazine.com                                                                                  NA
## `SourceHelsingin Sanomat`                                                                                NA
## `SourceHenderson Daily News`                                                                             NA
## `SourceHerald-Mail Media`                                                                                NA
## `SourceHerald & Review`                                                                                  NA
## `SourceHerald & Review (blog)`                                                                           NA
## `SourceHerald and News`                                                                                  NA
## `SourceHerald Scotland`                                                                                  NA
## `SourceHerald Sun`                                                                                       NA
## `SourceHerald Times Reporter`                                                                            NA
## SourceHerald.ie                                                                                          NA
## SourceHeraldNet                                                                                          NA
## `SourceHere And Now`                                                                                     NA
## `SourceHereford Times`                                                                                   NA
## `SourceHeritage Florida Jewish News`                                                                     NA
## `SourceHeritage Foundation`                                                                              NA
## SourceHeritage.org                                                                                       NA
## `SourceHerts and Essex Observer`                                                                         NA
## `SourceHexa News`                                                                                        NA
## SourceHEXUS                                                                                              NA
## `SourceHibbing Daily Tribune`                                                                            NA
## `SourceHickory Daily Record`                                                                             NA
## `SourceHigh Country News`                                                                                NA
## `SourceHigh Country Press`                                                                               NA
## `SourceHigh Plains Journal`                                                                              NA
## `SourceHigh Point University (press release) (blog)`                                                     NA
## `SourceHIGH TIMES`                                                                                       NA
## `SourceHighbrow Magazine`                                                                                NA
## `SourceHighlands Today`                                                                                  NA
## SourceHighsnobiety                                                                                       NA
## `SourceHill Times (subscription)`                                                                        NA
## `SourceHimalayan Times`                                                                                  NA
## `SourceHindu Business Line`                                                                              NA
## `SourceHindustan Times`                                                                                  NA
## `SourceHints News Network`                                                                               NA
## SourceHipHopDX                                                                                           NA
## `SourceHistory News Network (HNN)`                                                                       NA
## `SourceHIT Consultant`                                                                                   NA
## SourceHITC                                                                                               NA
## `SourceHollywood Life`                                                                                   NA
## `SourceHollywood Reporter`                                                                               NA
## SourceHolyrood.com                                                                                       NA
## SourceHometownlife.com                                                                                   NA
## `SourceHonest Reporting Canada`                                                                          NA
## SourceHonestreporting.com                                                                                NA
## `SourceHong Kong Free Press`                                                                             NA
## `SourceHong Kong Standard`                                                                               NA
## `SourceHong Kong Standard (press release)`                                                               NA
## `SourceHonolulu Civil Beat`                                                                              NA
## `SourceHonolulu Star-Advertiser`                                                                         NA
## `SourceHoosier Ag Today`                                                                                 NA
## `SourceHope Star`                                                                                        NA
## `SourceHornell Evening Tribune`                                                                          NA
## `SourceHospitality Net`                                                                                  NA
## `SourceHot Air`                                                                                          NA
## `SourceHot Hardware`                                                                                     NA
## `SourceHot Springs Sentinel`                                                                             NA
## `SourceHot Stocks Point`                                                                                 NA
## `SourceHotel News Now`                                                                                   NA
## `SourceHotel News Resource (press release)`                                                              NA
## `SourceHotelier Middle East`                                                                             NA
## SourceHotNewHipHop                                                                                       NA
## `SourceHouma Courier`                                                                                    NA
## SourceHousingWire                                                                                        NA
## `SourceHousingWire (blog)`                                                                               NA
## `SourceHouston Chronicle`                                                                                NA
## `SourceHouston Public Media`                                                                             NA
## `SourceHoustonia Magazine`                                                                               NA
## `SourceHoward University The District Chronicles`                                                        NA
## `SourceHowStuffWorks NOW`                                                                                NA
## SourceHPCwire                                                                                            NA
## `SourceHQ Grande Prairie`                                                                                NA
## SourceHRHub                                                                                              NA
## `SourceHSUS News`                                                                                        NA
## `SourceHSUS News (blog)`                                                                                 NA
## `Sourcehttp://hamodia.com`                                                                               NA
## `Sourcehttp://wales.gov.uk/`                                                                             NA
## `Sourcehttp://www.newsgram.com/`                                                                         NA
## `SourceHuddersfield Daily Examiner`                                                                      NA
## `SourceHuddersfield Examiner`                                                                            NA
## `SourceHuffington Post`                                                                                  NA
## `SourceHuffington Post (blog)`                                                                           NA
## `SourceHuffington Post Australia`                                                                        NA
## `SourceHuffington Post Canada`                                                                           NA
## `SourceHuffington Post India`                                                                            NA
## `SourceHuffington Post UK`                                                                               NA
## SourceHUH.                                                                                               NA
## `SourceHuman Capital`                                                                                    NA
## `SourceHuman Events`                                                                                     NA
## `SourceHuman Resources Online`                                                                           NA
## `SourceHuman Rights Campaign (blog)`                                                                     NA
## `SourceHuman Rights First`                                                                               NA
## `SourceHuman Rights First (blog)`                                                                        NA
## `SourceHuman Rights Watch`                                                                               NA
## SourceHumanosphere                                                                                       NA
## `SourceHungary Today`                                                                                    NA
## `SourceHuntington Herald Dispatch`                                                                       NA
## `SourceHuntsville Item`                                                                                  NA
## `SourceHuron Daily Tribune`                                                                              NA
## `SourceHurriyet Daily News`                                                                              NA
## `SourceHybrid Cars News`                                                                                 NA
## `SourceHyde Park Herald`                                                                                 NA
## SourceHydrocarbonOnline                                                                                  NA
## SourceHyperallergic                                                                                      NA
## `SourceHypergrid Business`                                                                               NA
## `SourceI am in dna of India`                                                                             NA
## Sourcei24news                                                                                            NA
## `SourceI4U News`                                                                                         NA
## SourceiAfrica.com                                                                                        NA
## `SourceIAM (registration) (blog)`                                                                        NA
## SourceiamWire                                                                                            NA
## `SourceIANS India Private Limited via Yahoo! India News`                                                 NA
## `SourceIANS India Private Limited via Yahoo! Singapore News`                                             NA
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! India News`                         1.689e+04
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! Singapore News`                     1.898e+04
## `SourceIANS via Yahoo Maktoob News`                                                               1.769e+04
## `SourceIANS via Yahoo! Finance India`                                                                    NA
## `SourceIB Times via Yahoo UK & Ireland News`                                                             NA
## `SourceIB Times via Yahoo! Singapore News`                                                               NA
## `SourceIBN live`                                                                                         NA
## SourceIBN7                                                                                               NA
## SourceIBNLive                                                                                            NA
## `SourceIBNLive (blog)`                                                                                   NA
## `SourceIceland Monitor`                                                                                  NA
## SourceIceNews                                                                                            NA
## SourceICIS                                                                                               NA
## SourceiClarified                                                                                         NA
## `SourceICRC (press release)`                                                                             NA
## `SourceIdaho State Journal`                                                                              NA
## `SourceIdaho Statesman`                                                                                  NA
## `SourceIDEX Online`                                                                                      NA
## SourceiDigitalTimes.com                                                                                  NA
## `SourceIDN InDepthNews | Analysis That Matters`                                                          NA
## `SourceIEEE Spectrum`                                                                                    NA
## `SourceiFiber One`                                                                                       NA
## SourceIGN                                                                                                NA
## `SourceIGN Videogames`                                                                                   NA
## `SourceIGN Xbox One Games`                                                                               NA
## `SourceIHS Electronics360`                                                                               NA
## `SourceIJ Review`                                                                                        NA
## SourceikhwanWeb.com                                                                                      NA
## `SourceIlford Recorder`                                                                                  NA
## `SourceIlford Recorder 24`                                                                               NA
## `SourceIllawarra Mercury`                                                                                NA
## SourceIlliniHQ.com                                                                                       NA
## Sourceiloubnan.info                                                                                      NA
## SourceiMediaEthics                                                                                       NA
## `SourceImmortal News`                                                                                    NA
## Sourceimpact24                                                                                           NA
## `SourceImperial College London`                                                                          NA
## `SourceImperial Valley Press`                                                                            NA
## `SourceIn-Cyprus (press release) (subscription) (blog)`                                                  NA
## `SourceIn Defense of Marxism`                                                                            NA
## `SourceIn Homeland Security`                                                                             NA
## `SourceIn These Times`                                                                                   NA
## SourceInc.com                                                                                            NA
## SourceInDaily                                                                                            NA
## `SourceIndependent Australia`                                                                            NA
## `SourceIndependent Catholic News`                                                                        NA
## `SourceIndependent Florida Alligator`                                                                    NA
## `SourceIndependent Media Review Analysis (IMRA)`                                                         NA
## `SourceIndependent Online`                                                                               NA
## `SourceIndependent Reporter`                                                                             NA
## `SourceIndependent Tribune`                                                                              NA
## SourceIndependent.ae                                                                                     NA
## SourceIndex.hr                                                                                           NA
## `SourceIndia Infoline`                                                                                   NA
## `SourceIndia Today`                                                                                      NA
## `SourceIndia Today Group via Yahoo! Finance India`                                                       NA
## `SourceIndia Tribune`                                                                                    NA
## `SourceIndia TV`                                                                                         NA
## SourceIndia.com                                                                                          NA
## Sourceindiablooms                                                                                        NA
## SourceIndiainfoline                                                                                      NA
## `SourceIndian Country Today Media Network`                                                               NA
## `SourceIndiana Public Media`                                                                             NA
## `SourceIndiana&#39;s NewsCenter`                                                                         NA
## `SourceIndianapolis Business Journal`                                                                    NA
## `SourceIndianapolis Business Journal (blog)`                                                             NA
## `SourceIndianapolis Star`                                                                                NA
## SourceIndiatimes.com                                                                                     NA
## `SourceIndie Shuffle Music News (blog)`                                                                  NA
## `SourceIndie Wire`                                                                                       NA
## `SourceIndie Wire (blog)`                                                                                NA
## `SourceIndo American News`                                                                               NA
## `SourceIndonesia Investments (press release)`                                                            NA
## `SourceIndustrial Laser Solutions Magazine`                                                              NA
## `SourceIndustry Leaders Magazine`                                                                        NA
## `SourceIndustry Week`                                                                                    NA
## SourceIndustryWeek                                                                                       NA
## SourceiNews                                                                                              NA
## SourceiNews880.com                                                                                       NA
## SourceInferse                                                                                            NA
## `Sourceinfo-europa`                                                                                      NA
## `SourceInfo-Palestine`                                                                                   NA
## `Sourceinfo komputer`                                                                                    NA
## SourceInfoQ.com                                                                                          NA
## `SourceInformation Age`                                                                           6.711e+07
## SourceInformationWeek                                                                                    NA
## SourceINFORUM                                                                                            NA
## `SourceInfosecurity Magazine`                                                                            NA
## `SourceInfoTel News Ltd`                                                                                 NA
## SourceInfoToday.com                                                                                      NA
## SourceInfoWorld                                                                                          NA
## SourceInhabitat                                                                                          NA
## `SourceInnovation Excellence (blog)`                                                                     NA
## SourceInquirer                                                                                           NA
## SourceInquirer.net                                                                                       NA
## `SourceInSerbia News`                                                                                    NA
## `SourceInside Bay Area`                                                                                  NA
## `SourceInside Edition`                                                                                   NA
## `SourceInside Higher Ed`                                                                                 NA
## `SourceInside Higher Ed (blog)`                                                                          NA
## `SourceInside INdiana Business`                                                                          NA
## `SourceInside NoVA`                                                                                      NA
## `SourceInside Trade`                                                                                     NA
## `SourceInside Tucson Business`                                                                           NA
## `SourceInside World Football`                                                                            NA
## `SourceInsideClimate News`                                                                               NA
## SourceInsideHalton.com                                                                                   NA
## `SourceInsider Louisville (press release) (registration)`                                                NA
## `SourceInsider Media`                                                                                    NA
## `SourceInsider Monkey (blog)`                                                                            NA
## `SourceInsider Trading Report`                                                                           NA
## SourceInsideSources                                                                                      NA
## `SourceInsight via Yahoo Canada Finance`                                                                 NA
## `SourceInstitute for Defence Studies and Analyses`                                                       NA
## `SourceInstitutional Investor`                                                                           NA
## `SourceInstitutional Investor (blog)`                                                                    NA
## SourceInStyle                                                                                            NA
## `SourceInsurance Journal`                                                                                NA
## `SourceIntelligence & Terrorism Information Center`                                                      NA
## `SourceIntelligence Online (subscription)`                                                               NA
## `SourceInter Press Service`                                                                              NA
## `SourceInteractive Investor`                                                                             NA
## SourceInterAksyon                                                                                        NA
## SourceInterfax                                                                                           NA
## `SourceIntermountain Jewish News`                                                                        NA
## `SourceInternational Adviser`                                                                            NA
## `SourceInternational Business Times`                                                              2.088e+03
## `SourceInternational Business Times AU`                                                                  NA
## `SourceInternational Business Times UK`                                                           1.999e+03
## `SourceInternational Business Times via Yahoo UK & Ireland News`                                  1.952e+03
## `SourceInternational Business Times, India Edition`                                                      NA
## `SourceInternational Business Times, Singapore Edition`                                                  NA
## `SourceInternational Chamber of Commerce`                                                                NA
## `SourceInternational Falls Journal`                                                                      NA
## `SourceInternational Federation of Red Cross and Red Crescent Societies`                                 NA
## `SourceInternational Herald Tribune`                                                                     NA
## `SourceInternational Middle East Media Center`                                                           NA
## `SourceInternational Monetary Fund`                                                                      NA
## `SourceInternational New York Times`                                                                     NA
## `SourceInternational Paralymic Committee`                                                                NA
## `SourceInternational Solidarity Movement`                                                                NA
## SourceinTheBay                                                                                           NA
## `SourceIntifada Palestine`                                                                               NA
## SourceInverse                                                                                            NA
## SourceInvestCorrectly                                                                                    NA
## SourceInvesting.com                                                                                      NA
## `SourceInvestment Executive`                                                                             NA
## `SourceInvestment U`                                                                                     NA
## `SourceInvestment Week`                                                                                  NA
## SourceInvestmentNews                                                                                     NA
## SourceInvestopedia                                                                                       NA
## `SourceInvestor's Business Daily`                                                                        NA
## `SourceInvestor Newswire`                                                                                NA
## SourceInvestorGuide                                                                                      NA
## `SourceInvestorIdeas.com (press release)`                                                                NA
## SourceInvestorplace.com                                                                                  NA
## `SourceInvestors Chronicle`                                                                              NA
## Sourceio9                                                                                                NA
## `SourceIoT Evolution World (blog)`                                                                       NA
## `SourceIoT Hub`                                                                                          NA
## `SourceIowa City Press Citizen`                                                                          NA
## `SourceiPolitics.ca (subscription)`                                                                      NA
## SourceiProgrammer                                                                                        NA
## `SourceIpsos News & Polls (subscription)`                                                                NA
## `SourceIpswich Star`                                                                                     NA
## SourceIPWatchdog.com                                                                                     NA
## `SourceIRA Market Report`                                                                                NA
## `SourceIran News Update`                                                                                 NA
## SourceIRINnews.org                                                                                       NA
## `SourceIrish Building Magazine`                                                                          NA
## `SourceIrish Examiner`                                                                                   NA
## `SourceIrish Independent`                                                                                NA
## `SourceIrish Legal News`                                                                                 NA
## `SourceIrish Mirror`                                                                                     NA
## `SourceIrish Times`                                                                                      NA
## SourceIrishCentral                                                                                       NA
## `SourceIrvine World News`                                                                                NA
## `SourceIs stories`                                                                                       NA
## SourceiSchoolGuide                                                                                       NA
## `SourceIsland Packet`                                                                                    NA
## `SourceIsland Sun`                                                                                       NA
## SourceISM                                                                                                NA
## SourceISPreview                                                                                          NA
## `SourceIsrael Hayom`                                                                                     NA
## `Sourceisrael heute ltd.`                                                                                NA
## `SourceIsrael Today`                                                                                     NA
## SourceIsraelValley                                                                                       NA
## SourceIsthmus                                                                                            NA
## `SourceIT Business Edge`                                                                                 NA
## `SourceIT Business Edge (blog)`                                                                          NA
## `SourceiT News`                                                                                          NA
## `SourceiT News (blog)`                                                                                   NA
## `SourceIT News Africa`                                                                                   NA
## `SourceIT PRO`                                                                                           NA
## `SourceIT World`                                                                                         NA
## `SourceIT World Canada`                                                                                  NA
## `SourceIT World Canada (blog)`                                                                           NA
## SourceITBusiness.ca                                                                                      NA
## `SourceiTech Post`                                                                                       NA
## `SourceIthaca Journal`                                                                                   NA
## SourceITProPortal                                                                                        NA
## `SourceITS International`                                                                                NA
## `SourceITV News`                                                                                         NA
## SourceITV.com                                                                                            NA
## SourceITWeb                                                                                              NA
## SourceiTWire                                                                                             NA
## `SourceiTWire (press release)`                                                                           NA
## SourceITworld                                                                                            NA
## `SourceJ-Wire Jewish Australian News Service`                                                            NA
## `SourceJ Weekly`                                                                                         NA
## `SourceJacaranda FM`                                                                                     NA
## `SourceJackson Clarion Ledger`                                                                           NA
## `SourceJackson Free Press`                                                                               NA
## `SourceJackson Hole News & Guide`                                                                        NA
## `SourceJackson Sun`                                                                                      NA
## `SourceJacksonville Business Journal`                                                                    NA
## `SourceJacksonville Daily Progress`                                                                      NA
## `SourceJacksonville Journal Courier`                                                                     NA
## `SourceJacobin magazine`                                                                                 NA
## SourceJadaliyya                                                                                          NA
## `SourceJakarta Globe`                                                                                    NA
## `SourceJakarta Post`                                                                                     NA
## SourceJalopnik                                                                                           NA
## `SourceJamaica Gleaner`                                                                                  NA
## `SourceJamaica Observer`                                                                                 NA
## `SourceJamestown Sun`                                                                                    NA
## `SourceJanesville Gazette`                                                                               NA
## `SourceJapan Today`                                                                                      NA
## `SourceJefferson City News Tribune`                                                                      NA
## `SourceJerusalem Center for Public Affairs`                                                              NA
## `SourceJerusalem Post Israel News`                                                                       NA
## `SourceJerusalem Post Israel News (blog)`                                                                NA
## `SourceJeune Afrique`                                                                                    NA
## `SourceJewish Business News`                                                                             NA
## `SourceJewish Chronicle`                                                                                 NA
## `SourceJewish Ledger`                                                                                    NA
## `SourceJewish Link of New Jersey`                                                                        NA
## `SourceJewish News`                                                                                      NA
## `SourceJewish Post`                                                                                      NA
## `SourceJewish Telegraphic Agency`                                                                        NA
## SourceJewschool                                                                                          NA
## SourceJezebel                                                                                            NA
## SourceJNS.org                                                                                            NA
## `SourceJobs & Hire`                                                                                      NA
## SourceJOC.com                                                                                            NA
## SourceJOE                                                                                                NA
## SourceJOE.co.uk                                                                                          NA
## `SourceJohannesburg Sunday World`                                                                        NA
## `SourceJohnson City Press`                                                                               NA
## `SourceJoplin Globe`                                                                                     NA
## `SourceJordan Times`                                                                                     NA
## `SourceJournal and Courier`                                                                              NA
## `SourceJournal Gazette and Times-Courier`                                                                NA
## `SourceJournal of Turkish Weekly`                                                                        NA
## `SourceJournal Online`                                                                                   NA
## `SourceJournal Pioneer`                                                                                  NA
## `SourceJournal Times`                                                                                    NA
## SourceJournalism.co.uk                                                                                   NA
## `SourceJP Updates`                                                                                       NA
## `SourceJspace News`                                                                                      NA
## `SourceJuneau Empire (subscription)`                                                                     NA
## `SourceJunior College`                                                                                   NA
## SourceJunkee                                                                                             NA
## SourceJURIST                                                                                             NA
## `Sourcejust-style.com (subscription)`                                                                    NA
## `SourceJust International`                                                                               NA
## `SourceJust Jared`                                                                                       NA
## `SourceJust Security`                                                                                    NA
## SourceJustmeans                                                                                          NA
## `SourceJustmeans (blog)`                                                                                 NA
## SourceJweekly.com                                                                                        NA
## `SourceK24 TV`                                                                                           NA
## `SourceKABC-TV`                                                                                          NA
## `SourceKABC-TV Los Angeles`                                                                              NA
## `SourceKaiser Family Foundation`                                                                         NA
## SourceKAKE                                                                                               NA
## SourceKALW                                                                                               NA
## SourceKanglaOnline                                                                                       NA
## `SourceKankakee Daily Journal`                                                                           NA
## `SourceKansas City Business Journal`                                                                     NA
## `SourceKansas City InfoZine`                                                                             NA
## `SourceKansas City Star`                                                                                 NA
## `SourceKansas City Star (blog)`                                                                          NA
## SourceKAPP                                                                                               NA
## SourceKARE                                                                                               NA
## SourceKARK                                                                                               NA
## `SourceKashmir Life`                                                                                     NA
## `SourceKashmir Media Service`                                                                            NA
## `SourceKashmir Reader`                                                                                   NA
## `SourceKashmir Watch`                                                                                    NA
## `SourceKasmir Monitor`                                                                                   NA
## `SourceKATC Lafayette News`                                                                              NA
## SourceKathimerini                                                                                        NA
## `SourceKathmandu Post`                                                                                   NA
## `SourceKatib\\u009d\\u009dn`                                                                             NA
## `SourceKatoikos.eu (satire) (registration) (blog)`                                                       NA
## SourceKATU                                                                                               NA
## SourceKATV                                                                                               NA
## `SourceKaufman Herald`                                                                                   NA
## `SourceKAUZ-TV`                                                                                          NA
## `SourceKawartha Media Group`                                                                             NA
## `SourceKawowo Sports`                                                                                    NA
## `SourceKBS WORLD Radio News`                                                                             NA
## SourceKBTX                                                                                               NA
## `SourceKBTX 3 Bryan - College Station`                                                                   NA
## `SourceKCBD-TV Lubbock`                                                                                  NA
## `SourceKCCI 8 Des Moines`                                                                                NA
## `SourceKCCI Des Moines`                                                                                  NA
## `SourceKCEN-TV`                                                                                          NA
## SourceKCET                                                                                               NA
## `SourceKCRA 3 Sacramento`                                                                                NA
## `SourceKCRA Sacramento`                                                                                  NA
## SourceKCRG                                                                                               NA
## `SourceKCTV 5 Kansas City`                                                                               NA
## `SourceKDLT News`                                                                                        NA
## SourceKdminer                                                                                            NA
## SourceKDramaStars                                                                                        NA
## `SourceKearney Hub`                                                                                      NA
## `SourceKELO AM-FM`                                                                                       NA
## `SourceKELOLAND TV`                                                                                      NA
## `SourceKelowna Capital News`                                                                             NA
## `SourceKenai Peninsula Online`                                                                           NA
## `SourceKennebec Journal & Morning Sentinel`                                                              NA
## `SourceKENS 5 TV`                                                                                        NA
## `SourceKent Online`                                                                                      NA
## `SourceKERA News`                                                                                        NA
## `SourceKERA North Texas`                                                                                 NA
## `SourceKern Golden Empire`                                                                               NA
## SourceKESQ                                                                                               NA
## `SourceKETV 7 Omaha`                                                                                     NA
## `SourceKETV Omaha`                                                                                       NA
## `SourceKEVN Black Hills Fox`                                                                             NA
## `SourceKewanee Star Courier`                                                                             NA
## `SourceKEYE TV`                                                                                          NA
## SourceKEYT                                                                                               NA
## SourceKFDA                                                                                               NA
## `SourceKFDA-TV Amarillo`                                                                                 NA
## SourceKFDI                                                                                               NA
## SourceKFGO                                                                                               NA
## Sourcekfor.com                                                                                           NA
## `SourceKFOX 14 El Paso`                                                                                  NA
## `SourceKFOX El Paso`                                                                                     NA
## `SourceKFSM Ft. Smith-Fayetteville`                                                                      NA
## `SourceKFSN-TV`                                                                                          NA
## `SourceKFSN-TV Fresno`                                                                                   NA
## SourceKFVS                                                                                               NA
## SourceKgab                                                                                               NA
## `SourceKGBT-TV`                                                                                          NA
## SourceKGMI                                                                                               NA
## SourceKGNS.tv                                                                                            NA
## `SourceKGO-TV`                                                                                           NA
## `SourceKGO-TV Bay Area`                                                                                  NA
## SourceKGOU                                                                                               NA
## `SourceKGTV San Diego`                                                                                   NA
## Sourcekgw.com                                                                                            NA
## `SourceKhaama Press (press release) (blog)`                                                              NA
## `SourceKhaleej Times`                                                                                    NA
## `SourceKhaleej Times via Yahoo Maktoob News`                                                             NA
## `SourceKHBS - KHOG Fort Smith - Fayetteville`                                                            NA
## SourceKHON2                                                                                              NA
## SourceKHOU                                                                                               NA
## SourceKHOU.com                                                                                           NA
## `SourceKHQ Right Now`                                                                                    NA
## `SourceKHQ Spokane`                                                                                      NA
## `SourceKiama Independent`                                                                                NA
## SourceKicker                                                                                             NA
## `SourceKIII TV3`                                                                                         NA
## `SourceKilgore News Herald`                                                                              NA
## `SourceKill Screen (blog)`                                                                               NA
## `SourceKilleen Daily Herald`                                                                             NA
## `SourceKIMT 3`                                                                                           NA
## SourceKING5.com                                                                                          NA
## SourceKIONrightnow.com                                                                                   NA
## `SourceKiplinger Personal Finance`                                                                       NA
## SourceKiplinger.com                                                                                      NA
## `SourceKipp Report`                                                                                      NA
## `SourceKIRO 7 Seattle-Tacoma`                                                                            NA
## `SourceKIRO Seattle`                                                                                     NA
## `SourceKitchener - Waterloo Record`                                                                      NA
## SourceKitGuru                                                                                            NA
## `SourceKitsap Sun`                                                                                       NA
## `SourceKITV Honolulu`                                                                                    NA
## `SourceKKTV 11 Colorado Springs`                                                                         NA
## `SourceKKTV 11 News`                                                                                     NA
## `SourceKLAS-TV`                                                                                          NA
## SourceKLTV                                                                                               NA
## `SourceKLTV 7 Tyler`                                                                                     NA
## `SourceKMBC-TV Kansas City`                                                                              NA
## `SourceKMBC Kansas City`                                                                                 NA
## SourceKMOV.com                                                                                           NA
## SourceKMUW                                                                                               NA
## `SourceKMWorld Magazine`                                                                                 NA
## `SourceKNBN Rapid City`                                                                                  NA
## Sourceknopnews2                                                                                          NA
## `SourceKnow Your Mobile`                                                                                 NA
## `SourceKnowledge at Wharton`                                                                             NA
## `SourceKnowledge Wharton Today`                                                                          NA
## `SourceKnowledge@Wharton`                                                                                NA
## `SourceKnowTechie (blog)`                                                                                NA
## `SourceKnoxville News Sentinel`                                                                          NA
## `SourceKOAA.com Colorado Springs and Pueblo News`                                                        NA
## `SourceKOAM-TV`                                                                                          NA
## `SourceKOAM-TV Pittsburg`                                                                                NA
## `SourceKOAT Albuquerque`                                                                                 NA
## `SourceKOB 4 Albuquerque`                                                                                NA
## SourceKOB.com                                                                                            NA
## `SourceKOBI-TV NBC5 / KOTI-TV NBC2`                                                                      NA
## `SourceKOCO 5 Oklahoma City`                                                                             NA
## `SourceKOCO Oklahoma City`                                                                               NA
## `SourceKokomo Tribune`                                                                                   NA
## `SourceKOLD News 13 Tuscon`                                                                              NA
## SourceKOLO                                                                                               NA
## `SourceKOLO 8 Reno`                                                                                      NA
## SourceKomando                                                                                            NA
## `SourceKOMO News`                                                                                        NA
## `SourceKOMO Seattle`                                                                                     NA
## `SourceKOMU Columbia`                                                                                    NA
## `SourceKorea JoongAng Daily`                                                                             NA
## `SourceKorea Portal (English Edition)`                                                                   NA
## `SourceKorea Times`                                                                                      NA
## SourceKOSU                                                                                               NA
## SourceKotaku                                                                                             NA
## `SourceKotaku Australia`                                                                                 NA
## SourceKotatv                                                                                             NA
## `SourceKPAX-TV`                                                                                          NA
## SourceKPBS                                                                                               NA
## `SourceKPBS San Diego`                                                                                   NA
## `SourceKPCC Pasadena`                                                                                    NA
## `Sourcekpfa 94.1fm`                                                                                      NA
## `SourceKPHO Phoenix`                                                                                     NA
## `SourceKPLR 11 St. Louis`                                                                                NA
## `SourceKPLU News for Seattle and the Northwest`                                                          NA
## `SourceKPRC Houston`                                                                                     NA
## `SourceKPRC Local 2 Houston`                                                                             NA
## `SourceKPVI News 6`                                                                                      NA
## SourceKQED                                                                                               NA
## SourceKRBD                                                                                               NA
## SourceKRCRTV.COM                                                                                         NA
## SourceKRDO                                                                                               NA
## `SourceKRDO Colorado Springs`                                                                            NA
## `SourceKrebs on Security`                                                                                NA
## SourceKRGV                                                                                               NA
## `SourceKRIS Corpus Christi News`                                                                         NA
## `SourceKRNV My News 4`                                                                                   NA
## SourceKRON4.com                                                                                          NA
## `SourceKRQE & KASA FOX 2 Albuquerque`                                                                    NA
## `SourceKRQE News 13`                                                                                     NA
## `SourceKRTV Great Falls News`                                                                            NA
## `SourceKSAT San Antonio`                                                                                 NA
## `SourceKSBY San Luis Obispo News`                                                                        NA
## SourceKSDK                                                                                               NA
## SourceKSDK.com                                                                                           NA
## SourceKSHB                                                                                               NA
## `SourceKSHB-TV Kansas City`                                                                              NA
## SourceKSL.com                                                                                            NA
## `SourceKSLA-TV`                                                                                          NA
## `SourceKSLA-TV Shreveport`                                                                               NA
## `SourceKSNT (press release) (registration) (blog)`                                                       NA
## SourceKSPR                                                                                               NA
## SourceKSWO                                                                                               NA
## `SourceKSWO Lawton-Wichita Falls`                                                                        NA
## SourceKTAL                                                                                               NA
## `SourceKTAL Shreveport`                                                                                  NA
## SourceKTAR.com                                                                                           NA
## SourceKTBS                                                                                               NA
## SourceKTIC                                                                                               NA
## SourceKTLA                                                                                               NA
## SourceKTOO                                                                                               NA
## SourceKTRE                                                                                               NA
## `SourceKTRE Lufkin and Nacogdoches`                                                                      NA
## `SourceKTRK-TV`                                                                                          NA
## `SourceKTTC Rochester`                                                                                   NA
## `SourceKTTS 94.7`                                                                                        NA
## SourceKTUL                                                                                               NA
## SourceKTUU.com                                                                                           NA
## `SourceKTVA.com - Anchorage, Alaska`                                                                     NA
## SourceKTVB                                                                                               NA
## SourceKTVB.com                                                                                           NA
## SourceKTVN                                                                                               NA
## `SourceKTVN Reno`                                                                                        NA
## `SourceKTVQ Billings News`                                                                               NA
## `SourceKTVU San Francisco`                                                                               NA
## SourceKTVZ                                                                                               NA
## SourceKTXS                                                                                               NA
## `SourceKuensel, Buhutan's National Newspaper`                                                            NA
## `SourceKUOW News and Information`                                                                        NA
## SourceKUT                                                                                                NA
## `SourceKUTV 2News`                                                                                       NA
## `SourceKuwait News Agency`                                                                               NA
## `SourceKuwait Times`                                                                                     NA
## `SourceKVOA Tucson News`                                                                                 NA
## SourceKVUE                                                                                               NA
## SourceKVUE.com                                                                                           NA
## Sourcekwbe                                                                                               NA
## SourceKWCH                                                                                               NA
## `SourceKWQC-TV6`                                                                                         NA
## `SourceKWTV News9`                                                                                       NA
## Sourcekwwl.com                                                                                           NA
## `SourceKX TV North Dakota`                                                                               NA
## SourceKXAN.com                                                                                           NA
## `SourceKXLH Helena News`                                                                                 NA
## SourceKXNet.com                                                                                          NA
## `SourceKXXV News Channel 25`                                                                             NA
## `SourceKXXV Waco`                                                                                        NA
## SourceKY3                                                                                                NA
## `SourceKyiv Post`                                                                                        NA
## `SourceKYIV Post`                                                                                        NA
## `SourceKykernel.com (subscription)`                                                                      NA
## SourceKYMA                                                                                               NA
## SourceKYTX                                                                                               NA
## SourceKYUK                                                                                               NA
## `SourceL'Express`                                                                                        NA
## `SourceL'Expression`                                                                                     NA
## `SourceL'Humanit\\u009d\\u009d`                                                                          NA
## `SourceL'Humanité`                                                                                       NA
## `SourceL'info en direct d'Isra\\u009d\\u009dl 24h/24 (Communiqu\\u009d\\u009d de presse) (Blog)`         NA
## `SourceL'Orient-Le Jour`                                                                                 NA
## `SourceL&#39;Atelier`                                                                                    NA
## `SourceL.A. Biz`                                                                                         NA
## `SourceL.A. Weekly`                                                                                      NA
## `SourceLa Croix`                                                                                         NA
## `SourceLa Crosse Tribune`                                                                                NA
## `SourceLA Daily News`                                                                                    NA
## SourceLabourList                                                                                         NA
## Sourceladepeche.fr                                                                                       NA
## `SourceLadysmith Gazette`                                                                                NA
## SourceLAist                                                                                              NA
## `SourceLake Cowichan Gazette`                                                                            NA
## `SourceLake Tahoe News`                                                                                  NA
## SourceLakenewsonline.com                                                                                 NA
## `SourceLakeshore Public Media`                                                                           NA
## `SourceLamorinda Sun`                                                                                    NA
## `SourceLancashire Evening Post`                                                                          NA
## `SourceLancashire Telegraph`                                                                             NA
## `SourceLancaster Eagle Gazette`                                                                          NA
## `SourceLancaster Today`                                                                                  NA
## SourceLancasterOnline                                                                                    NA
## `SourceLanka Business Online`                                                                            NA
## `SourceLansing State Journal`                                                                            NA
## `SourceLaptop Mag`                                                                                       NA
## `SourceLas Cruces Sun-News`                                                                              NA
## `SourceLas Vegas Review-Journal`                                                                         NA
## `SourceLas Vegas Review-Journal (blog)`                                                                  NA
## `SourceLas Vegas Sun`                                                                                    NA
## `SourceLast Night On`                                                                                    NA
## `SourceLatin American Herald Tribune`                                                                    NA
## `SourceLatin Correspondent`                                                                              NA
## `SourceLatin Post`                                                                                       NA
## `SourceLatin Times`                                                                                      NA
## `SourceLatino Post`                                                                                      NA
## `SourceLatinos Post`                                                                                     NA
## `SourceLawfare (blog)`                                                                                   NA
## SourceLawNewz                                                                                            NA
## `SourceLawrence Berkeley National Laboratory`                                                            NA
## `SourceLawrence Journal-World`                                                                           NA
## `SourceLawrence Journal World`                                                                           NA
## `SourceLawrence Journal World (blog)`                                                                    NA
## `SourceLawyer Herald`                                                                                    NA
## `SourceLayman Online`                                                                                    NA
## SourceLazygamer                                                                                          NA
## `SourceLBC 97.3`                                                                                         NA
## `SourceLe Club de Mediapart (Blog)`                                                                      NA
## `SourceLe Figaro`                                                                                        NA
## `SourceLe Grand Soir.info`                                                                               NA
## `SourceLe Mauricien`                                                                                     NA
## `SourceLe Mirabel`                                                                                       NA
## `SourceLe Monde`                                                                                         NA
## `SourceLe Monde Diplomatique`                                                                            NA
## `SourceLe Monde Diplomatique (blog)`                                                                     NA
## `SourceLe Parisien`                                                                                      NA
## `SourceLe Soleil`                                                                                        NA
## `SourceLe T\\u009d\\u009dl\\u009d\\u009dgramme`                                                          NA
## `SourceLeader-Telegram`                                                                                  NA
## `SourceLeader Journal`                                                                                   NA
## `SourceLeaders Tunisie`                                                                                  NA
## `SourceLeadership Newspapers`                                                                            NA
## SourceLeafly                                                                                             NA
## `SourceLeamington Courier`                                                                               NA
## SourceLearnBonds                                                                                         NA
## SourceLEDinside                                                                                          NA
## `SourceLee's Summit Journal`                                                                             NA
## `SourceLeek Post & Times`                                                                                NA
## `SourceLeesville Daily Leader`                                                                           NA
## SourceLeFaso.net                                                                                         NA
## `SourceLeft Foot Forward`                                                                                NA
## `SourceLeftLane News`                                                                                    NA
## `Sourcelegal Insurrection (blog)`                                                                        NA
## `SourceLehigh Valley Business`                                                                           NA
## Sourcelehighvalleylive.com                                                                               NA
## `SourceLeicester Mercury`                                                                                NA
## SourceleJDD.fr                                                                                           NA
## SourceleJSD                                                                                              NA
## `SourceLet Me Know About This`                                                                           NA
## `SourceLethbridge Herald`                                                                                NA
## Sourceletsrecycle.com                                                                                    NA
## `SourceLexington Herald-Leader`                                                                          NA
## `SourceLexington Herald Leader`                                                                          NA
## `SourceLexology (registration)`                                                                          NA
## `SourceLGBTQ Nation`                                                                                     NA
## `SourceLiberal Democrat Voice`                                                                           NA
## SourceLiberation                                                                                         NA
## `SourceLiberian Daily Observer`                                                                          NA
## `SourceLiberty News Now`                                                                                 NA
## SourceLifehacker                                                                                         NA
## `SourceLifehacker Australia`                                                                             NA
## `SourceLifehacker UK`                                                                                    NA
## SourceLifeNews.com                                                                                       NA
## SourceLifesite                                                                                           NA
## SourceLifestyles                                                                                         NA
## SourceLifeZette                                                                                          NA
## `SourceLight Reading`                                                                                    NA
## SourceLiliputing                                                                                         NA
## `SourceLim Kit Siang`                                                                                    NA
## `SourceLimerick Post`                                                                                    NA
## `SourceLincoln Journal Star`                                                                             NA
## `SourceLincolnshire Echo`                                                                                NA
## `SourceLinkedIn (blog)`                                                                                  NA
## `SourceLinn's Stamp News`                                                                                NA
## SourceLinux                                                                                              NA
## `SourceLinux Journal`                                                                                    NA
## `SourceLinux Today`                                                                                      NA
## `SourceLinux.com (blog)`                                                                                 NA
## SourceLinuxInsider.com                                                                                   NA
## `SourceLion's Roar`                                                                                      NA
## `SourceLisbon Morning Journal`                                                                           NA
## `SourceLive 5 News Charleston`                                                                           NA
## `SourceLive Science`                                                                                     NA
## `SourceLive Trading News`                                                                                NA
## SourceLivemint                                                                                           NA
## `SourceLiverpool Echo`                                                                                   NA
## `SourceLiveScience.com via Yahoo! News`                                                                  NA
## `SourceLivingston Daily`                                                                                 NA
## SourceLLRX.com                                                                                           NA
## SourceLobeLog                                                                                            NA
## `SourceLocal 10`                                                                                         NA
## `SourceLocal 10 Miami`                                                                                   NA
## `SourceLocal 6 Orlando`                                                                                  NA
## `SourceLocal 8 Now`                                                                                      NA
## SourceLocalNews8.com                                                                                     NA
## `SourceLockport Union-Sun & Journal`                                                                     NA
## `SourceLogistics Management`                                                                             NA
## `SourceLompoc Record`                                                                                    NA
## `SourceLondon Evening Standard`                                                                          NA
## `SourceLondon Free Press`                                                                                NA
## `SourceLondon Loves Business`                                                                            NA
## `SourceLondon Review of Books (subscription)`                                                            NA
## `SourceLondon School of Business and Finance (blog)`                                                     NA
## `SourceLondon South East (registration) (blog)`                                                          NA
## SourceLondon24                                                                                           NA
## `SourceLondonderry Today`                                                                                NA
## SourceLondonist                                                                                          NA
## `SourceLong Beach Press Telegram`                                                                        NA
## `SourceLong Island Business News`                                                                        NA
## `SourceLong Island Business News (subscription)`                                                         NA
## `SourceLong War Journal`                                                                                 NA
## `SourceLongview Daily News`                                                                              NA
## `SourceLongview News-Journal`                                                                            NA
## `SourceLonoke News`                                                                                      NA
## `SourceLos Angeles Business Journal`                                                                     NA
## `SourceLos Angeles Daily News`                                                                           NA
## `SourceLos Angeles Sun Times`                                                                            NA
## `SourceLos Angeles Times`                                                                                NA
## `SourceLost Coast Outpost`                                                                               NA
## SourceLoudwire                                                                                           NA
## `SourceLowell Sun`                                                                                       NA
## SourceLubbockOnline.com                                                                                  NA
## `SourceLudwig von Mises Institute`                                                                       NA
## `SourceLusaka Times`                                                                                     NA
## `SourceLuton Today`                                                                                      NA
## `SourceLuxemburger Wort - English Edition`                                                               NA
## `SourceLuxury Daily`                                                                                     NA
## `SourceLynchburg News and Advance`                                                                       NA
## `SourceLynn News`                                                                                        NA
## `SourceM\\u009d\\u009ddecins Sans Fronti\\u009d\\u009dres (MSF) International`                           NA
## `SourceM\\u009d\\u009ddias-Presse-Info`                                                                  NA
## `SourceM\\u009d\\u009dtro Montr\\u009d\\u009dal`                                                         NA
## `SourceMac Kung Fu (satire) (blog)`                                                                      NA
## `SourceMac Rumors`                                                                                       NA
## `SourceMacau Daily Times`                                                                                NA
## SourceMacDailyNews                                                                                       NA
## `SourceMackay Daily Mercury`                                                                             NA
## SourceMacleans.ca                                                                                        NA
## SourceMacNN                                                                                              NA
## `SourceMacroBusiness (blog)`                                                                             NA
## SourceMacworld                                                                                           NA
## `SourceMacworld (blog)`                                                                                  NA
## `SourceMacworld UK`                                                                               2.103e+03
## `SourceMadame Figaro`                                                                                    NA
## `SourceMadame Noire`                                                                                     NA
## SourceMadameNoire                                                                                        NA
## SourceMadison.com                                                                                        NA
## `SourceMaidenhead Advertiser`                                                                            NA
## `SourceMail & Guardian`                                                                                  NA
## `SourceMail & Guardian Africa`                                                                           NA
## `SourceMail & Guardian Online`                                                                           NA
## `SourceMail Today via Yahoo! India News`                                                                 NA
## `SourceMain Line Times`                                                                                  NA
## `SourceMaine Public Broadcasting`                                                                        NA
## SourceMainStreet                                                                                         NA
## `SourceMaison des Droits de l'Homme de Limoges`                                                          NA
## SourceMakeUseOf                                                                                          NA
## SourceMalawi24                                                                                           NA
## `SourceMalay Mail Online`                                                                                NA
## `SourceMalaysia Chronicle`                                                                               NA
## `SourceMalaysiakini (subscription)`                                                                      NA
## `SourceMalaysian Digest`                                                                                 NA
## Sourcemalaysiandigest.com                                                                                NA
## `SourceMalta Independent Online`                                                                         NA
## `SourceMalta Independent Online (blog)`                                                                  NA
## `SourceMalta Star`                                                                                       NA
## SourceMaltaToday                                                                                         NA
## `SourceMaltaToday (blog)`                                                                                NA
## `SourceManagement Today`                                                                                 NA
## `SourceManawatu Standard`                                                                                NA
## `SourceManchester Evening News`                                                                          NA
## `SourceManila Bulletin`                                                                                  NA
## `SourceManila Standard Today`                                                                            NA
## `SourceMankato Free Press`                                                                               NA
## `SourceMansfield News Journal`                                                                           NA
## SourceManufacturing.net                                                                                  NA
## `SourceManx Radio`                                                                                       NA
## `SourceMaple Ridge News`                                                                                 NA
## `SourceMaple Ridge Times`                                                                                NA
## SourceMarca                                                                                              NA
## `SourceMarie Claire Australia`                                                                           NA
## SourceMarieClaire.com                                                                                    NA
## `SourceMarine Corps Times`                                                                               NA
## SourceMarineLink                                                                                         NA
## `SourceMarket Exclusive`                                                                                 NA
## `SourceMarket Realist`                                                                                   NA
## `SourceMarket Realist via Yahoo Canada Finance`                                                          NA
## `SourceMarket Realist via Yahoo UK & Ireland Finance`                                                    NA
## `SourceMarket Realist via Yahoo! Finance`                                                         1.974e+03
## `SourceMarket Realist via Yahoo! Finance India`                                                          NA
## `SourceMarket Realist via Yahoo! New Zealand Finance`                                                    NA
## `SourceMarket Realist via Yahoo!7 Finance`                                                               NA
## `SourceMarket Watch`                                                                                     NA
## SourceMarketing                                                                                          NA
## `SourceMarketing Interactive`                                                                            NA
## `SourceMarketing Land`                                                                                   NA
## `SourceMarketing magazine Australia (registration)`                                                      NA
## `SourceMarketingProfs.com (subscription)`                                                                NA
## SourceMarketplace.org                                                                                    NA
## `SourceMarketPulse (blog)`                                                                               NA
## `SourceMarkets Daily`                                                                                    NA
## `SourceMarkets Morning`                                                                                  NA
## SourceMarketWatch                                                                                        NA
## `SourceMarketWatch (blog)`                                                                               NA
## `SourceMarketWatch via Yahoo Canada Finance`                                                             NA
## `SourceMarketWatch via Yahoo UK & Ireland Finance`                                                       NA
## `SourceMarketWatch via Yahoo! Finance`                                                                   NA
## `SourceMarketWatch via Yahoo! Finance India`                                                             NA
## `SourceMarketWatch via Yahoo! New Zealand Finance`                                                       NA
## `SourceMarketWatch via Yahoo! News`                                                                      NA
## `SourceMarketWatch via Yahoo!7 Finance`                                                                  NA
## SourceMarketwire                                                                                         NA
## `SourceMarketwired (press release)`                                                                      NA
## `SourceMarketwired via Yahoo Canada Finance`                                                             NA
## `SourceMarketwired via Yahoo UK & Ireland Finance`                                                       NA
## `SourceMarketwired via Yahoo! Finance`                                                                   NA
## `SourceMarlborough Express`                                                                              NA
## `SourceMarquette Wire`                                                                                   NA
## `SourceMarTech Advisor`                                                                                  NA
## `SourceMartins Ferry Times Leader`                                                                       NA
## `SourceMartinsburg Journal`                                                                              NA
## `SourceMaryland Daily Record (subscription)`                                                             NA
## SourceMashable                                                                                    2.493e+03
## `SourceMashable Tech via Yahoo UK & Ireland News`                                                        NA
## `SourceMashable via Yahoo Canada News`                                                                   NA
## `SourceMashable via Yahoo! News`                                                                         NA
## `SourceMason City Globe Gazette`                                                                         NA
## `SourceMass Device`                                                                                      NA
## SourceMassLive.com                                                                                       NA
## `SourceMasterstudies News (blog)`                                                                        NA
## `SourceMaterial Handling & Logistics`                                                                    NA
## `SourceMaui Now`                                                                                         NA
## `SourceMaximum PC`                                                                                       NA
## `SourceMcClatchy Washington Bureau`                                                                      NA
## SourceMCV                                                                                                NA
## `SourceMeadville Tribune`                                                                                NA
## `SourceMeat and Poultry Online`                                                                          NA
## `SourceMed Device Online (press release)`                                                                NA
## `SourceMedCity News`                                                                                     NA
## `SourceMedia Life Magazine`                                                                              NA
## `SourceMedia Matters for America`                                                                        NA
## `SourceMedia Matters for America (blog)`                                                                 NA
## SourceMediaite                                                                                           NA
## SourceMediapart                                                                                          NA
## SourceMediaPost                                                                                          NA
## `SourceMediaPost Communications`                                                                         NA
## `SourceMedical Daily`                                                                                    NA
## `SourceMedical Xpress`                                                                                   NA
## `SourceMedicine Hat News`                                                                                NA
## SourceMedicineNet.com                                                                                    NA
## `SourceMedill Reports: Chicago`                                                                          NA
## `SourceMedPage Today`                                                                                    NA
## `SourceMEED (subscription)`                                                                              NA
## SourceMegaGames                                                                                          NA
## `SourceMehr News Agency - English Version`                                                               NA
## SourceMemeburn                                                                                           NA
## `SourceMemorial Examiner`                                                                                NA
## `SourceMemphis Business Journal`                                                                         NA
## `SourceMemphis Business Journal (blog)`                                                                  NA
## `SourceMemphis Commercial Appeal`                                                                        NA
## `SourceMemphis Daily News (blog)`                                                                        NA
## `SourceMemphis Flyer`                                                                                    NA
## `SourceMen's News Daily`                                                                                 NA
## `SourceMen&#39;s Journal Tech via Yahoo! News`                                                           NA
## SourceMENAFN                                                                                      2.976e+04
## SourceMENAFN.COM                                                                                         NA
## `SourceMennonite World Review`                                                                           NA
## SourceMensquare                                                                                          NA
## `SourceMerced Sun-Star`                                                                                  NA
## SourceMercoPress                                                                                         NA
## `SourceMercury Daily (blog)`                                                                             NA
## `SourceMeriden Record-Journal`                                                                           NA
## `SourceMeridian Booster`                                                                                 NA
## `SourceMeridian Star`                                                                                    NA
## SourceMerinews                                                                                           NA
## `SourceMeriTalk (blog)`                                                                                  NA
## `SourceMERRY JANE`                                                                                       NA
## `SourceMetal Injection.net`                                                                              NA
## SourceMetalMiner                                                                                         NA
## SourceMetro                                                                                       1.900e+03
## `SourceMetro Halifax`                                                                                    NA
## `SourceMetro TV News`                                                                                    NA
## SourceMetro.us                                                                                           NA
## `SourceMetroNews Canada`                                                                                 NA
## SourceMetrotvnews.com                                                                                    NA
## `SourceMetroWest Daily News`                                                                             NA
## `SourceMFA China`                                                                                        NA
## `SourceMiami Herald`                                                                                     NA
## `SourceMiami Herald (blog)`                                                                              NA
## `SourceMiami New Times`                                                                                  NA
## SourceMiBiz                                                                                              NA
## SourceMic                                                                                                NA
## Sourcemicebtn                                                                                            NA
## `SourceMichigan Journal`                                                                                 NA
## `SourceMichigan Radio`                                                                                   NA
## `SourceMichigan State University Extension`                                                              NA
## SourceMichronicleonline                                                                                  NA
## `SourceMicroCap Magazine`                                                                                NA
## `SourceMicrogrid Knowledge`                                                                              NA
## SourceMicroScope                                                                                         NA
## `SourceMicrosoft - Channel 9`                                                                            NA
## `SourceMicrosoft - Channel 9 (blog)`                                                                     NA
## `SourceMid-Day`                                                                                          NA
## `SourceMiddle East Confidential`                                                                         NA
## `SourceMiddle East Eye`                                                                                  NA
## `SourceMiddle East Forum`                                                                                NA
## `SourceMiddle East Forum (blog)`                                                                         NA
## `SourceMiddle East Monitor`                                                                              NA
## `SourceMiddle East Monitor (blog)`                                                                       NA
## `SourceMiddle East Newsline`                                                                             NA
## `SourceMiddle East Online`                                                                               NA
## `SourceMiddle East Report Online`                                                                        NA
## `SourceMiddletown Press`                                                                                 NA
## `SourceMidland Daily News`                                                                               NA
## `SourceMidland Reporter-Telegram`                                                                        NA
## `SourceMidlothian Exchange`                                                                              NA
## `SourceMilitary Times`                                                                                   NA
## SourceMilitary.com                                                                                       NA
## `SourceMille Babords (Communiqu\\u009d\\u009d de presse)`                                                NA
## `SourceMilli Gazette`                                                                                    NA
## `SourceMilpitas Post`                                                                                    NA
## `SourceMilwaukee Business Journal`                                                                       NA
## `SourceMilwaukee Journal Sentinel`                                                                       NA
## `SourceMilwaukee Journal Sentinel (blog)`                                                                NA
## SourceMINA                                                                                               NA
## SourceMineweb                                                                                            NA
## `SourceMining Journal (subscription)`                                                                    NA
## `SourceMining MX`                                                                                        NA
## SourceMINING.com                                                                                         NA
## `SourceMinistry of External Affairs (press release)`                                                     NA
## `SourceMinistry of Foreign Affairs of Denmark`                                                           NA
## `SourceMinneapolis-St. Paul Star Tribune`                                                                NA
## `SourceMinneapolis Star Tribune`                                                                         NA
## `SourceMinneapolis Sun Times`                                                                            NA
## `SourceMinnesota Daily`                                                                                  NA
## `SourceMinnesota Public Radio`                                                                           NA
## `SourceMinnesota Public Radio News`                                                                      NA
## SourceMinnPost                                                                                           NA
## `SourceMintpress News (blog)`                                                                            NA
## SourceMinyanville.com                                                                                    NA
## `SourceMirage News`                                                                                      NA
## SourceMirror.co.uk                                                                                       NA
## `SourceMIS Asia`                                                                                         NA
## `SourceMiscellany News`                                                                                  NA
## SourceMississauga                                                                                        NA
## `SourceMississauga News`                                                                                 NA
## `SourceMississippi Business Journal`                                                                     NA
## `SourceMississippi News Now`                                                                             NA
## `SourceMIT News`                                                                                         NA
## `SourceMIT Technology Review`                                                                            NA
## `SourceMitzpeh (press release)`                                                                          NA
## SourceMixmag                                                                                             NA
## `SourceMizzima News`                                                                                     NA
## SourceMLive.com                                                                                          NA
## `SourceMLT News`                                                                                         NA
## SourceMMAjunkie.com                                                                                      NA
## `SourceMmegi Online`                                                                                     NA
## SourceMMH.com                                                                                            NA
## `SourceMNR Daily`                                                                                        NA
## `SourceMo4ch News (press release) (blog)`                                                                NA
## `SourceMoberly Monitor-Index`                                                                            NA
## SourceMobiHealthNews                                                                                     NA
## `SourceMobile & Apps`                                                                                    NA
## `SourceMobile Burn`                                                                                      NA
## `SourceMobile Choice`                                                                                    NA
## `SourceMobile Computing Today`                                                                           NA
## `SourceMobile ID World`                                                                                  NA
## `SourceMobile News`                                                                                      NA
## `SourceMobile Payments Today`                                                                            NA
## `SourceMobile Press-Register`                                                                            NA
## `SourceMobile Today`                                                                                     NA
## `SourceMobile World Live`                                                                                NA
## SourceMobileSyrup.com                                                                                    NA
## SourceMobiPicker                                                                                         NA
## `SourceModel D`                                                                                          NA
## `SourceModern Diplomacy`                                                                                 NA
## `SourceModern Distribution Management`                                                                   NA
## SourceModernHealthcare.com                                                                               NA
## SourceModernMedicine                                                                                     NA
## `SourceModest Money (press release) (blog)`                                                              NA
## `SourceMohave Daily News`                                                                                NA
## `SourceMohave Valley News`                                                                               NA
## `SourceMonadnock Ledger Transcript`                                                                      NA
## `SourceMondaq News Alerts (registration)`                                                                NA
## SourceMondoweiss                                                                                         NA
## SourceMoney                                                                                              NA
## `SourceMoney Flow Index`                                                                                 NA
## `SourceMoney Magazine`                                                                                   NA
## `SourceMoney Marketing`                                                                                  NA
## `SourceMoney Marketing Online`                                                                           NA
## `SourceMoney Morning`                                                                                    NA
## `SourceMoney Morning Australia`                                                                          NA
## `SourceMoney News (press release)`                                                                       NA
## `SourceMoney Talks News via Yahoo! Finance`                                                              NA
## SourceMoneycontrol.com                                                                                   NA
## SourceMoneySense                                                                                         NA
## SourceMoneyweb.co.za                                                                                     NA
## SourceMoneyWeek                                                                                          NA
## SourceMonitor                                                                                            NA
## `SourceMonitor Online (blog)`                                                                            NA
## `SourceMonroe Evening News`                                                                              NA
## `SourceMonroe News Star`                                                                                 NA
## `SourceMontana Standard`                                                                                 NA
## `SourceMontana Tech`                                                                                     NA
## `SourceMonterey County Weekly`                                                                           NA
## `SourceMontgomery Advertiser`                                                                            NA
## `SourceMonthly Review`                                                                                   NA
## `SourceMontreal Gazette`                                                                                 NA
## `SourceMontserrat Reporter`                                                                              NA
## `SourceMoodys.com (press release) (subscription)`                                                        NA
## `SourceMorning Consult`                                                                                  NA
## `SourceMorning Journal News`                                                                             NA
## `SourceMorning News USA`                                                                                 NA
## `SourceMorning Star`                                                                                     NA
## `SourceMorning Star Online`                                                                              NA
## `SourceMorning Ticker`                                                                                   NA
## SourceMorningstar                                                                                        NA
## SourceMorningstar.com                                                                                    NA
## `SourceMorocco World News`                                                                               NA
## `SourceMorris Daily Herald`                                                                              NA
## `SourceMother Jones`                                                                                     NA
## `SourceMother Nature Network (blog)`                                                                     NA
## SourceMotherboard                                                                                        NA
## `SourceMotley Fool`                                                                                      NA
## `SourceMotley Fool Australia`                                                                            NA
## `SourceMotor Trend`                                                                                      NA
## SourceMotoring                                                                                           NA
## `SourceMotorsport.com, Edition: Global`                                                                  NA
## SourceMotorTrend                                                                                         NA
## `SourceMountain View Voice`                                                                              NA
## `SourceMovie TV Tech Geeks News`                                                                         NA
## SourceMoviefone                                                                                          NA
## Sourcemoviepilot.com                                                                                     NA
## SourceMovieWeb                                                                                           NA
## `SourceMRCTV (blog)`                                                                                     NA
## `SourceMRCTV (satire) (blog)`                                                                            NA
## `SourceMrTopStep.com via Yahoo! Finance`                                                                 NA
## SourceMSDynamicsWorld.com                                                                                NA
## `SourceMSN Autos`                                                                                        NA
## SourceMSNBC                                                                                              NA
## SourceMSPmentor                                                                                          NA
## `SourceMSPmentor (blog)`                                                                                 NA
## SourceMSPoweruser.com                                                                                    NA
## SourceMTPR                                                                                               NA
## SourceMTV.com                                                                                            NA
## `SourceMulti-Housing News`                                                                               NA
## `SourceMultichannel News`                                                                                NA
## `SourceMumbai Mirror`                                                                                    NA
## SourceMuMbrella                                                                                          NA
## `SourceMunchies_ Food by VICE`                                                                           NA
## `SourceMuncie Star Press`                                                                                NA
## `SourceMuscat Daily`                                                                                     NA
## `SourceMuscatine Journal`                                                                                NA
## `SourceMusic Business Worldwide`                                                                         NA
## SourceMusicrooms.net                                                                                     NA
## `SourceMuslimVillage.com (press release) (blog)`                                                         NA
## `SourceMWC News`                                                                                         NA
## `SourceMy Fox Boston`                                                                                    NA
## `SourceMy News LA`                                                                                       NA
## `SourceMy Nintendo News (blog)`                                                                          NA
## `SourceMy Twin Tiers.com`                                                                                NA
## SourceMyAJC                                                                                              NA
## `SourceMyAJC (blog)`                                                                                     NA
## `SourceMyanmar Times`                                                                                    NA
## SourceMyBroadband                                                                                        NA
## SourceMyCentralJersey.com                                                                                NA
## SourceMyDaytonDailyNews                                                                                  NA
## Sourcemyfox8.com                                                                                         NA
## SourceMYFOXZONE.com                                                                                      NA
## SourceMyjoyonline.com                                                                                    NA
## SourceMyMotherLode.com                                                                                   NA
## SourceMyNewsLA.com                                                                                       NA
## SourceMyNorthwest.com                                                                                    NA
## `SourceMyrtle Beach Sun News`                                                                            NA
## SourcemySanAntonio.com                                                                                   NA
## `SourcemySanAntonio.com (blog)`                                                                          NA
## SourceMyStateline.com                                                                                    NA
## SourceMyStatesman.com                                                                                    NA
## SourceMyTechBits                                                                                         NA
## `SourceN.C. State University Technician Online`                                                          NA
## SourceN4BB                                                                                               NA
## SourceNaharnet                                                                                           NA
## SourceNAIJ.COM                                                                                           NA
## `SourceNaked Capitalism`                                                                                 NA
## `SourceNaked Security`                                                                                   NA
## `SourceNaked Security (blog)`                                                                            NA
## `SourceNamibia Economist`                                                                                NA
## SourceNamibian                                                                                           NA
## `SourceNanaimo News Bulletin`                                                                            NA
## `SourceNanoNews (blog)`                                                                                  NA
## `SourceNapa Valley Register`                                                                             NA
## `SourceNaples Daily News`                                                                                NA
## `SourceNarendra Modi (press release) (blog)`                                                             NA
## SourceNascar                                                                                             NA
## SourceNasdaq                                                                                             NA
## `SourceNashua Telegraph`                                                                                 NA
## `SourceNashville Business Journal`                                                                       NA
## `SourceNashville Business Journal (blog)`                                                                NA
## `SourceNashville Chatter`                                                                                NA
## `SourceNathan McAlone, Business Insider via Yahoo! Finance`                                              NA
## `SourceNation News`                                                                                      NA
## `Sourcenation.lk - The Nation Newspaper`                                                                 NA
## `SourceNational Catholic Register`                                                                       NA
## `SourceNational Catholic Reporter`                                                                       NA
## `SourceNational Catholic Reporter (blog)`                                                                NA
## `SourceNational Constitution Center via Yahoo! News`                                                     NA
## `SourceNational Geographic`                                                                              NA
## `SourceNational Journal`                                                                                 NA
## `SourceNational Mirror`                                                                                  NA
## `SourceNational Observer`                                                                                NA
## `SourceNational Post`                                                                                    NA
## `SourceNational Review Online`                                                                           NA
## `SourceNational Science Foundation (press release)`                                                      NA
## `SourceNational Turk English`                                                                            NA
## `SourceNATO HQ (press release)`                                                                          NA
## `SourceNatural Gas Intelligence`                                                                         NA
## `SourceNatural Resources Defense Council`                                                                NA
## `SourceNatural Resources Defense Council (blog)`                                                         NA
## SourceNature                                                                                             NA
## `SourceNature World News`                                                                                NA
## SourceNature.com                                                                                         NA
## `SourceNBC 12 Richmond`                                                                                  NA
## `SourceNBC 2 Fort Myers`                                                                                 NA
## `SourceNBC 29 News`                                                                                      NA
## `SourceNBC 5 Dallas-Fort Worth`                                                                          NA
## `SourceNBC 6 South Florida`                                                                              NA
## `SourceNBC 7 San Diego`                                                                                  NA
## `SourceNBC Bay Area`                                                                                     NA
## `SourceNBC Chicago`                                                                                      NA
## `SourceNBC Chicago (blog)`                                                                               NA
## `SourceNBC Connecticut`                                                                                  NA
## `SourceNBC Montana`                                                                                      NA
## `SourceNBC Nebraska`                                                                                     NA
## `SourceNBC New York`                                                                                     NA
## `SourceNBC NEWS`                                                                                         NA
## `SourceNBC Southern California`                                                                          NA
## `SourceNBC2 News`                                                                                        NA
## `SourceNBC4 Washington`                                                                                  NA
## SourceNBC4i.com                                                                                          NA
## SourceNBCNews.com                                                                                        NA
## SourceNBCSports.com                                                                                      NA
## SourceNCAA.com                                                                                           NA
## `SourceNCR-Iran.org`                                                                                     NA
## SourceNDTV                                                                                               NA
## `SourceNDTV (blog)`                                                                                      NA
## SourceNDTVSports.com                                                                                     NA
## `SourceNearshore Americas`                                                                               NA
## `SourceNehanda Radio`                                                                                    NA
## `SourceNenagh Guardian`                                                                                  NA
## `SourceNeos Kosmos`                                                                                      NA
## `SourceNeosho Daily News`                                                                                NA
## SourceNeowin                                                                                             NA
## SourceNerdist                                                                                            NA
## `SourceNerdWallet (blog)`                                                                                NA
## SourceNESN.com                                                                                           NA
## `SourceNetGuide NZ`                                                                                      NA
## SourceNetimperative                                                                                      NA
## `SourceNetwork World`                                                                                    NA
## `SourceNetworks Asia`                                                                                    NA
## SourceNeurogadget                                                                                        NA
## `SourceNevada County Picayune`                                                                           NA
## `SourceNew America Media`                                                                                NA
## `SourceNew Bern Sun Journal`                                                                             NA
## `SourceNew Era`                                                                                          NA
## `SourceNew Europe`                                                                                       NA
## `SourceNew Hampshire Business Review`                                                                    NA
## `SourceNew Hampshire Public Radio`                                                                       NA
## `SourceNew Hampshire Union Leader`                                                                       NA
## `SourceNew Haven Register`                                                                               NA
## `SourceNew Historian`                                                                                    NA
## `SourceNew Internationalist (blog)`                                                                      NA
## `SourceNew Jersey 101.5 FM Radio`                                                                        NA
## `SourceNew Jersey Herald`                                                                                NA
## `SourceNew Kerala`                                                                                2.217e+03
## `SourceNew Matilda`                                                                                      NA
## `SourceNew Republic`                                                                                     NA
## `SourceNew Ross Standard`                                                                                NA
## `SourceNew Sabah Times`                                                                                  NA
## `SourceNew Scientist`                                                                                    NA
## `SourceNew Statesman`                                                                                    NA
## `SourceNew Straits Times Online`                                                                         NA
## `SourceNew Straits Times via Yahoo! Singapore News`                                                      NA
## `SourceNew University`                                                                                   NA
## `SourceNew Vision`                                                                                       NA
## `SourceNew York's PIX11 / WPIX-TV`                                                                       NA
## `SourceNew York Business Journal`                                                                        NA
## `SourceNew York Daily News`                                                                              NA
## `SourceNew York Magazine`                                                                                NA
## `SourceNew York Post`                                                                                    NA
## `SourceNew York Recorder`                                                                                NA
## `SourceNew York Review of Books`                                                                         NA
## `SourceNew York Sun`                                                                                     NA
## `SourceNew York Times`                                                                            9.491e+07
## `SourceNew York Times (blog)`                                                                            NA
## `SourceNew York Times Finance`                                                                           NA
## `SourceNew Zealand Herald`                                                                               NA
## `SourceNew Zealand Listener`                                                                             NA
## `SourceNew Zimbabwe`                                                                                     NA
## `SourceNew Zimbabwe.com`                                                                                 NA
## SourceNewbritainherald                                                                                   NA
## `SourceNewcastle Herald`                                                                                 NA
## `SourceNewham Recorder`                                                                                  NA
## SourceNewNowNext                                                                                         NA
## `SourceNews-Medical.net`                                                                                 NA
## `SourceNews & Observer`                                                                                  NA
## `SourceNews & Observer (blog)`                                                                           NA
## `SourceNews & Star`                                                                                      NA
## `SourceNews 10NBC`                                                                                       NA
## `SourceNews 1130`                                                                                        NA
## `SourceNews 24 South Africa`                                                                             NA
## `SourceNews Channel 12 New Bern`                                                                         NA
## `SourceNews Every day`                                                                                   NA
## `SourceNews from Rutgers`                                                                                NA
## `SourceNews Ghana`                                                                                       NA
## `SourceNews On 6`                                                                                        NA
## `SourceNews On 6 Tulsa`                                                                                  NA
## `SourceNews One`                                                                                         NA
## `SourceNews Oracle`                                                                                      NA
## `SourceNews Radio 710 KEEL`                                                                              NA
## `SourceNews Sentinel`                                                                                    NA
## `SourceNews Talk 610 CKTB`                                                                               NA
## `SourceNews Talk 650 CKOM`                                                                               NA
## `SourceNews Talk 770 Calgary`                                                                            NA
## `SourceNews Talk Florida`                                                                                NA
## `SourceNews Tribe`                                                                                       NA
## `SourceNews Watch International`                                                                         NA
## `SourceNews West 9 Midland`                                                                              NA
## `SourceNews World India`                                                                                 NA
## SourceNews.Az                                                                                            NA
## SourceNews.com.au                                                                                        NA
## SourceNEWS.com.au                                                                                        NA
## `SourceNews.com.au Travel`                                                                               NA
## Sourcenews.delaware.gov                                                                                  NA
## `SourceNEWS10 ABC`                                                                                       NA
## SourceNews1130                                                                                           NA
## SourceNews18                                                                                             NA
## SourceNews24                                                                                             NA
## `SourceNews24 Nigeria`                                                                                   NA
## SourceNews3LV                                                                                            NA
## SourceNews4C                                                                                             NA
## `Sourcenews9.com KWTV`                                                                                   NA
## `SourceNewsAhead Agency`                                                                                 NA
## SourceNewsandtribune                                                                                     NA
## SourcenewsBTC                                                                                            NA
## SourceNewsbug.info                                                                                       NA
## `SourceNewsBusters (blog)`                                                                               NA
## SourceNewscenter1.tv                                                                                     NA
## `SourceNewschannel 6 Wichita Falls`                                                                      NA
## SourceNewsChannel5.com                                                                                   NA
## SourceNewsday                                                                                            NA
## SourceNewsDay                                                                                            NA
## SourceNewsdzeZimbabwe                                                                                    NA
## SourceNewser                                                                                             NA
## SourceNewsexaminer                                                                                       NA
## `SourceNewsFactor Network`                                                                               NA
## SourceNewsfirst                                                                                          NA
## SourceNewsGhana.com.gh                                                                                   NA
## `SourceNewsHounds (blog)`                                                                                NA
## SourceNewshub                                                                                            NA
## `SourceNewshub (blog)`                                                                                   NA
## SourceNewsInferno                                                                                        NA
## SourceNewsmax                                                                                            NA
## `SourceNewsnext Bangladesh`                                                                              NA
## SourceNewsOK.com                                                                                         NA
## SourceNewsQuench                                                                                         NA
## `SourceNewstalk 106-108 fm`                                                                              NA
## `SourceNewstalk ZB`                                                                                      NA
## `SourceNewsWay 21`                                                                                       NA
## SourceNewsweek                                                                                           NA
## `SourceNewsweek ME`                                                                                      NA
## `SourceNewsweek via Yahoo UK & Ireland News`                                                             NA
## `SourceNewsweek via Yahoo! News`                                                                         NA
## `SourceNewsweel ME (satire) (press release) (blog)`                                                      NA
## SourceNewsWest9.com                                                                                      NA
## SourceNewswise                                                                                           NA
## SourceNewsWithViews.com                                                                                  NA
## SourceNewsworks.org                                                                                      NA
## SourceNewsx                                                                                              NA
## SourceNewsy                                                                                              NA
## `SourceNewton Press Mentor`                                                                              NA
## SourceNewzy                                                                                              NA
## `SourceNext Big Future`                                                                                  NA
## `SourceNext City`                                                                                        NA
## SourceNextShark                                                                                          NA
## `SourceNFC World`                                                                                        NA
## SourceNFL.com                                                                                            NA
## `SourceNiagara Falls Review`                                                                             NA
## `SourceNiche Gamer`                                                                                      NA
## `SourceNigeria (press release) (blog)`                                                                   NA
## `SourceNightcap TV`                                                                                      NA
## `SourceNikkei Asian Review`                                                                              NA
## `SourceNine O&#39;Clock`                                                                                 NA
## `Sourceninemsn 9Stories`                                                                                 NA
## `SourceNintendo Life`                                                                                    NA
## `SourceNIU Newsroom`                                                                                     NA
## SourceNJ.com                                                                                             NA
## SourceNJBIZ                                                                                              NA
## `SourceNK News`                                                                                          NA
## `SourceNL Times`                                                                                         NA
## SourceNME                                                                                                NA
## SourceNME.com                                                                                            NA
## SourceNMPolitics.net                                                                                     NA
## `SourceNo Jitter`                                                                                        NA
## SourceNOLA.com                                                                                           NA
## SourceNooga.com                                                                                          NA
## SourceNoozhawk                                                                                           NA
## `SourceNorfolk Eastern Daily Press`                                                                      NA
## `SourceNorman Transcript`                                                                                NA
## `SourceNorth American Windpower`                                                                         NA
## `SourceNorth Bay Business Journal`                                                                       NA
## `SourceNorth Country Public Radio`                                                                       NA
## `SourceNorth Queensland Register`                                                                        NA
## `SourceNorthampton Chronicle & Echo`                                                                     NA
## `SourceNorthamptonshire Telegraph`                                                                       NA
## `SourceNortheast Mississippi Daily Journal`                                                              NA
## `SourceNorthern Californian`                                                                             NA
## `SourceNorthern Echo`                                                                                    NA
## `SourceNorthern Star`                                                                                    NA
## SourceNorthernLife.ca                                                                                    NA
## SourceNorthfield.org                                                                                     NA
## SourceNorthJersey.com                                                                                    NA
## `SourceNorthumberland Gazette`                                                                           NA
## `SourceNorthwest Arkansas News`                                                                          NA
## `SourceNorthwest Georgia News`                                                                           NA
## `SourceNorthwest Herald`                                                                                 NA
## `SourceNorthwestern University NewsCenter`                                                               NA
## `SourceNotebook Review`                                                                                  NA
## SourceNotebookReview.com                                                                                 NA
## `SourceNottingham Post`                                                                                  NA
## SourceNovinite                                                                                           NA
## SourceNovinite.com                                                                                       NA
## `SourceNOW Magazine`                                                                                     NA
## SourceNowGamer                                                                                           NA
## SourceNPR                                                                                                NA
## SourceNSEAVoice.com                                                                                      NA
## `SourceNT News`                                                                                          NA
## SourceNTV                                                                                                NA
## SourceNumbersUSA                                                                                         NA
## SourceNuvo                                                                                               NA
## `SourceNUVO Newsweekly`                                                                                  NA
## SourceNWAOnline                                                                                          NA
## SourceNWCN.com                                                                                           NA
## Sourcenwitimes.com                                                                                       NA
## `SourceNY Blueprint`                                                                                     NA
## `SourceNyasa Times`                                                                                      NA
## SourceNYCaribNews                                                                                        NA
## `SourceNYSE Post`                                                                                        NA
## `SourceNYU Washington Square News`                                                                       NA
## `SourceNZ Newswire via Yahoo! New Zealand News`                                                          NA
## `SourceNZ Newswire via Yahoo!7 News`                                                                     NA
## SourceNZCity                                                                                             NA
## `SourceOakland Tribune`                                                                                  NA
## `SourceOakville Beaver`                                                                                  NA
## SourceObserver                                                                                           NA
## `SourceObserver-Reporter`                                                                                NA
## `SourceObstacle Racing Media (press release) (blog)`                                                     NA
## SourceOcala                                                                                              NA
## SourceOCCRP                                                                                              NA
## SourceOCRegister                                                                                         NA
## `Sourceodditycentral (blog)`                                                                             NA
## `SourceOdessa American`                                                                                  NA
## SourceOilOnline                                                                                          NA
## SourceOilPrice.com                                                                                       NA
## `SourceOilprice.com via Yahoo Canada Finance`                                                            NA
## `SourceOilprice.com via Yahoo! Finance`                                                                  NA
## `SourceOilprice.com via Yahoo! New Zealand Finance`                                                      NA
## `SourceOilprice.com via Yahoo!7 Finance`                                                                 NA
## `SourceOK! Magazine`                                                                                     NA
## `SourceOklahoma&#39;s NewsChannel 4`                                                                     NA
## `SourceOldham Chronicle`                                                                                 NA
## `SourceOlean Times Herald`                                                                               NA
## `SourceOlhar Digital`                                                                                    NA
## `SourceOlive Press`                                                                                      NA
## `SourceOmaha World-Herald`                                                                               NA
## `SourceOMCT World Organisation Against Torture`                                                          NA
## `SourceOmnisport via Yahoo! Sports`                                                                      NA
## `SourceOn Cars India`                                                                                    NA
## `SourceOn Line opinion`                                                                                  NA
## `SourceOne India`                                                                                        NA
## SourceOneindia                                                                                           NA
## SourceOneNewsNow                                                                                         NA
## `SourceOneonta Daily Star`                                                                               NA
## `SourceOnline Athens`                                                                                    NA
## `SourceOnly Single Player`                                                                               NA
## Sourceonmanorama                                                                                         NA
## SourceOnrec                                                                                              NA
## `SourceOntario Argus Observer`                                                                           NA
## `SourceOnward State`                                                                                     NA
## SourceOnWindows.com                                                                                      NA
## `SourceOPB News`                                                                                         NA
## SourceOpEdNews                                                                                           NA
## `SourceOpen Democracy`                                                                                   NA
## `SourceOPEN MINDS (registration)`                                                                        NA
## `SourceOpen Minds UFO News`                                                                              NA
## SourceOpenCanada                                                                                         NA
## `SourceOpenDNS Blog (blog)`                                                                              NA
## `SourceOpinion Internationale`                                                                           NA
## `SourceOpposing Views`                                                                                   NA
## `SourceoptionMONSTER Research`                                                                           NA
## `SourceoptionMONSTER via Yahoo! Finance`                                                                 NA
## `SourceOR-Politics.com`                                                                                  NA
## `SourceOracleUnion.com (blog)`                                                                           NA
## `SourceOrange County Register`                                                                           NA
## `SourceOregon Daily Emerald`                                                                             NA
## `SourceOregon Public Broadcasting`                                                                       NA
## SourceOregonLive.com                                                                                     NA
## `SourceOrlando Business Journal`                                                                         NA
## `SourceOrlando Business Journal (blog)`                                                                  NA
## `SourceOrlando Sentinel`                                                                                 NA
## `SourceOrlando Weekly (blog)`                                                                            NA
## `SourceOroville Mercury Register`                                                                        NA
## `SourceOS News`                                                                                          NA
## SourceOSNews                                                                                             NA
## `SourceOSU - The Lantern`                                                                                NA
## `SourceOsun Defender`                                                                                    NA
## `SourceOswego Daily News`                                                                                NA
## `SourceOtago Daily Times`                                                                                NA
## `SourceOTC Outlook`                                                                                      NA
## `SourceOttawa Citizen`                                                                                   NA
## `SourceOttawa Sun`                                                                                       NA
## `SourceOumma.com: point de vue musulman sur l'actualit\\u009d\\u009d`                                    NA
## `SourceOumma.com: point de vue musulman sur l'actualité`                                                 NA
## `SourceOUPblog (blog)`                                                                                   NA
## SourceOurQuadCities                                                                                      NA
## `SourceOut-Law`                                                                                          NA
## `SourceOut-Law.com`                                                                                      NA
## `SourceOut Magazine`                                                                                     NA
## SourceOutdoorHub                                                                                         NA
## `SourceOuter Places`                                                                                     NA
## `SourceOutlook India`                                                                                    NA
## SourceOverlawyered                                                                                       NA
## `SourceOxfam America (press release) (blog)`                                                             NA
## `SourceOxford Mail`                                                                                      NA
## `SourceOxford Student`                                                                                   NA
## `SourceOye! Times`                                                                                       NA
## SourceOZY                                                                                                NA
## `SourceOzy via Yahoo Canada News`                                                                        NA
## `SourceOzy via Yahoo! News`                                                                              NA
## `SourcePA Money News via Yahoo UK & Ireland Finance`                                                     NA
## `SourcePacific Business News (Honolulu)`                                                                 NA
## `SourcePacific Daily News`                                                                               NA
## `SourcePacific Standard`                                                                                 NA
## `SourcePage Six`                                                                                         NA
## `SourcePajhwok Afghan News (subscription) (blog)`                                                        NA
## `SourcePakistan Christian Post`                                                                          NA
## `SourcePakistan Observer`                                                                                NA
## `SourcePakistan Today`                                                                                   NA
## SourcePalatinate                                                                                         NA
## `SourcePalestine Herald Press`                                                                           NA
## `SourcePalestine News Network`                                                                           NA
## `SourcePalestine Note`                                                                                   NA
## `SourcePalladium-Item`                                                                                   NA
## SourcePallonate                                                                                          NA
## `SourcePalm Beach Daily News`                                                                            NA
## `SourcePalm Beach Post`                                                                                  NA
## `SourcePalm Beach Post (blog)`                                                                           NA
## `SourcePamplin Media Group`                                                                              NA
## `SourcePanAm Post (blog)`                                                                                NA
## SourcePanARMENIAN.Net                                                                                    NA
## SourceParade                                                                                             NA
## `SourceParent Herald`                                                                                    NA
## `SourceParkersburg News`                                                                                 NA
## `SourceParksville Qualicum Beach News`                                                                   NA
## `SourceParti Anti Sioniste`                                                                              NA
## `SourcePassport Magazine`                                                                                NA
## SourcePatch.com                                                                                          NA
## `SourcePatently Apple`                                                                                   NA
## `SourcePatheos (blog)`                                                                                   NA
## `SourcePatriot Post`                                                                                     NA
## `SourcePattaya Today`                                                                                    NA
## `SourcePayment Week`                                                                                     NA
## `SourcePayScale Career News (blog)`                                                                      NA
## SourcePayvand                                                                                            NA
## `SourcePayvand Iran News`                                                                                NA
## `SourcePBS NewsHour`                                                                                     NA
## `SourcePC-Tablet`                                                                                        NA
## `SourcePc-Tablet Media`                                                                                  NA
## `SourcePC Advisor`                                                                                       NA
## `SourcePC Authority`                                                                                     NA
## `SourcePC Gamer`                                                                                         NA
## `SourcePC Magazine`                                                                                      NA
## `SourcePC Perspectives`                                                                                  NA
## `SourcePC PowerPlay`                                                                                     NA
## `SourcePC Tech Magazine`                                                                                 NA
## `SourcePC World`                                                                                  4.745e+07
## SourcePCGamesN                                                                                           NA
## `SourcePCMag India`                                                                                      NA
## `Sourcepcplus tabloid komputer`                                                                          NA
## `SourcePCR-online.biz`                                                                                   NA
## SourcePCWorld                                                                                            NA
## `SourcePE Hub (subscription) (blog)`                                                                     NA
## `SourcePeeblesshire News`                                                                                NA
## `SourcePeninsula Clarion`                                                                                NA
## `SourcePeninsula On-line`                                                                                NA
## `SourcePenn State News`                                                                                  NA
## `SourcePenn: Office of University Communications`                                                        NA
## SourcePennLive.com                                                                                       NA
## `SourcePensacola News Journal`                                                                           NA
## `SourcePensions & Investments`                                                                           NA
## `SourcePenticton Western News`                                                                           NA
## `SourcePeople's World`                                                                                   NA
## `SourcePEOPLE Great Ideas`                                                                               NA
## `SourcePeople Magazine`                                                                                  NA
## `SourcePEOPLE StyleWatch`                                                                                NA
## `SourcePeoria Journal Star`                                                                              NA
## `SourcePeoria Public Radio`                                                                              NA
## `SourcePerez Hilton`                                                                                     NA
## SourcePerezHilton.com                                                                                    NA
## `SourcePersonal Liberty Digest`                                                                          NA
## SourcePersonnelToday.com                                                                                 NA
## `SourcePerth Now`                                                                                        NA
## `SourcePeru this Week`                                                                                   NA
## `SourcePetaPixel (blog)`                                                                                 NA
## `SourcePeter Greenberg.com Travel News`                                                                  NA
## `SourcePeterborough Telegraph`                                                                           NA
## `SourcePetoskey News-Review`                                                                             NA
## `SourcePetra News Agency`                                                                                NA
## `SourcePew Research Center`                                                                              NA
## `SourcePew Research Center's Global Attitudes Project`                                                   NA
## `SourcePew Research Center's Internet and American Life Project`                                         NA
## `SourcePew Research Center for the People and the Press`                                                 NA
## SourcePhandroid.com                                                                                      NA
## `SourcePharmaceutical Executive (press release) (registration) (blog)`                                   NA
## SourcePharmaceuticalOnline                                                                               NA
## `SourcePhiladelphia Business Journal`                                                                    NA
## `SourcePhilippine Star`                                                                                  NA
## `SourcePhilippine Star via Yahoo! Philippines News`                                                      NA
## SourcePhilly.com                                                                                         NA
## `SourcePhilly.com (blog)`                                                                                NA
## SourcePhillyVoice.com                                                                                    NA
## `SourcePhnom Penh Post`                                                                                  NA
## `SourcePhoenix Business Journal (blog)`                                                                  NA
## `SourcePhone Arena`                                                                                      NA
## `SourcePhone Scoop`                                                                                      NA
## SourcePhoneDog                                                                                           NA
## `SourcePhones Review`                                                                                    NA
## `SourcePhoneWorld Magazine (press release) (blog)`                                                       NA
## `SourcePhotographyBLOG (blog)`                                                                           NA
## SourcePhotonics.com                                                                                      NA
## SourcePhys.Org                                                                                           NA
## `SourcePhysics Today`                                                                                    NA
## SourcePickupTrucks.com                                                                                   NA
## `SourcePine Bluff Commercial`                                                                            NA
## SourcePinkNews                                                                                           NA
## `SourcePioneers Post (press release) (registration) (blog)`                                              NA
## `SourcePirate FM`                                                                                        NA
## `SourcePitchfork Media`                                                                                  NA
## `SourcePittsburgh Business Times (blog)`                                                                 NA
## `SourcePittsburgh Post-Gazette`                                                                          NA
## `SourcePittsburgh Tribune-Review`                                                                        NA
## `SourcePJ Media`                                                                                         NA
## `SourcePJ Media (blog)`                                                                                  NA
## SourcePlanet                                                                                             NA
## SourcePlanetSave.com                                                                                     NA
## SourcePlantAutomation.com                                                                                NA
## `SourcePlastics & Rubber Weekly`                                                                         NA
## `SourcePlastics and Rubber Weekly`                                                                       NA
## `SourcePlastics News`                                                                                    NA
## SourcePlatts                                                                                             NA
## `SourcePlatts (blog)`                                                                                    NA
## `SourcePlay the Game`                                                                                    NA
## `SourcePlayStation LifeStyle`                                                                            NA
## `Sourceplus55 (blog)`                                                                                    NA
## `SourcePlymouth Herald`                                                                                  NA
## `SourcePMLiVE (blog)`                                                                                    NA
## `SourcePocket-lint.com`                                                                                  NA
## `SourcePoint of Sale News (tm) (press release) (blog)`                                                   NA
## `SourcePolicy Network`                                                                                   NA
## SourcePolitickerNJ                                                                                       NA
## SourcePolitico                                                                                           NA
## `SourcePolitico (blog)`                                                                                  NA
## `SourcePOLITICO Magazine`                                                                                NA
## SourcePOLITICO.eu                                                                                        NA
## SourcePoliticsHome.com                                                                                   NA
## SourcePoliticsweb                                                                                        NA
## SourcePoliticusUSA                                                                                       NA
## SourcePolitiFact                                                                                         NA
## SourcePolygon                                                                                            NA
## `SourcePolygon via Yahoo! News`                                                                          NA
## `SourcePOP Herald`                                                                                       NA
## SourcePOPSUGAR                                                                                           NA
## `SourcePopular Mechanics`                                                                                NA
## `SourcePopular Science`                                                                                  NA
## SourcePopzara                                                                                            NA
## `SourcePort Huron Times Herald`                                                                          NA
## `SourcePorterville Recorder`                                                                             NA
## `SourcePortland Business Journal (blog)`                                                                 NA
## `SourcePortland Tribune`                                                                                 NA
## `SourcePortsmouth News`                                                                                  NA
## `SourcePost-Bulletin`                                                                                    NA
## `SourcePost-Tribune`                                                                                     NA
## `SourcePost and Parcel`                                                                                  NA
## `SourcePost Online`                                                                                      NA
## `SourcePost Online (blog)`                                                                               NA
## `SourcePoughkeepsie Journal`                                                                             NA
## `SourcePowder Magazine`                                                                                  NA
## `SourcePower Line (blog)`                                                                                NA
## SourcePoynter.org                                                                                        NA
## `SourcePPcorn (blog)`                                                                                    NA
## SourcePplware                                                                                            NA
## `SourcePR Newswire`                                                                                      NA
## `SourcePR Newswire (press release)`                                                                      NA
## `SourcePR Newswire UK (press release)`                                                                   NA
## `SourcePR Newswire via Yahoo! Finance`                                                            6.711e+07
## `SourcePR Web (press release)`                                                                           NA
## `SourcePrague Daily Monitor`                                                                             NA
## `SourcePrague Post`                                                                                      NA
## SourcePrameyaNews7                                                                                       NA
## SourcePravda                                                                                             NA
## SourcePremier                                                                                            NA
## `SourcePremium Times`                                                                                    NA
## `SourcePrensa Latina`                                                                                    NA
## `SourcePress-Enterprise`                                                                                 NA
## `SourcePress & Sun-Bulletin`                                                                             NA
## `SourcePress & Sun-Bulletin (blog)`                                                                      NA
## `SourcePress and Journal`                                                                                NA
## `SourcePress Association via Yahoo UK & Ireland News`                                                    NA
## `SourcePress Herald`                                                                                     NA
## `SourcePress Insider Daily`                                                                              NA
## `SourcePress of Atlantic City`                                                                           NA
## `SourcePress Release Rocket`                                                                             NA
## `SourcePress Release Service (press release)`                                                            NA
## `SourcePress Telegraph (blog)`                                                                           NA
## `SourcePress Trust of India`                                                                             NA
## `SourcePress TV`                                                                                         NA
## `SourcePressChronicle.com (blog)`                                                                        NA
## `SourcePressenza International Press Agency`                                                             NA
## SourcePRI                                                                                                NA
## `SourcePrime Minister of Canada (press release)`                                                         NA
## `SourcePrince Albert Daily Herald`                                                                       NA
## `SourcePrince George Citizen`                                                                            NA
## `SourcePrinted Electronics World`                                                                        NA
## `SourcePrivate Eye`                                                                                      NA
## SourcePRNewser                                                                                           NA
## `SourceProactive Investors UK`                                                                           NA
## `SourceProduct Reviews`                                                                                  NA
## `SourceProfit Confidential`                                                                              NA
## SourceProgrammableWeb                                                                                    NA
## `SourceProgress Illinois`                                                                                NA
## `SourceProgress.org (blog)`                                                                              NA
## `SourceProject Syndicate`                                                                                NA
## `SourceProlific North`                                                                                   NA
## `SourceProperty Guru via Yahoo! Singapore News`                                                          NA
## `SourceProperty Magazine International`                                                                  NA
## SourcePropertyCasualty360                                                                                NA
## SourceProPublica                                                                                         NA
## `SourceProspect (blog)`                                                                                  NA
## `SourceProthom Alo (English)`                                                                            NA
## `SourceProvidence Business News`                                                                         NA
## SourcePRWeb                                                                                       2.437e+03
## SourcePRWeek                                                                                             NA
## `SourcePSFK (blog)`                                                                                      NA
## `SourcePSX Extreme`                                                                                      NA
## `SourcePublic Finance`                                                                                   NA
## `SourcePublic Finance International`                                                                     NA
## `SourcePublic Knowledge Tech News and Comment (blog)`                                                    NA
## `SourcePublishers Weekly (blog)`                                                                         NA
## `SourcePueblo Chieftain`                                                                                 NA
## `SourcePuget Sound Business Journal (Seattle)`                                                           NA
## `SourcePuget Sound Business Journal (Seattle) (blog)`                                                    NA
## `SourcePulitzer Center on Crisis Reporting`                                                              NA
## Sourcepulse                                                                                              NA
## `SourcePulse Headlines`                                                                                  NA
## `SourcePulse Nigeria`                                                                                    NA
## SourcePulse.com.gh                                                                                       NA
## `SourcePulse+IT`                                                                                         NA
## `SourcePurdue Agricultural Communications`                                                               NA
## `SourcePush Square`                                                                                      NA
## `SourcePV-Tech`                                                                                          NA
## `Sourcepv magazine`                                                                                      NA
## SourcePYMNTS.com                                                                                         NA
## `SourceQ13 FOX`                                                                                          NA
## `SourceQ13 FOX Seattle`                                                                                  NA
## SourceQantara.de                                                                                         NA
## `SourceQuad-Cities Online`                                                                               NA
## `SourceQuad City Times`                                                                                  NA
## SourceQuartz                                                                                             NA
## `SourceQuartz via Yahoo UK & Ireland Finance`                                                            NA
## `SourceQuartz via Yahoo! Finance`                                                                        NA
## `SourceQueen's Journal`                                                                                  NA
## `SourceQueensland Country Life`                                                                          NA
## `SourceQueensland Times`                                                                                 NA
## SourceQueerty                                                                                            NA
## `SourceQuincy Herald-Whig`                                                                               NA
## `SourceR & D Magazine`                                                                                   NA
## Sourcerabble.ca                                                                                          NA
## `Sourcerabble.ca (blog)`                                                                                 NA
## `SourceRacked NY`                                                                                        NA
## SourceRadarOnline                                                                                        NA
## `SourceRadio Cadena Agramonte`                                                                           NA
## `SourceRadio Canada International`                                                                       NA
## `SourceRadio Free Asia`                                                                                  NA
## `SourceRadio Iowa`                                                                                       NA
## `SourceRadio New Zealand`                                                                                NA
## `SourceRadio Pakistan (press release)`                                                                   NA
## `SourceRadio Prague`                                                                                     NA
## `SourceRadio Tamazuj`                                                                                    NA
## `SourceRadio Times`                                                                                      NA
## `SourceRadio.com Music and Entertainment News`                                                           NA
## `SourceRadioFreeEurope/RadioLiberty`                                                                     NA
## SourceRadioVop                                                                                           NA
## `SourceRand Daily Mail`                                                                                  NA
## `SourceRandolph County Herald Tribune`                                                                   NA
## SourceRapaport                                                                                           NA
## `SourceRapid City Journal`                                                                               NA
## `SourceRapid tv news`                                                                                    NA
## SourceRappler                                                                                            NA
## SourceRappler.com                                                                                        NA
## `SourceRasmussen Reports`                                                                                NA
## `SourceRaw Story`                                                                                        NA
## `SourceRCR Wireless News`                                                                                NA
## `SourceRe/code`                                                                                          NA
## `SourceReading Eagle`                                                                                    NA
## SourceReadWrite                                                                                          NA
## SourceReadWriteWeb                                                                                       NA
## SourceRealClearMarkets                                                                                   NA
## SourceRealClearPolitics                                                                                  NA
## SourceRéalités                                                                                           NA
## `SourceRealtor.com News`                                                                                 NA
## `SourceRealty Today`                                                                                     NA
## `SourceRealWire (press release)`                                                                         NA
## SourceReason                                                                                             NA
## `SourceReason (blog)`                                                                                    NA
## `SourceReboot Illinois`                                                                                  NA
## SourceRecode                                                                                             NA
## SourceRecombu                                                                                            NA
## `SourceRecorder Press (blog)`                                                                            NA
## `SourceRecorderpost.com (satire) (registration) (blog)`                                                  NA
## `SourceRecycling International`                                                                          NA
## `SourceRecycling Today`                                                                                  NA
## `SourceRed Alert Politics`                                                                               NA
## `SourceRed and Black`                                                                                    NA
## `SourceRed Deer Advocate`                                                                                NA
## `SourceRed Flag`                                                                                         NA
## `SourceRedding Record Searchlight`                                                                       NA
## `SourceRedheaded Blackbelt`                                                                              NA
## Sourcerediff.com                                                                                         NA
## `SourceRedmond Channel Partner`                                                                          NA
## `SourceRedmond Channel Partner (blog)`                                                                   NA
## `SourceRedmond Reporter`                                                                                 NA
## SourceRedmondmag.com                                                                                     NA
## `SourceRedmondmag.com (blog)`                                                                            NA
## `SourceRedress Information & Analysis`                                                                   NA
## `SourceRedwood Falls Gazette`                                                                            NA
## SourceRefinery29                                                                                         NA
## `SourceRegina Leader-Post`                                                                               NA
## `SourceReligion News Service`                                                                            NA
## `SourceRenewable Energy Focus`                                                                           NA
## SourceRenewAmerica                                                                                       NA
## SourceRenewEconomy                                                                                       NA
## SourcereNews                                                                                             NA
## `SourceReno Gazette-Journal`                                                                             NA
## `SourceReno Gazette Journal`                                                                             NA
## `SourceReporters without borders (press release)`                                                        NA
## SourceRepublica                                                                                          NA
## `SourceReseller News`                                                                                    NA
## `SourceResource Investor`                                                                                NA
## SourceReuters                                                                                            NA
## `SourceReuters - UK Focus via Yahoo UK & Ireland Finance`                                                NA
## `SourceReuters Africa`                                                                                   NA
## `SourceReuters Blogs (blog)`                                                                             NA
## `SourceReuters Canada`                                                                                   NA
## `SourceReuters India`                                                                                    NA
## `SourceReuters Middle East via Yahoo Maktoob News`                                                       NA
## `SourceReuters UK`                                                                                       NA
## `SourceReuters via Yahoo Canada Finance`                                                                 NA
## `SourceReuters via Yahoo Canada News`                                                                    NA
## `SourceReuters via Yahoo Maktoob News`                                                                   NA
## `SourceReuters via Yahoo UK & Ireland Finance`                                                           NA
## `SourceReuters via Yahoo UK & Ireland News`                                                              NA
## `SourceReuters via Yahoo UK & Ireland Sport`                                                             NA
## `SourceReuters via Yahoo! Finance`                                                                1.373e+04
## `SourceReuters via Yahoo! Finance India`                                                                 NA
## `SourceReuters via Yahoo! India News`                                                                    NA
## `SourceReuters via Yahoo! New Zealand News`                                                              NA
## `SourceReuters via Yahoo! News`                                                                          NA
## `SourceReuters via Yahoo! Philippines News`                                                              NA
## `SourceReuters via Yahoo! Philippines Sports`                                                            NA
## `SourceReuters via Yahoo! Singapore News`                                                                NA
## `SourceReuters via Yahoo! Singapore Sports`                                                              NA
## `SourceReuters via Yahoo! Sports`                                                                        NA
## `SourceReuters via Yahoo!7 Finance`                                                                      NA
## `SourceReuters via Yahoo!7 News`                                                                         NA
## `SourceReykjav\\u009d\\u009dk Grapevine`                                                                 NA
## SourceRFI                                                                                                NA
## `SourceRhode Island Public Radio`                                                                        NA
## `SourceRI Future`                                                                                        NA
## `SourceRichmond County Daily Journal`                                                                    NA
## `SourceRichmond Times-Dispatch`                                                                          NA
## SourceRichmond.com                                                                                       NA
## `SourceRick Kupchella's BringMeTheNews`                                                                  NA
## `SourceRight Side News`                                                                                  NA
## `SourceRight Wing Watch`                                                                                 NA
## SourceRigzone                                                                                            NA
## `SourceRing of Fire`                                                                                     NA
## `SourceRisers & Fallers`                                                                                 NA
## `SourceRising Kashmir (press release) (registration) (blog)`                                             NA
## `SourceRising Kashmir Daily English Newspaper`                                                           NA
## `SourceRIT University News Services`                                                                     NA
## `SourceRiverfront Times (blog)`                                                                          NA
## SourceRiversideGazette.com                                                                               NA
## `SourceRoad to Paris`                                                                                    NA
## `SourceRoad to VR`                                                                                       NA
## `SourceRoad Warrior Voices`                                                                              NA
## SourceRoadandTrack.com                                                                                   NA
## `SourceRoads and Kingdoms`                                                                               NA
## `SourceRoanoke Times`                                                                                    NA
## SourceRobdailynews                                                                                       NA
## SourceRobohub                                                                                            NA
## `SourceRochdale Online`                                                                                  NA
## `SourceRochester Democrat and Chronicle`                                                                 NA
## `SourceRochester Democrat and Chronicle (blog)`                                                          NA
## SourceRocketNews24                                                                                       NA
## `SourceRockford Register Star`                                                                           NA
## `SourceRockhampton Morning Bulletin`                                                                     NA
## `SourceRoll Call`                                                                                        NA
## `SourceRoll Call (blog)`                                                                                 NA
## `SourceRoll Call (registration)`                                                                         NA
## `SourceRoll Call (registration) (blog)`                                                                  NA
## SourceRollingStone.com                                                                                   NA
## `SourceRomania-Insider.com`                                                                              NA
## `SourceRomford Recorder`                                                                                 NA
## SourceRomper                                                                                             NA
## `SourceRoute Fifty`                                                                                      NA
## `SourceRoyal Gazette`                                                                                    NA
## `SourceRoyal Society of Chemistry`                                                                       NA
## SourceRT                                                                                                 NA
## SourceRTBF                                                                                               NA
## `SourceRTE News`                                                                                         NA
## `SourceRTÉ News`                                                                                         NA
## SourceRTE.ie                                                                                             NA
## `SourceRTT News`                                                                                  1.113e+04
## `SourceRTV Slovenija`                                                                                    NA
## `SourceRU Daily Targum`                                                                                  NA
## SourceRudaw                                                                                              NA
## `SourceRuidoso News`                                                                                     NA
## `SourceRunway Girl Network`                                                                              NA
## SourceRushLimbaugh.com                                                                                   NA
## `SourceRussia and India Report`                                                                          NA
## `SourceRussia Beyond the Headlines`                                                                      NA
## `SourceRussia Direct`                                                                                    NA
## `SourceRussian Information Agency Novosti`                                                               NA
## `SourceRutland Herald`                                                                                   NA
## SourceRwanda                                                                                             NA
## `SourceRwanda News Agency (registration)`                                                                NA
## `SourceSabah Daily Express`                                                                              NA
## `SourceSac City Express`                                                                                 NA
## `SourceSacramento Bee`                                                                                   NA
## `SourceSacramento Bee (blog)`                                                                            NA
## `SourceSacramento Business Journal`                                                                      NA
## `SourceSahara Reporters`                                                                                 NA
## SourceSaharaReporters.com                                                                                NA
## `SourceSalem-News.Com`                                                                                   NA
## `SourceSalem State Log`                                                                                  NA
## SourceSalemNews.net                                                                                      NA
## SourceSalina.com                                                                                         NA
## `SourceSalisbury Journal`                                                                                NA
## SourceSalon                                                                                              NA
## SourceSalon.com                                                                                          NA
## `SourceSalt Lake Tribune`                                                                                NA
## `SourceSAMAA TV (press release) (registration) (blog)`                                                   NA
## `SourceSan Angelo LIVE!`                                                                                 NA
## `SourceSan Angelo Standard Times`                                                                        NA
## `SourceSan Antonio Business Journal`                                                                     NA
## `SourceSan Antonio Express-News`                                                                         NA
## `SourceSan Antonio Express-News (subscription)`                                                          NA
## `SourceSan Bernardino County Sun`                                                                        NA
## `SourceSan Bernardino Sun`                                                                               NA
## `SourceSan Diego Free Press`                                                                             NA
## `SourceSan Diego Jewish World`                                                                           NA
## `SourceSan Francisco Bay View`                                                                           NA
## `SourceSan Francisco Business Times (blog)`                                                              NA
## `SourceSan Francisco Chronicle`                                                                          NA
## `SourceSan Francisco Examiner`                                                                           NA
## `SourceSan Francisco Sun Times`                                                                          NA
## `SourceSan Jose Mercury News`                                                                            NA
## `SourceSan Jose Mercury News media center`                                                               NA
## `SourceSan Mateo Daily Journal`                                                                          NA
## `SourceSandton Chronicle`                                                                                NA
## `SourceSanta Barbara Independent`                                                                        NA
## `SourceSanta Clarita Valley Signal`                                                                      NA
## `SourceSanta Cruz Sentinel`                                                                              NA
## `SourceSanta Fe New Mexican`                                                                             NA
## `SourceSanta Fe New Mexican (blog)`                                                                      NA
## `SourceSanta Fe Reporter`                                                                                NA
## `SourceSanta Maria Times (subscription)`                                                                 NA
## `SourceSanta Rosa Press Democrat`                                                                        NA
## SourceSaphirNews.com                                                                                     NA
## `SourceSarasota Herald-Tribune`                                                                          NA
## `SourceSarnia Observer`                                                                                  NA
## `SourceSaskatoon StarPhoenix`                                                                            NA
## SourceSaskatoonhomepage.ca                                                                               NA
## `SourceSaudi Gazette`                                                                                    NA
## `SourceSaudi Gazette via Yahoo Maktoob News`                                                             NA
## `SourceSauk Prairie Eagle`                                                                               NA
## `SourceSault Star`                                                                                       NA
## `SourceSault Ste. Marie Evening News`                                                                    NA
## `SourceSavannah Morning News`                                                                            NA
## `SourceSB Nation`                                                                                        NA
## SourceSBS                                                                                                NA
## `SourceSBS - The World Game`                                                                             NA
## `SourceSC Magazine`                                                                                      NA
## `SourceSC Magazine UK`                                                                                   NA
## `SourceScarborough Today`                                                                                NA
## `SourceSci-Tech Today`                                                                                   NA
## SourceSciDev.Net                                                                                         NA
## `SourceScience /AAAS`                                                                                    NA
## `SourceScience 2.0`                                                                                      NA
## `SourceScience Daily`                                                                                    NA
## `SourceScience Magazine`                                                                                 NA
## `SourceScience Recorder`                                                                                 NA
## `SourceScience Times`                                                                                    NA
## `SourceScience World Report`                                                                             NA
## SourceScienceAlert                                                                                       NA
## `SourceScienceBlog.com (blog)`                                                                           NA
## `SourceScientific American`                                                                              NA
## `SourceScientific American (blog)`                                                                       NA
## SourceSCNow                                                                                              NA
## SourceScoop.co.nz                                                                                        NA
## `SourceScoop.co.nz (press release)`                                                                      NA
## SourceScoopWhoop                                                                                         NA
## `SourceScotland on Sunday`                                                                               NA
## SourceScotsman                                                                                           NA
## `SourceScotsman (blog)`                                                                                  NA
## `SourceScottish Daily Record`                                                                            NA
## `SourceScottish Housing News`                                                                            NA
## `SourceScottsbluff Star Herald`                                                                          NA
## `SourceSCOTUSblog (blog)`                                                                                NA
## `SourceScranton Times-Tribune`                                                                           NA
## `SourceScreen International`                                                                             NA
## SourceScroll.in                                                                                          NA
## `SourceSDE Entertainment News`                                                                           NA
## `SourceSDPB Radio`                                                                                       NA
## `SourceSDSU Newscenter`                                                                                  NA
## SourceSDTimes.com                                                                                        NA
## SourceSeacoastonline.com                                                                                 NA
## `SourceSearch Engine Journal`                                                                            NA
## `SourceSearch Engine Land`                                                                               NA
## `SourceSeattle Globalist`                                                                                NA
## `SourceSeattle Sun Times`                                                                                NA
## `SourceSeattle Times`                                                                             2.308e+03
## Sourceseattlepi.com                                                                                      NA
## `Sourceseattlepi.com (blog)`                                                                             NA
## SourceSECcountry.com                                                                                     NA
## `SourceSecrecy News (blog)`                                                                              NA
## `SourceSecurity Intelligence (blog)`                                                                     NA
## `SourceSee It Market (blog)`                                                                             NA
## SourceSeeker                                                                                             NA
## `SourceSeeker (registration) (blog)`                                                                     NA
## `SourceSeeking Alpha`                                                                             2.222e+03
## `SourceSeeNews (subscription)`                                                                           NA
## `SourceSeeNews Renewables`                                                                               NA
## SourceSegmentNext                                                                                        NA
## SourceSelectButton                                                                                       NA
## `SourceSentinel & Enterprise`                                                                            NA
## `SourceServer Watch`                                                                                     NA
## `SourceSETHLUI.com via Yahoo! Singapore News`                                                            NA
## `SourceSevier News Messenger`                                                                            NA
## `SourceSeychelles News Agency`                                                                           NA
## `SourceSeymour Tribune`                                                                                  NA
## `SourceSF Weekly (blog)`                                                                                 NA
## SourceSFGate                                                                                             NA
## `SourceSFGate (blog)`                                                                                    NA
## SourceSFist                                                                                              NA
## SourceShacknews                                                                                          NA
## `SourceShanghai Daily (subscription)`                                                                    NA
## Sourceshanghaidaily                                                                                      NA
## SourceShanghaiist                                                                                        NA
## `Sourceshare market updates (press release)`                                                             NA
## `SourceShareCafe (registration)`                                                                         NA
## SourceShareCast                                                                                          NA
## `SourceSharecast via Yahoo UK & Ireland Finance`                                                         NA
## SourceShareChat                                                                                          NA
## SourceSharekhan                                                                                          NA
## SourceSheKnows.com                                                                                       NA
## `SourceSherwood Park News`                                                                               NA
## `SourceShields Gazette`                                                                                  NA
## `SourceShillong Times`                                                                                   NA
## `SourceShiny Shiny`                                                                                      NA
## `SourceShreveport Times`                                                                                 NA
## SourceSHRM                                                                                               NA
## `SourceShropshire Star`                                                                                  NA
## Sourceshropshirestar.com                                                                                 NA
## `SourceSHU Spectrum`                                                                                     NA
## `SourceSierra Leone Telegraph`                                                                           NA
## `SourceSify News`                                                                                        NA
## `SourceSilicon Valley Business Journal`                                                                  NA
## `SourceSilicon Valley Business Journal (blog)`                                                           NA
## SourceSiliconANGLE                                                                                6.711e+07
## `SourceSiliconANGLE (blog)`                                                                              NA
## SourceSiliconBeat                                                                                        NA
## SourceSiliconera                                                                                         NA
## SourceSiliconIndia                                                                                       NA
## SourceSiliconindia.com                                                                                   NA
## SourceSiliconrepublic.com                                                                                NA
## SourceSILive.com                                                                                         NA
## `SourceSilver City Sun-News`                                                                             NA
## SourceSimcoe.com                                                                                         NA
## `SourceSin Chew Jit Poh`                                                                                 NA
## `SourceSingapore Business Review`                                                                        NA
## `SourceSingapore Business Review via Yahoo! Finance`                                                     NA
## `SourceSingapore Government Online (press release)`                                                      NA
## `SourceSioux City Journal`                                                                               NA
## `SourceSioux Falls Argus Leader`                                                                         NA
## `SourceSiouxland Matters`                                                                                NA
## `SourceSiskiyou Daily News`                                                                              NA
## `SourceSITE Intelligence Group (subscription)`                                                           NA
## SourceSitePoint                                                                                          NA
## SourceSkift                                                                                              NA
## `SourceSky News`                                                                                         NA
## `SourceSky News Australia`                                                                               NA
## `SourceSky News via Yahoo Canada News`                                                                   NA
## `SourceSky News via Yahoo UK & Ireland Finance`                                                          NA
## `SourceSky News via Yahoo UK & Ireland News`                                                             NA
## SourceSkySports                                                                                          NA
## `SourceSLAM Online`                                                                                      NA
## SourceSlashdot                                                                                           NA
## SourceSlashGear                                                                                   1.911e+03
## `SourceSlate Magazine`                                                                                   NA
## `SourceSlate Magazine (blog)`                                                                            NA
## SourceSlate.fr                                                                                           NA
## `SourceSleepy Eye Herald Dispatch`                                                                       NA
## `SourceSlipped Disc`                                                                                     NA
## `SourceSlugger O'Toole`                                                                                  NA
## `SourceSmall Business Computing`                                                                         NA
## `SourceSmall Business Times`                                                                             NA
## `SourceSmall Business Trends`                                                                            NA
## SourceSmallBusiness.co.uk                                                                                NA
## `Sourcesmallwarsjournal (blog)`                                                                          NA
## SourceSmartCompany.com.au                                                                                NA
## `SourceSmarter Analyst`                                                                                  NA
## `SourceSME Insider`                                                                                      NA
## SourceSmithsonian                                                                                        NA
## `SourceSNAPPA Celebrity via Yahoo UK & Ireland News`                                                     NA
## `SourceSNAPPA Technology via Yahoo UK & Ireland News`                                                    NA
## Sourcesnopes.com                                                                                         NA
## `SourceSocial Europe`                                                                                    NA
## `SourceSocialist Alternative`                                                                            NA
## `SourceSocialist Project`                                                                                NA
## `SourceSocialist Worker`                                                                                 NA
## `SourceSocialist Worker Online`                                                                          NA
## SourceSocialTimes                                                                                        NA
## `SourceSoftonic EN (blog)`                                                                               NA
## `SourceSoftpedia News`                                                                                   NA
## `SourceSoftpedia News (blog)`                                                                            NA
## SourceSOHH                                                                                               NA
## SourceSojourners                                                                                         NA
## `SourceSolomon Star`                                                                                     NA
## `SourceSonoma State Star`                                                                                NA
## `SourceSonoran Weekly Review`                                                                            NA
## SourceSooToday.com                                                                                       NA
## `SourceSOS Children`                                                                                     NA
## `SourceSounder At Heart`                                                                                 NA
## SourceSoundersFC.com                                                                                     NA
## Sourcesourcingfocus.com                                                                                  NA
## `SourceSouth Africa.info`                                                                                NA
## `SourceSouth African Broadcasting Corporation`                                                           NA
## `SourceSouth Bend Tribune`                                                                               NA
## `SourceSouth Carolina SC (press release) (blog)`                                                         NA
## `SourceSouth China Morning Post`                                                                         NA
## `SourceSouth China Morning Post (registration)`                                                          NA
## `SourceSouth China Morning Post (subscription)`                                                          NA
## `SourceSouth Florida Business Journal`                                                                   NA
## `SourceSouth Leeds Life`                                                                                 NA
## `SourceSouth Wales Argus`                                                                                NA
## `SourceSouth Wales Evening Post`                                                                         NA
## SourceSouthCoastToday.com                                                                                NA
## `SourceSoutheast Asia GLOBE`                                                                             NA
## `SourceSoutheast Missourian`                                                                             NA
## `SourceSoutheast Texas Record`                                                                           NA
## `SourceSouthern Political Report`                                                                        NA
## SourceSouthernminn.com                                                                                   NA
## SourceSouthtownStar                                                                                      NA
## `SourceSouthwest Times`                                                                                  NA
## `SourceSowetan Live (press release) (registration) (blog)`                                               NA
## `SourceSpace Daily`                                                                                      NA
## `SourceSpace War`                                                                                        NA
## SourceSpace.com                                                                                          NA
## SourceSpaceDaily                                                                                         NA
## SourceSpaceNews                                                                                          NA
## SourceSpaceRef                                                                                           NA
## `SourceSpalding Guardian`                                                                                NA
## `SourceSPAMfighter News (press release)`                                                                 NA
## `SourceSpartanburg Herald-Journal`                                                                       NA
## SourceSpectator.co.uk                                                                                    NA
## `SourceSpectator.co.uk (blog)`                                                                           NA
## `SourceSpend Matters`                                                                                    NA
## SourceSpiked                                                                                             NA
## SourceSpin                                                                                               NA
## `SourceSplice Today`                                                                                     NA
## SourceSport24                                                                                            NA
## `SourceSporting Life`                                                                                    NA
## `SourceSporting News`                                                                                    NA
## `SourceSporting News via Yahoo UK & Ireland Sport`                                                       NA
## `SourceSporting News via Yahoo! Sports`                                                                  NA
## SourceSportingNews                                                                                       NA
## SourceSportingNews.com                                                                                   NA
## `SourceSports Illustrated`                                                                               NA
## `SourceSportsBusiness Daily (subscription)`                                                              NA
## SourceSportsGrid                                                                                         NA
## SourceSportskeeda                                                                                        NA
## `SourceSportskeeda via Yahoo! India News`                                                                NA
## SourceSportsnet.ca                                                                                       NA
## SourceSportTechie                                                                                        NA
## `SourceSpringfield News-Leader`                                                                          NA
## `SourceSputnik France`                                                                                   NA
## `SourceSputnik International`                                                                            NA
## `SourceSputnik UK`                                                                                       NA
## `SourceSputnik US`                                                                                       NA
## `SourceSQL Server Pro (blog)`                                                                            NA
## `SourceSri Lanka Guardian`                                                                               NA
## `SourceSt, Thomas Source`                                                                                NA
## `SourceSt. Albert Gazette`                                                                               NA
## `SourceSt. Augustine Record`                                                                             NA
## `SourceSt. Catharines Standard`                                                                          NA
## `SourceSt. Cloud Times`                                                                                  NA
## `SourceSt. George Daily Spectrum`                                                                        NA
## `SourceSt. Joseph News-Press`                                                                            NA
## `SourceSt. Louis Business Journal`                                                                       NA
## `SourceSt. Louis Business Journal (blog)`                                                                NA
## `SourceSt. Louis Jewish Light`                                                                           NA
## `SourceSt. Lucia News Online`                                                                            NA
## `SourceSt. Lucia Times Online News (press release)`                                                      NA
## `SourceSt. Petersburg Times Blogs`                                                                       NA
## `SourceSt. Thomas Times-Journal`                                                                         NA
## `SourceSTA - Slovenska Tiskovna Agencija (subscription)`                                                 NA
## `SourceStabroek News`                                                                                    NA
## `SourceStaff Newsletter`                                                                                 NA
## `SourceStaffing Industry Analysts`                                                                       NA
## `SourceStamford Advocate`                                                                                NA
## `SourceStanford Social Innovation Review (subscription)`                                                 NA
## `SourceStanford University News`                                                                         NA
## `SourceStanly News & Press`                                                                              NA
## SourceStar2.com                                                                                          NA
## SourceStarAfrica.com                                                                                     NA
## SourceStarpulse.com                                                                                      NA
## `SourceStarr 103.5 FM`                                                                                   NA
## `SourceStars and Stripes`                                                                                NA
## SourceStartups.co.uk                                                                                     NA
## SourceStartupSmart                                                                                       NA
## SourceSTAT                                                                                               NA
## `SourceState-Journal.com`                                                                                NA
## `SourceState Journal`                                                                                    NA
## `SourceState of the State KS (subscription)`                                                             NA
## `SourceStateImpact Oklahoma`                                                                             NA
## `SourceStatesman Journal`                                                                                NA
## `SourceSteelers Lounge (blog)`                                                                           NA
## SourceStepFeed                                                                                           NA
## SourceStevenspointjournal                                                                                NA
## SourceStevivor                                                                                           NA
## `SourceStillwater News Press`                                                                            NA
## `Sourcestiripesurse.ro (Comunicat de Pres\\u009d\\u009d)`                                                NA
## Sourcestjoechannel.com                                                                                   NA
## SourceSTLtoday.com                                                                                       NA
## `SourceStock & Land`                                                                                     NA
## `SourceStock Transcript`                                                                                 NA
## `SourceStock World`                                                                                      NA
## SourceStockhouse                                                                                         NA
## `SourceStockton Record (blog)`                                                                           NA
## SourceStorypick                                                                                          NA
## SourceStraight.com                                                                                       NA
## `SourceStraight.com (blog)`                                                                              NA
## `SourceStrategy Page`                                                                                    NA
## `Sourcestrategy+business (registration) (blog)`                                                          NA
## SourceSTRATFOR                                                                                           NA
## SourceStreamingMedia.com                                                                                 NA
## `SourceStreet Updates`                                                                                   NA
## `SourceStreetAuthority Network via Yahoo! Finance`                                                       NA
## SourceStreetInsider.com                                                                                  NA
## `SourceStreetInsider.com (blog)`                                                                         NA
## `SourceStreetsblog New York (blog)`                                                                      NA
## `SourceStreetWise Report`                                                                                NA
## `SourceStreetWise Report (press release)`                                                                NA
## SourceStuff                                                                                       2.014e+03
## SourceStuff.co.nz                                                                                        NA
## `SourceSturgis Journal`                                                                                  NA
## `SourceSTV News`                                                                                         NA
## Sourcestv.tv                                                                                             NA
## `SourceStyle News - StyleWatch - People.com`                                                             NA
## `SourceSud Ouest`                                                                                        NA
## `SourceSudan Tribune`                                                                                    NA
## SourceSudbury.com                                                                                        NA
## `SourceSun-Sentinel`                                                                                     NA
## `SourceSun Sentinel`                                                                                     NA
## `SourceSun Times National`                                                                               NA
## SourceSun.Star                                                                                           NA
## `SourceSunbury Daily Item`                                                                               NA
## `SourceSunday Business Post`                                                                             NA
## `SourceSunday Leader`                                                                                    NA
## `SourceSunday Observer`                                                                                  NA
## `SourceSunday World`                                                                                     NA
## `SourceSunderland Echo`                                                                                  NA
## SourceSunLive                                                                                            NA
## `SourceSunshine State News`                                                                              NA
## `SourceSupermarket News`                                                                                 NA
## `SourceSuperSite for Windows`                                                                            NA
## `SourceSupply Chain Management Review`                                                                   NA
## SourceSurferToday                                                                                        NA
## `SourceSustainable Brands`                                                                               NA
## `SourceSutherland Northern Times`                                                                        NA
## SourceSwampland                                                                                          NA
## SourceSwarajya                                                                                           NA
## `SourceSwarthmore College The Phoenix Online`                                                            NA
## Sourceswissinfo.ch                                                                                       NA
## `SourceSwitzer Financial News`                                                                           NA
## `SourceSydney Morning Herald`                                                                            NA
## `SourceSyracuse University News`                                                                         NA
## SourceSyracuse.com                                                                                       NA
## `SourceSyria Deeply`                                                                                     NA
## `Sourcet-online.de`                                                                                      NA
## `SourceT.H.E. Journal`                                                                                   NA
## SourceT3                                                                                                 NA
## `SourceTablet Magazine`                                                                                  NA
## `SourceTablet PC Review`                                                                                 NA
## `SourceTaipei Times`                                                                                     NA
## `SourceTaiwan Today`                                                                                     NA
## SourceTakePart                                                                                           NA
## `SourceTakePart.com via Yahoo! News`                                                                     NA
## `SourceTalkin' Cloud`                                                                                    NA
## SourceTallahassee.com                                                                                    NA
## SourceTameBay                                                                                            NA
## `SourceTampa Bay Business Journal`                                                                       NA
## `SourceTampa Bay Review`                                                                                 NA
## `SourceTampa Bay Times`                                                                                  NA
## SourceTampabay.com                                                                                       NA
## `SourceTampabay.com (blog)`                                                                              NA
## `SourceTaranaki Daily News`                                                                              NA
## `SourceTasmania Examiner`                                                                                NA
## `SourceTasnim News Agency (press release)`                                                               NA
## SourceTASS                                                                                               NA
## `SourceTax-News.com`                                                                                     NA
## SourceTBO.com                                                                                            NA
## SourceTCC                                                                                                NA
## SourceTCPalm                                                                                             NA
## SourceTDM.com                                                                                            NA
## `SourceTeague Chronicle`                                                                                 NA
## `SourceTech Cocktail`                                                                                    NA
## `SourceTech in Asia`                                                                                     NA
## `SourceTech Insider`                                                                                     NA
## `SourceTech Insider (blog)`                                                                              NA
## `SourceTech Insider via Yahoo UK & Ireland News`                                                         NA
## `SourceTech Media Network (Laptop) via Yahoo! News`                                                      NA
## `SourceTech Media Network (Tom&#39;s Guide) via Yahoo! News`                                             NA
## `SourceTech News Today`                                                                                  NA
## `SourceTech Page One`                                                                                    NA
## `SourceTech Pinas`                                                                                       NA
## `SourceTech Pro Research via Yahoo! News`                                                                NA
## `SourceTech Times`                                                                                       NA
## SourceTech.Co                                                                                            NA
## SourceTech2                                                                                              NA
## SourceTechCentral                                                                                        NA
## SourceTechcrunch                                                                                         NA
## SourceTechCrunch                                                                                  2.317e+03
## SourceTechdirt                                                                                           NA
## SourceTechEye                                                                                            NA
## SourceTechFrag                                                                                           NA
## SourceTechGadgetCentral                                                                                  NA
## SourceTechHive                                                                                           NA
## `SourceTechJuice (press release) (blog)`                                                                 NA
## SourceTechland                                                                                           NA
## SourceTechly                                                                                             NA
## `SourceTechnabob (blog)`                                                                                 NA
## SourceTechNewsWorld                                                                                      NA
## SourceTechNewsWorld.com                                                                                  NA
## SourceTechnical.ly                                                                                       NA
## `SourceTechnical.ly Brooklyn`                                                                            NA
## `SourceTechnical.ly Philly`                                                                              NA
## SourceTechnoBuffalo                                                                                      NA
## `SourceTechnology Personalized`                                                                          NA
## `SourceTechnology Review`                                                                                NA
## `SourceTechnology Zimbabwe`                                                                              NA
## `SourceTechpoint.ng (blog)`                                                                              NA
## SourceTechRadar                                                                                   2.885e+03
## `SourceTechradar India`                                                                                  NA
## SourceTechRepublic                                                                                       NA
## `SourceTechRepublic (blog)`                                                                              NA
## `SourceTechRepublic via Yahoo! Finance`                                                                  NA
## `SourceTechRepublic via Yahoo! News`                                                                     NA
## SourceTechRez                                                                                            NA
## SourceTechRitual                                                                                         NA
## SourceTechSpot                                                                                           NA
## SourceTechTarget                                                                                         NA
## `SourceTechTarget (blog)`                                                                                NA
## `SourceTechvibes (blog)`                                                                                 NA
## `SourceTechWeekEurope UK`                                                                                NA
## SourceTechwire.net                                                                                       NA
## SourceTechWorld                                                                                          NA
## SourceTechworm                                                                                           NA
## SourceTeenVogue.com                                                                                      NA
## `SourceTehran Times`                                                                                     NA
## `SourceTelecom Asia`                                                                                     NA
## `SourceTelecom Reseller (press release)`                                                                 NA
## Sourcetelecomasia.net                                                                                    NA
## `SourceTelecompaper (subscription)`                                                                      NA
## SourceTeleGeography                                                                                      NA
## `SourceTelegraph via Yahoo UK & Ireland Finance`                                                         NA
## SourceTelegraph.co.uk                                                                                    NA
## `SourceTelegraphStandard.com (blog)`                                                                     NA
## `SourceteleSUR English`                                                                                  NA
## SourceTempo                                                                                              NA
## SourceTempo.co                                                                                           NA
## `SourceTen Eyewitness News`                                                                              NA
## `SourceTerre Haute Tribune Star`                                                                         NA
## `SourceTES News`                                                                                         NA
## `SourceTest Tube`                                                                                        NA
## `SourceTewkesbury ADMAG`                                                                                 NA
## `SourceTexarkana Gazette`                                                                                NA
## `SourceTexas A&M The Battalion`                                                                          NA
## `SourceTexas Tribune`                                                                                    NA
## `SourceTG Daily`                                                                                         NA
## `SourceThaiVisa News`                                                                                    NA
## `SourceThanh Ni\\u009d\\u009dn`                                                                          NA
## `SourceThanh Nien Daily`                                                                                 NA
## `SourceThe-review`                                                                                       NA
## `SourceThe `                                                                                             NA
## `SourceThe Abbotsford News`                                                                              NA
## `SourceThe Actuary`                                                                                      NA
## `SourceThe Adam Smith Institute (blog)`                                                                  NA
## `SourceThe Advertiser`                                                                                   NA
## `SourceThe Advocate`                                                                                     NA
## `SourceThe Aero-News Network`                                                                            NA
## `SourceThe Africa Report`                                                                                NA
## `SourceThe Age`                                                                                          NA
## `SourceThe Albany Herald`                                                                                NA
## `SourceThe American Bazaar`                                                                              NA
## `SourceThe American Conservative`                                                                        NA
## `SourceThe American Genius`                                                                              NA
## `SourceThe American Lawyer`                                                                              NA
## `SourceThe American Prospect`                                                                            NA
## `SourceThe Ames Tribune`                                                                                 NA
## `SourceThe Arab Daily News`                                                                              NA
## `SourceThe Architect's Newspaper`                                                                        NA
## `SourceThe Arctic Journal`                                                                               NA
## `SourceThe Argentina Independent`                                                                        NA
## `SourceThe Argus-Press`                                                                                  NA
## `SourceThe Art Newspaper`                                                                                NA
## `SourceThe Art of Gears`                                                                                 NA
## `SourceThe Asia Foundation - In Asia`                                                                    NA
## `SourceThe Asia Sentinel`                                                                                NA
## `SourceThe Asian Age`                                                                                    NA
## `SourceThe Associated Press via Yahoo Canada Sports`                                                     NA
## `SourceThe Associated Press via Yahoo! Sports`                                                           NA
## `SourceThe Atlantic`                                                                                     NA
## `SourceThe Atlantic via Yahoo Canada News`                                                               NA
## `SourceThe Atlantic via Yahoo UK & Ireland News`                                                         NA
## `SourceThe Atlantic via Yahoo! News`                                                                     NA
## `SourceThe Augusta Chronicle`                                                                            NA
## `SourceThe Australian`                                                                                   NA
## `SourceThe Australian (blog)`                                                                            NA
## `SourceThe Australian (subscription)`                                                                    NA
## `SourceThe Australian (subscription) (blog)`                                                             NA
## `SourceThe Australian Financial Review`                                                                  NA
## `SourceThe Auto Channel`                                                                                 NA
## `SourceThe Bakersfield Californian`                                                                      NA
## `SourceThe Baltic Course`                                                                                NA
## `SourceThe Barrie Examiner`                                                                              NA
## `SourceThe Beacon`                                                                                       NA
## `SourceThe Bellingham Herald`                                                                            NA
## `SourceThe Big Lead`                                                                                     NA
## `SourceThe Biloxi Sun Herald`                                                                            NA
## `SourceThe Bitbag`                                                                                       NA
## `SourceThe Boar`                                                                                         NA
## `SourceThe Bolton News`                                                                                  NA
## `SourceThe Bookseller`                                                                                   NA
## `SourceThe Bookseller (blog)`                                                                            NA
## `SourceThe Border Mail`                                                                                  NA
## `SourceThe Borneo Post`                                                                                  NA
## `SourceThe Boston Globe`                                                                                 NA
## `SourceThe Bottom Line`                                                                                  NA
## `SourceThe Bournemouth Daily Echo`                                                                       NA
## `SourceThe Bozeman Daily Chronicle`                                                                      NA
## `SourceThe Bradford Era`                                                                                 NA
## `SourceThe Brantford Expositor`                                                                          NA
## `SourceThe BRICS Post`                                                                                   NA
## `SourceThe Brown Daily Herald`                                                                           NA
## `SourceThe Brussels Times`                                                                               NA
## `SourceThe Bubble`                                                                                       NA
## `SourceThe Buffalo News`                                                                                 NA
## `SourceThe Bulletin`                                                                                     NA
## `SourceThe Business of Fashion`                                                                          NA
## `SourceTHE BUSINESS TIMES`                                                                               NA
## `SourceThe Business Times Singapore`                                                                     NA
## `SourceThe Cairo Review of Global Affairs (blog)`                                                        NA
## `SourceThe California Aggie`                                                                             NA
## `SourceThe Cambodia Daily`                                                                               NA
## `SourceThe Cameron Herald`                                                                               NA
## `SourceThe Canadian Press via Yahoo Canada Finance`                                               2.160e+04
## `SourceThe Canadian Press via Yahoo Canada News`                                                         NA
## `SourceThe Canadian Press via Yahoo Canada Sports`                                                       NA
## `SourceThe Canberra Times`                                                                               NA
## `SourceThe Canton Repository`                                                                            NA
## `SourceThe Capital Journal`                                                                              NA
## `SourceThe Capitol Fax Blog (blog)`                                                                      NA
## `SourceThe Car Connection`                                                                               NA
## `SourceThe Cerbat Gem`                                                                                   NA
## `SourceThe Charleston Gazette`                                                                           NA
## `SourceThe Charlotte Post`                                                                               NA
## `SourceThe Chattanoogan`                                                                                 NA
## `SourceThe Cheat Sheet`                                                                                  NA
## `SourceThe Cherokeean Herald`                                                                            NA
## `SourceThe Chicago Maroon`                                                                               NA
## `SourceThe Chicago Monitor`                                                                              NA
## `SourceThe Christian Post`                                                                               NA
## `SourceThe Christian Science Monitor`                                                                    NA
## `SourceThe Christian Times`                                                                              NA
## `SourceThe Chronicle-Journal`                                                                            NA
## `SourceThe Chronicle-Telegram`                                                                           NA
## `SourceThe Chronicle Herald`                                                                             NA
## `SourceThe Chronicle Journal`                                                                            NA
## `SourceThe Citizen`                                                                                      NA
## `SourceThe Citizens&#39; Voice`                                                                          NA
## `SourceThe Climate Group`                                                                                NA
## `SourceThe Climate Group (blog)`                                                                         NA
## `SourceThe Coast`                                                                                        NA
## `SourceThe Coast Halifax`                                                                                NA
## `SourceThe Coldwater Daily Reporter`                                                                     NA
## `SourceThe College Fix`                                                                                  NA
## `SourceThe Colorado Independent`                                                                         NA
## `SourceThe Coloradoan`                                                                                   NA
## `SourceThe Columbian`                                                                                    NA
## `SourceThe Commercial Dispatch`                                                                          NA
## `SourceThe Compass`                                                                                      NA
## `SourceThe Concordian (subscription)`                                                                    NA
## `SourceThe Connecticut College Voice`                                                                    NA
## `SourceThe Connexion`                                                                                    NA
## `SourceThe Conroe Courier`                                                                               NA
## `SourceThe Consumerist`                                                                                  NA
## `SourceThe Conversation AU`                                                                              NA
## `SourceThe Conversation UK`                                                                              NA
## `SourceThe Conversation US`                                                                              NA
## `SourceThe Conversation via Yahoo!7 Finance`                                                             NA
## `SourceThe Copenhagen Post - Danish news in english`                                                     NA
## `SourceThe Corner Economic`                                                                              NA
## `SourceThe Cornishman`                                                                                   NA
## `SourceThe Courier`                                                                                      NA
## `SourceThe Courier-Journal`                                                                              NA
## `SourceThe Courier Life News`                                                                            NA
## `SourceThe Courier Mail`                                                                                 NA
## `SourceThe CT Mirror`                                                                                    NA
## `SourceThe Cubic Lane`                                                                                   NA
## `SourceThe Daily Advertiser`                                                                             NA
## `SourceThe Daily Banter`                                                                                 NA
## `SourceThe Daily Breeze`                                                                                 NA
## `SourceThe Daily Buzz via Yahoo Canada News`                                                             NA
## `SourceThe Daily Collegian Online`                                                                       NA
## `SourceThe Daily Comet`                                                                                  NA
## `SourceThe Daily Cougar`                                                                                 NA
## `SourceThe Daily Courier`                                                                                NA
## `SourceThe Daily Dot`                                                                                    NA
## `SourceThe Daily Free Press`                                                                             NA
## `SourceThe Daily Freeman`                                                                                NA
## `SourceThe Daily Gazette`                                                                                NA
## `SourceThe Daily Herald (press release)`                                                                 NA
## `SourceThe Daily Mercury`                                                                                NA
## `SourceThe Daily Mining Gazette`                                                                         NA
## `SourceThe Daily News Journal`                                                                           NA
## `SourceThe Daily News of Newburyport`                                                                    NA
## `SourceThe Daily Pennsylvanian`                                                                          NA
## `SourceThe Daily Progress`                                                                               NA
## `SourceThe Daily Reckoning`                                                                              NA
## `SourceThe Daily Record`                                                                                 NA
## `SourceThe Daily Reflector`                                                                              NA
## `SourceThe Daily Star`                                                                                   NA
## `SourceThe Daily Voice`                                                                                  NA
## `SourceThe Daily Vox (blog)`                                                                             NA
## `SourceThe Daily World`                                                                                  NA
## `SourceThe Day`                                                                                          NA
## `SourceThe Denver Channel`                                                                               NA
## `SourceThe Denver Post`                                                                                  NA
## `SourceThe Denver Post (blog)`                                                                           NA
## `SourceThe Desert Sun`                                                                                   NA
## `SourceThe Detroit News`                                                                                 NA
## `SourceThe Diane Rehm Show`                                                                              NA
## `SourceThe Dickinson Press`                                                                              NA
## `SourceThe Diplomat`                                                                                     NA
## `SourceThe Dismal Scientist (subscription)`                                                              NA
## `SourceThe Dominion Post`                                                                                NA
## `SourceThe Dorset Echo`                                                                                  NA
## `SourceThe Drive`                                                                                        NA
## `SourceThe Drum`                                                                                         NA
## `SourceThe Durango Herald`                                                                               NA
## `SourceThe Eagle Online`                                                                                 NA
## `SourceThe Echo`                                                                                         NA
## `SourceThe Ecologist`                                                                                    NA
## `SourceThe Economic Times`                                                                               NA
## `SourceThe Economist`                                                                                    NA
## `SourceThe Economist (blog)`                                                                             NA
## `SourceThe Edge`                                                                                         NA
## `SourceThe Edge Markets`                                                                                 NA
## `SourceThe Edge Markets MY`                                                                              NA
## `SourceThe Electronic Intifada`                                                                          NA
## `SourceThe Electronic Intifada (blog)`                                                                   NA
## `SourceThe Elkhart Truth`                                                                                NA
## `SourceThe Elkhart Truth (blog)`                                                                         NA
## `SourceThe Emory Wheel`                                                                                  NA
## `SourceThe Epoch Times`                                                                                  NA
## `SourceThe Escapist`                                                                                     NA
## `SourceThe Evening Sun`                                                                                  NA
## `SourceThe Examiner`                                                                                     NA
## `SourceThe Exponent Telegram (press release) (registration)`                                             NA
## `SourceThe Express Tribune`                                                                              NA
## `SourceThe Express Tribune (blog)`                                                                       NA
## `SourceThe FADER`                                                                                        NA
## `SourceThe Fayetteville Observer`                                                                        NA
## `SourceThe Federalist`                                                                                   NA
## `SourceThe FINANCIAL`                                                                                    NA
## `SourceThe Financial Express via Yahoo! Finance India`                                                   NA
## `SourceThe Fiscal Times`                                                                                 NA
## `SourceThe Fiscal Times via Yahoo UK & Ireland Finance`                                                  NA
## `SourceThe Fiscal Times via Yahoo! Finance`                                                              NA
## `SourceThe Fiscal Times via Yahoo! New Zealand Finance`                                                  NA
## `SourceThe Fiscal Times via Yahoo! News`                                                                 NA
## `SourceThe Fiscal Times via Yahoo!7 Finance`                                                             NA
## `SourceThe Flagship`                                                                                     NA
## `SourceThe Flamborough Review (press release) (registration)`                                            NA
## `SourceThe Flinders News`                                                                                NA
## `SourceThe Fort Campbell Courier`                                                                        NA
## `SourceThe Forward`                                                                                      NA
## `SourceThe Fresno Bee`                                                                                   NA
## `SourceThe Gadgeteer`                                                                                    NA
## `SourceThe Gadsden Times`                                                                                NA
## `SourceThe Gainesville Times`                                                                            NA
## `SourceThe Garden City Telegram`                                                                         NA
## `SourceThe GATE`                                                                                         NA
## `SourceThe Gateway Online`                                                                               NA
## `SourceThe Gazette`                                                                                      NA
## `SourceThe Gazette  Western University's Student Newspaper`                                              NA
## `SourceThe Gazette: Eastern Iowa Breaking News and Headlines`                                            NA
## `SourceThe Gilmer Mirror`                                                                                NA
## `SourceThe Gleaner`                                                                                      NA
## `SourceThe Global Herald`                                                                                NA
## `SourceThe Globalist`                                                                                    NA
## `SourceThe Globe and Mail`                                                                               NA
## `SourceThe Globe and Mail (subscription)`                                                                NA
## `SourceThe Grio`                                                                                         NA
## `SourceThe Guardian`                                                                                     NA
## `SourceThe Guardian (Australia)`                                                                         NA
## `SourceThe Guardian (blog)`                                                                              NA
## `SourceThe Guardian Charlottetown`                                                                       NA
## `SourceThe Guardian Nigeria (satire) (press release) (blog)`                                             NA
## `SourceThe Guru Investor`                                                                                NA
## `SourceThe Hacked News`                                                                                  NA
## `SourceThe Hamilton Journal News`                                                                        NA
## `SourceThe Hankyoreh`                                                                                    NA
## `SourceThe Hans India`                                                                                   NA
## `SourceThe Harvard Crimson`                                                                              NA
## `SourceThe Hazleton Standard-Speaker`                                                                    NA
## `SourceThe Heartland Institute`                                                                          NA
## `SourceThe Hechinger Report`                                                                             NA
## `SourceThe Heights`                                                                                      NA
## `SourceThe Henderson Daily News`                                                                         NA
## `SourceThe Hendersonville Times-News`                                                                    NA
## `SourceThe Herald`                                                                                       NA
## `SourceThe Herald-News`                                                                                  NA
## `SourceThe Herald-Times (subscription)`                                                                  NA
## `SourceThe Herald Bulletin`                                                                              NA
## `SourceThe Herald News`                                                                                  NA
## `SourceThe Hereford Times`                                                                               NA
## `SourceThe Hill`                                                                                         NA
## `SourceThe Hill (blog)`                                                                                  NA
## `SourceThe Hillsdale Daily News`                                                                         NA
## `SourceThe Hilltop News`                                                                                 NA
## `SourceThe Hindu`                                                                                        NA
## `SourceThe Hollywood Reporter`                                                                           NA
## `SourceThe Hollywood Reporter via Yahoo! News`                                                           NA
## `SourceThe Hollywood Source`                                                                             NA
## `SourceThe Holmes Report`                                                                                NA
## `SourceThe Houma Courier`                                                                                NA
## `SourceThe Hub at Johns Hopkins`                                                                         NA
## `SourceThe Huffington Post`                                                                              NA
## `SourceThe Huffington Post UK`                                                                           NA
## `SourceThe Huntington News`                                                                              NA
## `SourceThe Independent`                                                                                  NA
## `SourceThe Independent Florida Alligator`                                                                NA
## `SourceThe Indian Express`                                                                               NA
## `SourceThe Indian Express (blog)`                                                                        NA
## `SourceThe Indian Express via Yahoo! India News`                                                         NA
## `SourceThe Indian Panorama`                                                                              NA
## `SourceThe Indianapolis Star`                                                                            NA
## `SourceThe indy100`                                                                                      NA
## `SourceThe Inquirer`                                                                                     NA
## `SourceThe Inquisitr`                                                                                    NA
## `SourceThe Intelligencer / Wheeling News-Register`                                                       NA
## `SourceThe Intercept`                                                                                    NA
## `SourceThe Interpreter`                                                                                  NA
## `SourceThe Irish Catholic`                                                                               NA
## `Sourcethe Irish News`                                                                                   NA
## `SourceThe Irish Times`                                                                                  NA
## `SourceThe Irrawaddy News Magazine`                                                                      NA
## `SourceThe Ithaca Voice`                                                                                 NA
## `SourceThe Jacksonville Daily News`                                                                      NA
## `SourceThe Japan News`                                                                                   NA
## `SourceThe Japan Times`                                                                                  NA
## `SourceThe Jewish Journal of Greater Los Angeles`                                                        NA
## `SourceThe Jewish Press`                                                                                 NA
## `SourceThe Jewish Press (blog)`                                                                          NA
## `SourceThe Jewish Standard`                                                                              NA
## `SourceThe Jewish Star`                                                                                  NA
## `SourceThe Jewish Voice`                                                                                 NA
## `SourceThe Jewish Week`                                                                                  NA
## `SourceThe Journal`                                                                                      NA
## `SourceThe Journal News | LoHud.com`                                                                     NA
## `SourceThe Justice`                                                                                      NA
## `SourceThe Kansas City Star`                                                                             NA
## `SourceThe Keene Sentinel`                                                                               NA
## `SourceThe Killeen Daily Herald`                                                                         NA
## `SourceThe Kingston Whig-Standard`                                                                       NA
## `SourceThe Korea Herald`                                                                                 NA
## `SourceThe Korea Observer`                                                                               NA
## `SourceThe Lakeland Ledger`                                                                              NA
## `SourceThe Lawton Constitution`                                                                          NA
## `SourceThe Lawyer`                                                                                       NA
## `SourceThe Lawyer (registration)`                                                                        NA
## `SourceThe Ledger`                                                                                       NA
## `SourceThe Lens`                                                                                         NA
## `SourceThe Libertarian Republic`                                                                         NA
## `SourceThe Link`                                                                                         NA
## `SourceThe Local`                                                                                        NA
## `SourceThe Local Denmark`                                                                                NA
## `SourceThe Local.ch`                                                                                     NA
## `SourceThe Local.de`                                                                                     NA
## `SourceThe Local.es`                                                                                     NA
## `SourceThe Local.fr`                                                                                     NA
## `SourceThe Local.it`                                                                                     NA
## `SourceThe Local.se`                                                                                     NA
## `SourceThe London News Review`                                                                           NA
## `SourceThe Longview News-Journal`                                                                        NA
## `SourceThe Louisville Cardinal`                                                                          NA
## `SourceThe Mac Observer`                                                                                 NA
## `SourceThe Maitland Mercury`                                                                             NA
## `SourceThe Malay Mail Online via Yahoo! Singapore News`                                                  NA
## `SourceThe Malaysian Insider`                                                                            NA
## `SourceThe Malaysian Insider via Yahoo! Singapore News`                                                  NA
## `SourceThe Mancunion`                                                                                    NA
## `SourceThe Manila Times`                                                                                 NA
## `SourceThe Marijuana Times`                                                                              NA
## `SourceThe Market Mogul`                                                                                 NA
## `SourceThe Market Oracle`                                                                                NA
## `SourceThe Marshalltown`                                                                                 NA
## `SourceThe Mary Sue`                                                                                     NA
## `SourceThe Mass Media`                                                                                   NA
## `SourceThe Massachusetts Daily Collegian`                                                                NA
## `SourceThe McDowell News`                                                                                NA
## `SourceThe McGill International Review`                                                                  NA
## `SourceThe Mckeesport Daily News`                                                                        NA
## `SourceThe Media Line`                                                                                   NA
## `SourceThe Medina County Gazette`                                                                        NA
## `SourceThe Memo`                                                                                         NA
## `SourceThe Memphis Daily News`                                                                           NA
## `SourceThe Mercury`                                                                                      NA
## `SourceThe Mercury News`                                                                                 NA
## `SourceThe Merkle (blog)`                                                                                NA
## `SourceThe MetroWest Daily News`                                                                         NA
## `SourceThe Michigan Daily`                                                                               NA
## `SourceThe Milpitas Post`                                                                                NA
## `SourceThe Minnesota Daily`                                                                              NA
## `SourceThe Mission City Record`                                                                          NA
## `SourceThe Missoulian`                                                                                   NA
## `SourceThe MIT Tech`                                                                                     NA
## `SourceThe Moderate Voice`                                                                               NA
## `SourceThe Moose Jaw Times Herald`                                                                       NA
## `SourceThe Morganton News Herald`                                                                        NA
## `SourceThe Morning Call`                                                                                 NA
## `SourceThe Moscow Times`                                                                                 NA
## `SourceThe Moscow Times (registration)`                                                                  NA
## `SourceThe Motley Fool`                                                                                  NA
## `SourceThe Motley Fool Canada`                                                                           NA
## `SourceThe Muslim News`                                                                                  NA
## `SourceThe Narco News Bulletin`                                                                          NA
## `SourceThe Nashua Telegraph`                                                                             NA
## `SourceThe Nation`                                                                                       NA
## `SourceThe Nation - Thailand&#39;s English news`                                                  2.617e+04
## `SourceThe Nation (blog)`                                                                                NA
## `SourceThe Nation Newspaper`                                                                             NA
## `SourceThe Nation.`                                                                                      NA
## `SourceThe Nation. (blog)`                                                                               NA
## `SourceThe National`                                                                                     NA
## `SourceThe National Business Review`                                                                     NA
## `SourceThe National Enquirer`                                                                            NA
## `SourceThe National Interest Online`                                                                     NA
## `SourceThe National Interest Online (blog)`                                                              NA
## `SourceThe National Law Review`                                                                          NA
## `SourceThe National Memo (blog)`                                                                         NA
## `SourceThe Native American Times`                                                                        NA
## `SourceThe Nelson Mail`                                                                                  NA
## `SourceThe Neosho Daily News`                                                                            NA
## `SourceThe New American`                                                                                 NA
## `SourceThe New Canaan News`                                                                              NA
## `SourceThe New Civil Rights Movement`                                                                    NA
## `SourceThe New Daily`                                                                                    NA
## `SourceThe New Indian Express`                                                                           NA
## `SourceThe New Mexico Daily Lobo`                                                                        NA
## `SourceThe New Orleans Advocate`                                                                         NA
## `SourceThe New School News (blog)`                                                                       NA
## `SourceThe New Statesman`                                                                                NA
## `SourceThe New Times`                                                                                    NA
## `SourceThe New York Observer`                                                                            NA
## `SourceThe New York Review of Books`                                                                     NA
## `SourceThe New Yorker`                                                                                   NA
## `SourceThe New Yorker (satire)`                                                                          NA
## `SourceThe New Zealand Herald`                                                                           NA
## `SourceThe News`                                                                                         NA
## `SourceThe News-Press`                                                                                   NA
## `SourceThe News-Times`                                                                                   NA
## `SourceThe News & Observer`                                                                              NA
## `SourceThe News Center`                                                                                  NA
## `SourceThe News Herald`                                                                                  NA
## `SourceThe News Hub`                                                                                     NA
## `SourceThe News International`                                                                           NA
## `SourceThe News Journal`                                                                                 NA
## `SourceThe News Minute`                                                                                  NA
## `SourceThe News Tribune`                                                                                 NA
## `SourceThe News Tribune (blog)`                                                                          NA
## `SourceThe Next Digit`                                                                                   NA
## `SourceThe Next Silicon Valley`                                                                          NA
## `SourceThe Next Web`                                                                                     NA
## `SourceThe Nonprofit Quarterly (blog)`                                                                   NA
## `SourceThe Nordic Page`                                                                                  NA
## `SourceThe North Bay Nugget`                                                                             NA
## `SourceThe Northern Echo (registration)`                                                                 NA
## `SourceThe Northwest Florida Daily News`                                                                 NA
## `SourceThe Oakland Press`                                                                                NA
## `SourceThe Oberlin Review`                                                                               NA
## `SourceThe Observer-Dispatch`                                                                            NA
## `SourceThe Oceanside Post`                                                                               NA
## `SourceThe Oklahoma Daily`                                                                               NA
## `SourceThe Olympian`                                                                                     NA
## `SourceThe Onion (satire)`                                                                               NA
## `SourceThe Orator`                                                                                       NA
## `SourceThe Oshkosh Northwestern`                                                                         NA
## `SourceThe Ottawa Times`                                                                                 NA
## `SourceThe Oxford Times`                                                                                 NA
## `SourceThe Palm Beach Post`                                                                              NA
## `SourceThe Panther`                                                                                      NA
## `SourceThe Pappas Post`                                                                                  NA
## `SourceThe Pasadena Star-News`                                                                           NA
## `SourceThe Peak`                                                                                         NA
## `SourceThe People's Voice`                                                                               NA
## `SourceThe Philadelphia Inquirer`                                                                        NA
## `SourceThe Players Tribune`                                                                              NA
## `SourceThe Point Review`                                                                                 NA
## `SourceThe Portugal News`                                                                                NA
## `SourceThe Post`                                                                                         NA
## `SourceThe Post and Courier`                                                                             NA
## `SourceThe Predictive Analytics Times`                                                                   NA
## `SourceThe Press`                                                                                        NA
## `SourceThe Press-Enterprise`                                                                             NA
## `SourceThe Prince Albert Daily Herald`                                                                   NA
## `SourceThe Progressive Pulse`                                                                            NA
## `SourceThe Providence Journal`                                                                           NA
## `SourceThe Province`                                                                                     NA
## `SourceThe Province - BC - Victoria`                                                                     NA
## `SourceThe Punch`                                                                                        NA
## `SourceThe Queensland Times`                                                                             NA
## `SourceThe Rancher`                                                                                      NA
## `SourceThe Randolph County Herald-Tribune`                                                               NA
## `SourceThe Real News Network`                                                                            NA
## `SourceThe Real News Network (blog)`                                                                     NA
## `SourceThe Rebel`                                                                                        NA
## `SourceThe Record`                                                                                       NA
## `SourceThe Record (New Westminster)`                                                                     NA
## `SourceThe Recorder`                                                                                     NA
## `SourceThe Register`                                                                              2.216e+03
## `SourceThe Register-Guard`                                                                               NA
## `SourceThe Republic`                                                                                     NA
## `SourceThe Review`                                                                                       NA
## `SourceThe Ridgefield Press`                                                                             NA
## `SourceThe Ringer (blog)`                                                                                NA
## `SourceThe Rio Times`                                                                                    NA
## `SourceThe Robesonian`                                                                                   NA
## `SourceThe Rock Hill Herald`                                                                             NA
## `SourceThe Root`                                                                                         NA
## `SourceThe Root (blog)`                                                                                  NA
## `SourceThe Rude Baguette`                                                                                NA
## `SourceThe Rushville Republican`                                                                         NA
## `SourceThe Russellville Courier`                                                                         NA
## `SourceThe Sacramento Bee`                                                                               NA
## `SourceThe Salem News`                                                                                   NA
## `SourceThe Salinas Californian`                                                                          NA
## `SourceThe Salt Lake Tribune`                                                                            NA
## `SourceThe San Diego Union-Tribune`                                                                      NA
## `SourceThe San Gabriel Valley Tribune`                                                                   NA
## `SourceThe San Luis Obispo Tribune`                                                                      NA
## `SourceThe Sarasota Herald-Tribune`                                                                      NA
## `SourceThe Saratogian`                                                                                   NA
## `SourceThe Scotsman`                                                                                     NA
## `SourceThe Scranton Times-Tribune`                                                                       NA
## `SourceThe Seattle Times`                                                                                NA
## `SourceThe Sheboygan Press`                                                                              NA
## `SourceThe Shillong Times`                                                                               NA
## `SourceThe Siasat Daily`                                                                                 NA
## `SourceThe Simcoe Reformer`                                                                              NA
## `SourceThe Siver Times`                                                                                  NA
## `SourceThe Skanner`                                                                                      NA
## `SourceThe Slovak Spectator`                                                                             NA
## `SourceThe Sofia Globe`                                                                                  NA
## `SourceThe Source`                                                                                       NA
## `SourceThe Southern`                                                                                     NA
## `SourceThe Southland Times`                                                                              NA
## `SourceThe Spinoff`                                                                                      NA
## `SourceThe Spokesman-Review`                                                                             NA
## `SourceThe Spokesman Review (registration)`                                                              NA
## `SourceThe Stack`                                                                                        NA
## `SourceThe Standard`                                                                                     NA
## `SourceThe Standard Digital News (press release) (blog)`                                                 NA
## `SourceThe Standard Digital News (satire) (press release) (registration) (blog)`                         NA
## `Sourcethe star`                                                                                         NA
## `SourceThe Star`                                                                                         NA
## `SourceThe Star-Ledger`                                                                                  NA
## `SourceThe Star Online`                                                                                  NA
## `SourceThe Star, Kenya`                                                                                  NA
## `SourceThe State`                                                                                        NA
## `SourceThe State (blog)`                                                                                 NA
## `SourceThe State Journal-Register`                                                                       NA
## `SourceThe State News`                                                                                   NA
## `SourceThe Statesman`                                                                                    NA
## `SourceThe Straits Times`                                                                                NA
## `SourceThe Sudbury Star`                                                                                 NA
## `SourceThe Sun`                                                                                          NA
## `SourceThe Sun Daily`                                                                                    NA
## `SourceThe Sun Herald`                                                                                   NA
## `SourceThe Sunday Business Post`                                                                         NA
## `SourceThe Sunday Post`                                                                                  NA
## `SourceThe Sunday Times`                                                                                 NA
## `SourceThe Sunday Times Sri Lanka`                                                                       NA
## `SourceThe Sunshine Coast Daily`                                                                         NA
## `SourceThe Swedish Wire`                                                                                 NA
## `SourceThe Sydney Morning Herald`                                                                        NA
## `SourceThe Tablet`                                                                                       NA
## `SourceThe Takeaway (blog)`                                                                              NA
## `SourceThe Tampa  Tribune`                                                                               NA
## `SourceThe Tand D.com`                                                                                   NA
## `SourceThe Tech Portal`                                                                                  NA
## `SourceThe Tech Report, LLC`                                                                             NA
## `SourceThe Tech Report, LLC (blog)`                                                                      NA
## `SourceThe TechNews`                                                                                     NA
## `SourceThe Telegram`                                                                                     NA
## `SourceThe Telegraph`                                                                                    NA
## `SourceThe Temple News`                                                                                  NA
## `SourceThe Tennessean`                                                                                   NA
## `SourceThe Tico Times`                                                                                   NA
## `SourceThe Tidings`                                                                                      NA
## `SourceThe Times (subscription)`                                                                         NA
## `SourceThe Times and Democrat`                                                                           NA
## `SourceThe Times of India`                                                                               NA
## `SourceThe Times of Isra\\u009d\\u009dl`                                                                 NA
## `SourceThe Times of Israel`                                                                              NA
## `SourceThe Times of Israël`                                                                              NA
## `SourceThe Times of Israel (blog)`                                                                       NA
## `SourceThe Toledo Blade`                                                                                 NA
## `SourceThe Trace`                                                                                        NA
## `SourceThe Tribune`                                                                                      NA
## `SourceThe Trinidad Guardian`                                                                            NA
## `SourceThe Truro Daily News`                                                                             NA
## `SourceThe Tuscaloosa News`                                                                              NA
## `SourceThe Tyee`                                                                                         NA
## `SourceThe UCSD Guardian Online`                                                                         NA
## `SourceThe Ulster Herald`                                                                                NA
## `SourceThe Undefeated`                                                                                   NA
## `SourceThe Union Leader`                                                                                 NA
## `SourceThe Union of Grass Valley`                                                                        NA
## `SourceThe Uniontown Herald Standard`                                                                    NA
## `SourceThe University of Hawaii Kaleo`                                                                   NA
## `SourceThe Unofficial Apple Weblog`                                                                      NA
## `SourceThe VAR Guy`                                                                                      NA
## `SourceThe Verge`                                                                                        NA
## `SourceThe Verge via Yahoo Canada News`                                                                  NA
## `SourceThe Verge via Yahoo! News`                                                                 3.875e+07
## `SourceThe Vermilion`                                                                                    NA
## `SourceThe Vermont Standard`                                                                             NA
## `SourceThe Victoria Advocate`                                                                            NA
## `SourceThe Vista Voice`                                                                                  NA
## `SourceThe Voice Herald (blog)`                                                                          NA
## `SourceThe Voice Observer (blog)`                                                                        NA
## `SourceThe Voice of Millions`                                                                            NA
## `SourceThe Wahpeton Daily News`                                                                          NA
## `SourceThe Wall Street Journal`                                                                   4.745e+07
## `SourceThe Wall Street Journal via Yahoo Canada Finance`                                                 NA
## `SourceThe Wall Street Journal via Yahoo UK & Ireland Finance`                                           NA
## `SourceThe Wall Street Journal via Yahoo! Finance`                                                       NA
## `SourceThe Wall Street Journal via Yahoo! Finance India`                                                 NA
## `SourceThe Wall Street Journal via Yahoo! New Zealand Finance`                                           NA
## `SourceThe Wall Street Journal via Yahoo! News`                                                          NA
## `SourceThe Wall Street Journal via Yahoo!7 Finance`                                                      NA
## `SourceThe Washington Times`                                                                             NA
## `SourceThe Wayne Independent`                                                                            NA
## `SourceThe Weather Channel`                                                                              NA
## `SourceThe Weather Network`                                                                              NA
## `SourceThe Weed Blog (blog)`                                                                             NA
## `SourceThe Week Magazine`                                                                                NA
## `SourceThe Week UK`                                                                                      NA
## `SourceThe Weekly Standard`                                                                              NA
## `SourceThe Weekly Standard (blog)`                                                                       NA
## `SourceThe Wesleyan Argus`                                                                               NA
## `SourceThe West Australian`                                                                              NA
## `SourceThe West Australian via Yahoo!7 News`                                                             NA
## `SourceThe Westerly Sun`                                                                                 NA
## `SourceThe Whistler`                                                                                     NA
## `SourceThe White House`                                                                                  NA
## `SourceThe White House (blog)`                                                                           NA
## `SourceThe Wire`                                                                                         NA
## `SourceThe Worldfolio`                                                                                   NA
## `SourceThe Wrap via Yahoo Celebrity`                                                                     NA
## `SourceThe Youngstown Vindicator`                                                                        NA
## `SourceThe Yucatan Times`                                                                                NA
## `SourceThe Zimbabwe Standard`                                                                            NA
## `SourceThe Zimbabwean`                                                                                   NA
## SourceTheBlaze.com                                                                                       NA
## SourceTheCable                                                                                           NA
## SourceTheChronicleHerald.ca                                                                              NA
## SourceTheCork.ie                                                                                         NA
## SourceThefairfieldrecorder                                                                               NA
## SourceThegardenisland.com                                                                                NA
## SourceTheHorse.com                                                                                       NA
## `SourceTheHostingNews.com (press release) (blog)`                                                        NA
## SourceThehour.com                                                                                        NA
## Sourcetheifp.ca                                                                                          NA
## Sourcethejournal.ie                                                                                      NA
## `SourceTheJournal.ie via Yahoo UK & Ireland Finance`                                                     NA
## `SourceTheJournal.ie via Yahoo UK & Ireland News`                                                        NA
## SourceThelakeandeswave                                                                                   NA
## Sourcethenews.pl                                                                                         NA
## SourceTheParliamentMagazine.eu                                                                           NA
## SourceThePoultrySite.com                                                                                 NA
## Sourcethepridela.com                                                                                     NA
## SourceTheSouthAfrican                                                                                    NA
## SourceTheSportsCampus.com                                                                                NA
## SourceTheStranger.com                                                                                    NA
## `SourceTheStranger.com (blog)`                                                                           NA
## SourceTheStreet.com                                                                               6.711e+07
## SourceTheTower.org                                                                                       NA
## SourcetheTrumpet.com                                                                                     NA
## SourceTheTyee.ca                                                                                         NA
## SourceThevillagessuntimes                                                                                NA
## SourceTheWrap                                                                                            NA
## SourceThinkAdvisor                                                                                       NA
## SourceThinkProgress                                                                                      NA
## `SourceThird Sector`                                                                                     NA
## `SourceThis is Bristol`                                                                                  NA
## `SourceThis is Money`                                                                                    NA
## `SourceThis Is Money`                                                                                    NA
## `SourceThis is Oxfordshire`                                                                              NA
## `SourceTHISDAY Live`                                                                                     NA
## `SourceThomas Reuters Fondation`                                                                         NA
## SourceThomasNet                                                                                   6.711e+07
## `SourceThomson Reuters Foundation`                                                                       NA
## `SourceThomson Reuters StreetEvents via Yahoo! Finance`                                                  NA
## SourceThreatpost                                                                                         NA
## `SourceThurrott.com (blog)`                                                                              NA
## SourceTHV11.com                                                                                          NA
## `SourceTickerTV News (press release)`                                                                    NA
## SourceTidBITS                                                                                            NA
## `SourceTimaru Herald`                                                                                    NA
## SourceTIME                                                                                               NA
## `SourceTime Magazine`                                                                             6.711e+07
## `SourceTimes Colonist`                                                                                   NA
## `SourceTimes Daily`                                                                                      NA
## `SourceTimes Higher Education (THE)`                                                                     NA
## `SourceTimes Leader`                                                                                     NA
## `SourceTimes LIVE`                                                                                       NA
## `SourceTimes News`                                                                                       NA
## `SourceTimes Now.tv`                                                                                     NA
## `SourceTimes of India`                                                                                   NA
## `SourceTimes of India (blog)`                                                                            NA
## `SourceTimes of Malta`                                                                                   NA
## `SourceTimes of Malta (blog)`                                                                            NA
## `SourceTimes of Oman`                                                                                    NA
## `SourceTimes Record`                                                                                     NA
## `SourceTimes Record (subscription)`                                                                      NA
## `SourceTimes Record News`                                                                                NA
## SourceTimesonline.com                                                                                    NA
## `SourceTimmins Press`                                                                                    NA
## SourceTMZ.com                                                                                            NA
## SourceTnooz                                                                                              NA
## `SourceToday's Zaman`                                                                                    NA
## `SourceToday in Bermuda`                                                                                 NA
## SourceToday.com                                                                                          NA
## SourceTODAY.ng                                                                                           NA
## SourceTODAYonline                                                                                        NA
## `SourceToledo Blade`                                                                                     NA
## `SourceToledo News Now`                                                                                  NA
## `SourceTom's Guide`                                                                                      NA
## `SourceTom's Hardware`                                                                                   NA
## `SourceToowoomba Chronicle`                                                                              NA
## `SourceTop Tech News`                                                                                    NA
## `SourceTopeka Capital Journal`                                                                           NA
## `SourceTopsail Voice`                                                                                    NA
## `SourceToronto Star`                                                                                     NA
## `SourceToronto Sun`                                                                                      NA
## `SourceTorque News`                                                                                      NA
## SourceTorrentFreak                                                                                       NA
## `SourceTouch Arcade`                                                                                     NA
## `SourceToward Freedom`                                                                                   NA
## SourceTowleroad                                                                                          NA
## `SourceTown Hall`                                                                                        NA
## `SourceTownsville Bulletin`                                                                              NA
## SourceTPM                                                                                                NA
## `SourceTPM (blog)`                                                                                       NA
## `SourceTrade Arabia`                                                                                     NA
## `SourceTrade Calls`                                                                                      NA
## `SourceTrades Union Congress`                                                                            NA
## SourceTradingFloor.com                                                                                   NA
## `SourceTrak.in (blog)`                                                                                   NA
## `SourceTransport Topics Online`                                                                          NA
## `SourceTravel Daily News International`                                                                  NA
## `SourceTravel Weekly`                                                                                    NA
## `SourceTravel+Leisure`                                                                                   NA
## SourceTravelersToday                                                                                     NA
## `SourceTravelGBI (press release) (blog)`                                                                 NA
## SourceTraveller                                                                                          NA
## `SourceTraverse City Record Eagle`                                                                       NA
## SourceTravolution                                                                                        NA
## SourceTreehugger                                                                                         NA
## SourceTrefis                                                                                             NA
## `SourceTrend News Agency`                                                                                NA
## `SourceTri-City Herald`                                                                                  NA
## `SourceTri County Leader`                                                                                NA
## `SourceTriad Business Journal (blog)`                                                                    NA
## `SourceTriangle Business Journal`                                                                        NA
## `SourceTribune-Review`                                                                                   NA
## SourceTrinicenter.com                                                                                    NA
## `SourceTrinidad & Tobago Express`                                                                        NA
## `SourceTrinidad Guardian`                                                                                NA
## `SourceTriple Pundit (registration) (blog)`                                                              NA
## SourceTristatehomepage.com                                                                               NA
## `SourceTriValley Central`                                                                                NA
## `SourceTRT World`                                                                                        NA
## SourceTruckingInfo.com                                                                                   NA
## SourceTrueAchievements                                                                                   NA
## SourceTRUNEWS                                                                                            NA
## SourceTrustedReviews                                                                                     NA
## `SourceTruth-Out`                                                                                        NA
## `SourceTruth In Media`                                                                                   NA
## SourceTruthdig                                                                                           NA
## `SourceTSA - Tout Sur l'Alg\\u009d\\u009drie`                                                            NA
## `SourceTucson News Now`                                                                                  NA
## `SourceTucson Weekly`                                                                                    NA
## SourceTudocelular.com                                                                                    NA
## `SourceTufts Daily`                                                                                      NA
## `SourceTulsa World`                                                                                      NA
## `SourceTunisia Live`                                                                                     NA
## `SourceTuoitrenews (press release)`                                                                      NA
## `SourceTurkish Review`                                                                                   NA
## `SourceTuscaloosa News (subscription)`                                                                   NA
## `SourceTV Guide (blog)`                                                                                  NA
## `SourceTV Newsroom`                                                                                      NA
## `SourceTV Technology`                                                                                    NA
## SourceTVbytheNumbers                                                                                     NA
## SourceTVLine                                                                                             NA
## SourceTVNewser                                                                                           NA
## SourceTVNZ                                                                                               NA
## SourceTVPredictions.com                                                                                  NA
## `SourceTWC News`                                                                                         NA
## `SourceTWCN Tech News (blog)`                                                                            NA
## SourceTweakTown                                                                                          NA
## SourceTwice                                                                                              NA
## `SourceTwin Falls Times-News`                                                                            NA
## `SourceTwinCities.com-Pioneer Press`                                                                     NA
## SourceTwinfinite                                                                                         NA
## `SourceTwitchFilm (blog)`                                                                                NA
## SourceTwitchy                                                                                            NA
## SourceTwoCircles.net                                                                                     NA
## `SourceTyler Morning Telegraph`                                                                          NA
## `SourceU-T San Diego`                                                                                    NA
## `SourceU of M News Service`                                                                              NA
## `SourceU.S. Department of Education (press release)`                                                     NA
## `SourceU.S. Department of Education (press release) (blog)`                                              NA
## `SourceU.S. EPA.gov (press release)`                                                                     NA
## `SourceU.S. News & World Report`                                                                         NA
## `SourceU.S. News & World Report (blog)`                                                                  NA
## `SourceU.S.News & World Report via Yahoo! News`                                                          NA
## SourceU.TV                                                                                               NA
## SourceUbergizmo                                                                                          NA
## `SourceUC Davis`                                                                                         NA
## `SourceUC Los Angeles`                                                                                   NA
## `SourceUC Merced University News`                                                                        NA
## `SourceUCalgary News`                                                                                    NA
## `SourceUChicago News`                                                                                    NA
## `SourceUD Daily`                                                                                         NA
## `SourceUGA Today`                                                                                        NA
## `SourceUK Fundraising`                                                                                   NA
## `SourceUKNow (press release)`                                                                            NA
## `SourceUkraine Today`                                                                                    NA
## `SourceUloop News`                                                                                       NA
## `SourceUltimate-Guitar.Com`                                                                              NA
## Sourceummid.com                                                                                          NA
## `SourceUN Dispatch`                                                                                      NA
## `SourceUN News Centre`                                                                                   NA
## `SourceUncover California`                                                                               NA
## SourceUNCTAD                                                                                             NA
## `SourceUND The Dakota Student`                                                                           NA
## `SourceUndercurrent News`                                                                                NA
## `SourceUnion of Concerned Scientists`                                                                    NA
## `SourceUnionOracle.com (blog)`                                                                           NA
## `SourceUniontown Herald Standard`                                                                        NA
## `SourceUnited Nations`                                                                                   NA
## `SourceUniverse Today`                                                                                   NA
## `SourceUniversity Herald`                                                                                NA
## `SourceUniversity of Delaware`                                                                           NA
## `SourceUniversity of Delaware Review`                                                                    NA
## `SourceUniversity of St. Thomas Newsroom`                                                                NA
## `SourceUniversity of Virginia`                                                                           NA
## `SourceUniversity of Virginia The Cavalier Daily`                                                        NA
## `SourceUniversity World News`                                                                            NA
## `SourceUNM Newsroom`                                                                                     NA
## SourceUPI                                                                                                NA
## SourceUPI.com                                                                                            NA
## SourceUpperMichigansSource.com                                                                           NA
## SourceUPROXX                                                                                             NA
## `SourceUPROXX via Yahoo! News`                                                                           NA
## `SourceUPROXX via Yahoo! Sports`                                                                         NA
## SourceUpstart                                                                                            NA
## `SourceUpstate Business Journal`                                                                         NA
## `SourceUpstream Online`                                                                                  NA
## SourceUpvoted                                                                                            NA
## SourceUpworthy                                                                                           NA
## `SourceUQ News`                                                                                          NA
## `SourceUrban Land`                                                                                       NA
## `SourceUrgent Communications`                                                                            NA
## `SourceUS 99.5`                                                                                          NA
## `SourceUS News & World Report`                                                                           NA
## `SourceUs Weekly`                                                                                        NA
## `SourceUS Weekly`                                                                                        NA
## `SourceUSA Today`                                                                                        NA
## `SourceUSA TODAY`                                                                                 9.491e+07
## `SourceUSA TODAY College`                                                                                NA
## `SourceUSA TODAY High School Sports`                                                                     NA
## `SourceUSAPP American Politics and Policy (blog)`                                                        NA
## `SourceUSDA.gov (press release)`                                                                         NA
## `SourceUSDA.gov (press release) (blog)`                                                                  NA
## `SourceUSgamer (satire) (registration) (blog)`                                                           NA
## `SourceUSNI News`                                                                                        NA
## `SourceuSwitch.com (Tech)`                                                                               NA
## `SourceUT The Daily Texan`                                                                               NA
## `SourceUTA The Shorthorn`                                                                                NA
## `SourceUtah Business`                                                                                    NA
## SourceUTDailyBeacon.com                                                                                  NA
## `SourceUtility Dive`                                                                                     NA
## `SourceUtne Reader Online`                                                                               NA
## `SourceUTV Ireland`                                                                                      NA
## `SourceUTV Ireland (blog)`                                                                               NA
## Sourceuuworld.org                                                                                        NA
## `SourceUW Badger Herald`                                                                                 NA
## `SourceUW Today`                                                                                         NA
## SourceV3.co.uk                                                                                           NA
## `SourceValdosta Daily Times`                                                                             NA
## `SourceValley Advocate`                                                                                  NA
## `SourceValley morning Star`                                                                              NA
## `SourceValley News`                                                                                      NA
## `SourceValley News Live`                                                                                 NA
## SourceValueWalk                                                                                          NA
## `SourceVancity Buzz`                                                                                     NA
## `SourceVancouver Sun`                                                                                    NA
## `SourceVancouver Sun (blog)`                                                                             NA
## SourceVanguard                                                                                           NA
## `SourceVanity Fair`                                                                                      NA
## SourceVariety                                                                                            NA
## `SourceVariety via Yahoo! Finance`                                                                2.237e+03
## `SourceVatican Radio`                                                                                    NA
## SourceVatorNews                                                                                          NA
## SourceVEJA.com                                                                                           NA
## SourceVenezuelanalysis.com                                                                               NA
## `SourceVentura County Star`                                                                              NA
## `SourceVenture Capital Post`                                                                             NA
## SourceVentureBeat                                                                                        NA
## `SourceVentures Africa`                                                                                  NA
## SourceVentureVillage                                                                                     NA
## `SourceVenues Today`                                                                                     NA
## `SourceVera Files`                                                                                       NA
## `SourceVermont Public Radio`                                                                             NA
## SourceVG247                                                                                              NA
## SourceVibe                                                                                               NA
## `SourceVibe Magazine`                                                                                    NA
## SourceVICE                                                                                               NA
## `SourceVICE (blog)`                                                                                      NA
## `SourceVICE News`                                                                                        NA
## `SourceVictor Post`                                                                                      NA
## SourceVideogamer.com                                                                                     NA
## SourceVideoNewsUs                                                                                        NA
## `SourceViet Nam News`                                                                                    NA
## `SourceVietnam Plus`                                                                                     NA
## `SourceVietNamNet Bridge`                                                                                NA
## `SourceVillage Voice`                                                                                    NA
## `SourceVine Report`                                                                                      NA
## `SourceVineland Daily Journal`                                                                           NA
## `SourceVineyard Gazette`                                                                                 NA
## `SourceVirgin Islands Daily News`                                                                        NA
## `SourceVirginia Gazette`                                                                                 NA
## `SourceVirginian-Pilot`                                                                                  NA
## `SourceVirtualization Review`                                                                            NA
## `SourceVirtualization Review (blog)`                                                                     NA
## `SourceVisionMobile (blog)`                                                                              NA
## SourceVnExpress                                                                                          NA
## `SourceVOA Khmer (English)`                                                                              NA
## `SourceVOA Learning English`                                                                             NA
## `SourceVOA News`                                                                                         NA
## `SourceVOA Ting Vit`                                                                                     NA
## `SourceVOA Zimbabwe`                                                                                     NA
## SourceVocativ                                                                                            NA
## SourceVOCM                                                                                               NA
## SourceVogue.co.uk                                                                                        NA
## SourceVogue.com                                                                                          NA
## `SourceVoice & Data Online`                                                                              NA
## `SourceVoice Chronicle`                                                                                  NA
## `SourceVoice of America`                                                                                 NA
## `SourceVoice of America (blog)`                                                                          NA
## `SourceVoice of San Diego`                                                                               NA
## Sourcevoiceofdetroit                                                                                     NA
## `SourceVoltaire Network`                                                                                 NA
## SourceVox                                                                                                NA
## `SourceVR-Zone`                                                                                          NA
## `SourceVR World`                                                                                         NA
## SourceVRFocus                                                                                            NA
## Sourcevtdigger.org                                                                                       NA
## `SourceVulcan Post (press release)`                                                                      NA
## SourceVulture                                                                                            NA
## `SourceW*USA 9`                                                                                          NA
## `SourceWA today`                                                                                         NA
## `SourceWABC-TV`                                                                                          NA
## `SourceWABC-TV New York`                                                                                 NA
## `SourceWABE 90.1 FM`                                                                                     NA
## SourceWACH.com                                                                                           NA
## `SourceWaco Tribune-Herald`                                                                              NA
## `SourceWAFA - Palestine News Agency`                                                                     NA
## SourceWAFF                                                                                               NA
## `SourceWAFF 48 News Huntsville`                                                                          NA
## `SourceWaging Nonviolence`                                                                               NA
## SourceWAGM                                                                                               NA
## `SourceWaikato Times`                                                                                    NA
## Sourcewajr                                                                                               NA
## `SourceWakefield Express`                                                                                NA
## `SourceWakey Wakey News`                                                                                 NA
## `SourceWALB Albany`                                                                                      NA
## SourceWalesOnline                                                                                        NA
## `SourceWall Street 24`                                                                                   NA
## `SourceWall Street Daily`                                                                                NA
## `SourceWall Street Journal`                                                                              NA
## `SourceWall Street Journal (blog)`                                                                       NA
## `SourceWall Street Journal (subscription)`                                                               NA
## `SourceWall Street Journal (subscription) (blog)`                                                        NA
## `SourceWall Street Journal Blogs`                                                                        NA
## `SourceWall Street Pit`                                                                                  NA
## `SourceWalla Walla Union-Bulletin`                                                                       NA
## SourceWaltonian                                                                                          NA
## SourceWAMC                                                                                               NA
## SourceWamda                                                                                              NA
## SourceWAND                                                                                               NA
## `SourceWandsworth Guardian`                                                                              NA
## SourceWANE                                                                                               NA
## SourceWAOW                                                                                               NA
## `SourceWAPT Jackson`                                                                                     NA
## SourceWarc                                                                                               NA
## `SourceWard's Auto`                                                                                      NA
## SourceWareable                                                                                           NA
## `SourceWarsaw Business Journal`                                                                          NA
## `SourceWashington Blade`                                                                                 NA
## `SourceWashington Business Journal`                                                                      NA
## `SourceWashington City Paper`                                                                            NA
## `SourceWashington City Paper (blog)`                                                                     NA
## `SourceWashington Examiner`                                                                              NA
## `SourceWashington Free Beacon`                                                                           NA
## `SourceWashington Free Beacon (blog)`                                                                    NA
## `SourceWashington News Wire`                                                                             NA
## `SourceWashington Post`                                                                           2.273e+03
## `SourceWashington Post (blog)`                                                                           NA
## `SourceWashington Times`                                                                                 NA
## SourceWashingtonian.com                                                                                  NA
## `SourceWaste Management World`                                                                           NA
## Sourcewaste360                                                                                           NA
## SourceWatchdog.org                                                                                       NA
## `SourceWATE 6 On Your Side`                                                                              NA
## `SourceWaterbury Republican American`                                                                    NA
## `SourceWaterloo Cedar Falls Courier`                                                                     NA
## `SourceWaterloo Record`                                                                                  NA
## `SourceWatertown Daily Times`                                                                            NA
## SourceWatertownDailyTimes.com                                                                            NA
## `SourceWausau Daily Herald`                                                                              NA
## `SourceWAVE 3`                                                                                           NA
## `SourceWAVE 3 Louisville`                                                                                NA
## `SourceWAVY-TV`                                                                                          NA
## `SourceWaxahachie Daily Light`                                                                           NA
## `SourceWaynesville Daily Guide`                                                                          NA
## `SourceWBAL-TV Baltimore`                                                                                NA
## `SourceWBAL Baltimore`                                                                                   NA
## `SourceWBAL Radio`                                                                                       NA
## SourceWBAY                                                                                               NA
## SourceWBEZ                                                                                               NA
## `SourceWBEZ 91.5 Chicago`                                                                                NA
## SourceWBFO                                                                                               NA
## `SourceWBIR-TV`                                                                                          NA
## SourceWBIR.com                                                                                           NA
## `SourceWBNS-10TV Columbus`                                                                               NA
## `SourceWBOC TV 16`                                                                                       NA
## `SourceWBOY-TV`                                                                                          NA
## `SourceWBRC FOX6 News - WBRC.com`                                                                        NA
## SourceWBT                                                                                                NA
## SourceWBTV                                                                                               NA
## `SourceWBTV Charlotte`                                                                                   NA
## SourceWBUR                                                                                               NA
## `SourceWBUR Boston`                                                                                      NA
## SourceWBXH                                                                                               NA
## `SourceWCAV Charlottesville`                                                                             NA
## SourceWCAX                                                                                               NA
## `SourceWCAX-TV Vermont`                                                                                  NA
## `SourceWCBD News 2`                                                                                      NA
## SourceWCCFtech                                                                                           NA
## `SourceWCCFtech (blog)`                                                                                  NA
## SourceWCPO                                                                                               NA
## `SourceWCSH-TV`                                                                                          NA
## SourceWCSH6.com                                                                                          NA
## `SourceWCSM Radio`                                                                                       NA
## SourceWCTV                                                                                               NA
## `SourceWCVB Boston`                                                                               6.711e+07
## SourceWCYB                                                                                               NA
## `SourceWDAM-TV`                                                                                          NA
## SourceWDAY                                                                                               NA
## SourceWDBJ7                                                                                              NA
## `SourceWDIV Detroit`                                                                                     NA
## SourceWDRB                                                                                               NA
## `SourceWDSU New Orleans`                                                                                 NA
## SourceWDTN                                                                                               NA
## SourceWDTV                                                                                               NA
## `SourceWe Got This Covered`                                                                              NA
## `SourceWe Live Security (blog)`                                                                          NA
## `SourceWe Up It`                                                                                         NA
## SourceWeAreGreenBay.com                                                                                  NA
## `SourceWeAreTheCity (press release) (blog)`                                                              NA
## SourceWeatherWatch.co.nz                                                                                 NA
## SourceWEAU                                                                                               NA
## `SourceWEAU Eau Claire`                                                                                  NA
## `SourceWeb Host Industry Review`                                                                         NA
## `SourceWeb India`                                                                                        NA
## SourceWebMD                                                                                              NA
## SourceWebProNews                                                                                         NA
## `SourceWebster Journal`                                                                                  NA
## `SourceWECT-TV6`                                                                                         NA
## `SourceWECT 6 Wilmington`                                                                                NA
## `SourceWeekly Times Now`                                                                                 NA
## `SourceWESH 2 Orlando`                                                                                   NA
## `SourceWESH Orlando`                                                                                     NA
## `SourceWest Central Tribune`                                                                             NA
## `SourceWest Virginia MetroNews`                                                                          NA
## `SourceWestern Advocate`                                                                                 NA
## `SourceWestern Journalism`                                                                               NA
## `SourceWestern Morning News`                                                                             NA
## `SourceWestern Producer (subscription)`                                                                  NA
## `SourceWestern Star`                                                                                     NA
## `SourceWestern Telegraph`                                                                                NA
## SourceWesternSlopeNow                                                                                    NA
## `SourceWestfair Online`                                                                                  NA
## `SourceWestlaw Insider (blog)`                                                                           NA
## `SourceWestside Gazette`                                                                                 NA
## `SourceWestside Today`                                                                                   NA
## `SourceWeyburn Review`                                                                                   NA
## SourceWFAA                                                                                               NA
## SourceWFAA.com                                                                                           NA
## SourceWFDD                                                                                               NA
## `SourceWFLX FOX 29`                                                                                      NA
## SourceWFMJ                                                                                               NA
## `SourceWFMJ Youngstown`                                                                                  NA
## SourceWFMYNews2.com                                                                                      NA
## `SourceWFMZ Allentown`                                                                                   NA
## `SourceWFMZ Eastern Pennsylvania and Western New Jersey`                                                 NA
## SourceWFSB                                                                                               NA
## `SourceWFTV Orlando`                                                                                     NA
## SourceWFXG.com                                                                                           NA
## `SourceWGAL 8 Susquehanna Valley`                                                                        NA
## `SourceWGBA-TV`                                                                                          NA
## SourceWGEM                                                                                               NA
## `SourceWGEM Quincy`                                                                                      NA
## SourceWGME                                                                                               NA
## `SourceWGN-TV`                                                                                           NA
## `SourceWGN Radio`                                                                                        NA
## `SourceWGN TV Chicago`                                                                                   NA
## SourceWGNO                                                                                               NA
## SourceWGRZ.com                                                                                           NA
## `SourceWHAS 11.com (subscription)`                                                                       NA
## SourceWHAS11.com                                                                                         NA
## SourceWhatCulture                                                                                        NA
## SourceWhaTech                                                                                            NA
## `SourceWHDH-TV`                                                                                          NA
## SourceWheels.ca                                                                                          NA
## `SourceWhich-50 (blog)`                                                                                  NA
## `SourceWHIO-TV 7 Dayton`                                                                                 NA
## `SourceWhite House Dossier`                                                                              NA
## `SourceWhitehorse Star (subscription)`                                                                   NA
## `SourceWhitehouse.gov (press release)`                                                                   NA
## `SourceWHNT-TV Huntsville`                                                                               NA
## Sourcewhnt.com                                                                                           NA
## `SourceWHO-TV 13 Des Moines`                                                                             NA
## Sourcewhotv.com                                                                                          NA
## `SourceWhoWhatWhy / RealNewsProject (blog)`                                                              NA
## SourceWHSV                                                                                               NA
## `SourceWhyalla News`                                                                                     NA
## `SourceWIAT 42`                                                                                          NA
## SourceWIBW                                                                                               NA
## `SourceWichita Eagle`                                                                                    NA
## `SourceWicked Local`                                                                                     NA
## `SourceWicked Local Natick`                                                                              NA
## `SourceWicked Local Wellesley`                                                                           NA
## SourceWIFR                                                                                               NA
## `SourceWIFR Rockford`                                                                                    NA
## Sourcewigantoday.net                                                                                     NA
## `SourceWii U Daily`                                                                                      NA
## SourceWikinews                                                                                           NA
## `SourceWillamette Week`                                                                                  NA
## `SourceWilts and Gloucestershire Standard`                                                               NA
## `SourceWILX-TV`                                                                                          NA
## `SourceWILX 10 Lansing`                                                                                  NA
## `SourceWINA AM 1070 (press release)`                                                                     NA
## SourceWinBeta                                                                                            NA
## `SourceWindows Central`                                                                                  NA
## `SourceWindows IT Pro`                                                                                   NA
## `SourceWindows IT Pro (blog)`                                                                            NA
## `SourceWindows Report`                                                                                   NA
## `SourceWindowsItPro (subscription)`                                                                      NA
## `SourceWindowsItPro (subscription) (blog)`                                                               NA
## `SourceWindpower Engineering (press release)`                                                            NA
## `SourceWindsor Star`                                                                                     NA
## `SourceWink News`                                                                                        NA
## `SourceWinnipeg Free Press`                                                                              NA
## `SourceWinnipeg Sun`                                                                                     NA
## `SourceWinona Daily News`                                                                                NA
## `SourceWinston-Salem Chronicle`                                                                          NA
## `SourceWinston-Salem Journal`                                                                            NA
## SourceWIRED                                                                                              NA
## `SourceWired News`                                                                                6.711e+07
## `SourceWired UK`                                                                                         NA
## SourceWired.co.uk                                                                                        NA
## `SourceWireless Week`                                                                                    NA
## SourceWirtschaftsWoche                                                                                   NA
## `SourceWIS News 10 Columbia`                                                                             NA
## `SourceWISC-TV Madison`                                                                                  NA
## `SourceWisconsin Gazette`                                                                                NA
## `SourceWisconsin Public Radio News`                                                                      NA
## `SourceWISH-TV`                                                                                          NA
## `SourceWISH-TV Indianapolis`                                                                             NA
## `SourceWISN 12 Milwaukee`                                                                                NA
## `SourceWISN Milwaukee`                                                                                   NA
## SourceWITN                                                                                               NA
## Sourcewivb.com                                                                                           NA
## `SourceWJBF-TV`                                                                                          NA
## SourceWJLA                                                                                               NA
## SourceWJTV                                                                                               NA
## `SourceWJXT Jacksonville`                                                                         6.711e+07
## SourceWKBN.com                                                                                           NA
## `SourceWKBW-TV`                                                                                          NA
## SourceWKOW                                                                                               NA
## SourceWKRG                                                                                               NA
## `SourceWKRG News 5 Mobile`                                                                               NA
## `SourceWKSU News`                                                                                        NA
## `SourceWKYC-TV`                                                                                          NA
## SourceWKYT                                                                                               NA
## `SourceWLBT 3 Jackson`                                                                                   NA
## SourceWLBZ2.com                                                                                          NA
## Sourcewlfi.com                                                                                           NA
## `SourceWLKY Louisville`                                                                                  NA
## SourceWLNS                                                                                               NA
## `SourceWLOX-TV Biloxi`                                                                                   NA
## SourceWLRN                                                                                               NA
## `SourceWLS-TV`                                                                                           NA
## `SourceWLWT-TV Cincinnati`                                                                               NA
## `SourceWLWT Cincinnati`                                                                                  NA
## `SourceWMBD - FOX 43 Peoria`                                                                             NA
## `SourceWMBF News Myrtle Beach`                                                                           NA
## `SourceWMC Action News 5`                                                                                NA
## `SourceWMCTV Memphis`                                                                                    NA
## SourceWMPoweruser.com                                                                                    NA
## SourceWMTV                                                                                               NA
## `SourceWMTW Portland`                                                                                    NA
## `SourceWMUR Manchester`                                                                                  NA
## `SourceWN Philippines`                                                                                   NA
## SourceWNAX                                                                                               NA
## SourceWNBA.com                                                                                           NA
## SourceWNCN                                                                                               NA
## SourceWNCT                                                                                               NA
## SourceWND.com                                                                                            NA
## `SourceWNDU-TV`                                                                                          NA
## `SourceWNEP 16 Pennsylvania`                                                                             NA
## Sourcewnep.com                                                                                           NA
## `SourceWNIJ and WNIU`                                                                                    NA
## SourceWNYC                                                                                               NA
## `SourceWNYC New York Public Radio`                                                                       NA
## SourceWNYT                                                                                               NA
## SourceWOAI                                                                                               NA
## SourceWOAI.com                                                                                           NA
## `SourceWonkette (satire) (blog)`                                                                         NA
## `SourceWoodstock Sentinel-Review`                                                                        NA
## SourceWOODTV.com                                                                                         NA
## `SourceWorcester Telegram`                                                                               NA
## `SourceWorkers World`                                                                                    NA
## SourceWorkpermit.com                                                                                     NA
## `SourceWorld Affairs (blog)`                                                                             NA
## `SourceWorld Bank Group`                                                                                 NA
## `SourceWorld Bank Group (blog)`                                                                          NA
## `SourceWorld Fishing`                                                                                    NA
## `SourceWorld Highways`                                                                                   NA
## `SourceWorld Intellectual Property Review (subscription)`                                                NA
## `SourceWorld Nuclear News`                                                                               NA
## `SourceWorld Policy Institute (blog)`                                                                    NA
## `SourceWorld Politics Review`                                                                            NA
## `SourceWorld Socialist Web Site`                                                                         NA
## `SourceWorld Tribune`                                                                                    NA
## SourceWorldcrunch                                                                                        NA
## `SourceWorthing Herald`                                                                                  NA
## `SourceWorthington Daily Globe`                                                                          NA
## `SourceWOWK-TV West Virginia`                                                                            NA
## SourceWOWT                                                                                               NA
## `SourceWPBF West Palm Beach`                                                                             NA
## SourceWPEC                                                                                               NA
## `SourceWPIX 11 New York`                                                                                 NA
## `SourceWPRI 12 Eyewitness News`                                                                          NA
## SourceWPRO                                                                                               NA
## SourceWPTV.com                                                                                           NA
## SourceWPTZ                                                                                               NA
## `SourceWPTZ Burlington`                                                                                  NA
## `SourceWPTZ The Champlain Valley`                                                                        NA
## `SourceWPVI-TV`                                                                                          NA
## `SourceWPVI – Philadelphia via Yahoo! News`                                                              NA
## `SourceWPVI 6abc Philadelphia`                                                                           NA
## `SourceWPXI Pittsburgh`                                                                                  NA
## `SourceWQAD Moline`                                                                                      NA
## SourceWQAD.com                                                                                           NA
## `SourceWQOW Eau Claire`                                                                                  NA
## `SourceWRAL Tech Wire`                                                                                   NA
## SourceWRAL.com                                                                                           NA
## SourceWRBL                                                                                               NA
## `SourceWRCB-TV`                                                                                          NA
## `SourceWRDW-TV`                                                                                          NA
## `SourceWREG-TV Memphis`                                                                                  NA
## Sourcewreg.com                                                                                           NA
## SourceWrestlezone                                                                                        NA
## `SourceWREX-TV`                                                                                          NA
## SourceWRGB                                                                                               NA
## SourceWRIC                                                                                               NA
## `SourceWRTV Indianapolis`                                                                                NA
## `SourceWSAZ-TV`                                                                                          NA
## `SourceWSB Atlanta`                                                                                      NA
## `SourceWSBT-TV`                                                                                          NA
## SourceWSET                                                                                               NA
## `SourceWSFA 12 Montgomery`                                                                               NA
## SourceWSLS                                                                                               NA
## `SourceWSOC Charlotte`                                                                                   NA
## `SourceWSYM-TV`                                                                                          NA
## SourceWSYR                                                                                               NA
## `SourceWT VOX`                                                                                           NA
## `SourceWTAE-TV Pittsburgh`                                                                               NA
## `SourceWTAE Pittsburgh`                                                                                  NA
## SourceWTAJ                                                                                               NA
## SourceWTAW                                                                                               NA
## SourceWTHR                                                                                               NA
## `SourceWTHR Indianapolis`                                                                         6.711e+07
## `SourceWTKR Norfolk`                                                                                     NA
## Sourcewtkr.com                                                                                           NA
## SourceWTMA                                                                                               NA
## `SourceWTMJ-TV (press release) (registration) (blog)`                                                    NA
## `SourceWTMJ (press release) (subscription) (blog)`                                                       NA
## `SourceWTNH Connecticut News (press release)`                                                            NA
## SourceWTOC                                                                                               NA
## `SourceWTOC 11 Savannah`                                                                                 NA
## SourceWTOK                                                                                               NA
## SourceWTOL.com                                                                                           NA
## SourceWTOP                                                                                               NA
## `SourceWTOV Steubenville`                                                                                NA
## `SourceWTSP 10 News`                                                                                     NA
## SourceWTSP.com                                                                                           NA
## `SourceWTTV CBS4Indy`                                                                                    NA
## SourceWTVA                                                                                               NA
## SourceWTVC                                                                                               NA
## `SourceWTVD-TV`                                                                                          NA
## SourceWTVM                                                                                               NA
## `SourceWTXL ABC 27`                                                                                      NA
## `SourceWUIS 91.9`                                                                                        NA
## SourceWUSA9.com                                                                                          NA
## SourceWVLT                                                                                               NA
## SourceWVTM13                                                                                             NA
## `SourceWVVA Bluefield`                                                                                   NA
## `SourceWVVA TV (registration)`                                                                           NA
## `SourceWWAY NewsChannel 3`                                                                               NA
## `SourceWWBT NBC12 News`                                                                                  NA
## SourceWWD                                                                                                NA
## SourceWWL                                                                                                NA
## Sourcewwlp.com                                                                                           NA
## `SourceWWMT-TV`                                                                                          NA
## `SourceWWNY TV 7`                                                                                        NA
## `SourceWWSB ABC 7`                                                                                       NA
## Sourcewww.breakbulk.com                                                                                  NA
## `Sourcewww.kingstonregion.com/`                                                                          NA
## Sourcewww.worldbulletin.net                                                                              NA
## `SourceWXIA-TV`                                                                                          NA
## `SourceWXII-TV Winston-Salem`                                                                            NA
## SourceWXIX                                                                                               NA
## `SourceWXOW 19 La Crosse`                                                                                NA
## `SourceWXXI News`                                                                                        NA
## SourceWXYZ                                                                                               NA
## `SourceWXYZ-TV Detroit`                                                                                  NA
## `SourceWYFF 4 Greenville`                                                                                NA
## `SourceWyoming Business Report`                                                                          NA
## `SourceWyoming Tribune`                                                                                  NA
## SourceWYTV                                                                                               NA
## `SourceWZZM 13 Grand Rapids`                                                                             NA
## SourceWZZM13.com                                                                                         NA
## `SourceXãLun.com tin tc vit nam 24h cp nht`                                                              NA
## SourceXconomy                                                                                            NA
## `SourceXDA Developers (blog)`                                                                            NA
## SourceXinhua                                                                                             NA
## SourceXXLMAG.COM                                                                                         NA
## `SourceYa Libnan`                                                                                        NA
## `SourceYahoo Autos`                                                                                      NA
## `SourceYahoo Canada Finance - Insight (blog)`                                                            NA
## `SourceYahoo Canada Sports (blog)`                                                                       NA
## `SourceYahoo Celebrity UK`                                                                               NA
## `SourceYahoo Finance`                                                                                    NA
## `SourceYahoo Finance UK`                                                                                 NA
## `SourceYahoo Finance via Yahoo! Finance`                                                                 NA
## `SourceYahoo Finance via Yahoo! News`                                                                    NA
## `SourceYahoo Food`                                                                                       NA
## `SourceYahoo Health`                                                                                     NA
## `SourceYahoo Katie Couric`                                                                               NA
## `SourceYahoo Movies (blog)`                                                                              NA
## `SourceYahoo Music`                                                                                      NA
## `SourceYahoo New Zealand via Yahoo! New Zealand News`                                                    NA
## `SourceYahoo New Zealand via Yahoo!7 News`                                                               NA
## `SourceYahoo News`                                                                                       NA
## `SourceYahoo News Canada (blog)`                                                                         NA
## `SourceYahoo News Digest`                                                                                NA
## `SourceYahoo News UK`                                                                                    NA
## `SourceYahoo News via Yahoo Canada News`                                                                 NA
## `SourceYahoo News via Yahoo UK & Ireland News`                                                           NA
## `SourceYahoo News via Yahoo! News`                                                                       NA
## `SourceYahoo Parenting`                                                                                  NA
## `SourceYahoo Politics`                                                                                   NA
## `SourceYahoo Singapore News`                                                                             NA
## `SourceYahoo Singapore on Tumblr via Yahoo! Singapore News`                                              NA
## `SourceYahoo Sports`                                                                                     NA
## `SourceYahoo Sports (blog)`                                                                              NA
## `SourceYahoo Tech`                                                                                       NA
## `SourceYahoo Tech via Yahoo! News`                                                                       NA
## `SourceYahoo Travel`                                                                                     NA
## `SourceYahoo TV (blog)`                                                                                  NA
## `SourceYahoo! Maktoob News`                                                                              NA
## `SourceYahoo7 and Agencies via Yahoo! New Zealand News`                                                  NA
## `SourceYahoo7 and Agencies via Yahoo!7 News`                                                             NA
## `SourceYahoo7 Finance via Yahoo!7 Finance`                                                               NA
## `SourceYahoo7 News`                                                                                      NA
## `SourceYakima Herald-Republic`                                                                           NA
## `SourceYale Environment 360`                                                                             NA
## `SourceYaleGlobal Online`                                                                                NA
## `SourceYarmouth County Vanguard`                                                                         NA
## `SourceYellowhammer News`                                                                                NA
## `SourceYeni \\u009d\\u009dafak English (press release)`                                                  NA
## `SourceYES! Magazine`                                                                                    NA
## `SourceYeshiva World News`                                                                               NA
## `SourceYibada (English Edition)`                                                                         NA
## `SourceYIBADA English`                                                                                   NA
## `SourceYLE News`                                                                                         NA
## SourceYNaija                                                                                             NA
## SourceYnetnews                                                                                           NA
## `SourceYonhap News`                                                                                      NA
## `SourceYork Daily Record/Sunday News`                                                                    NA
## `SourceYork Dispatch`                                                                                    NA
## `SourceYork Press`                                                                                       NA
## SourceYorkRegion.com                                                                                     NA
## `SourceYorkshire Evening Post`                                                                           NA
## `SourceYorkshire Post`                                                                                   NA
## `SourceYorkton News Review`                                                                              NA
## `SourceYorkton This Week`                                                                                NA
## `SourceYorkton This Week (press release)`                                                                NA
## `SourceYouGov US`                                                                                        NA
## `SourceYoungstown Vindicator`                                                                            NA
## `SourceYour EDM`                                                                                         NA
## `SourceYour Hometown Lima Stations`                                                                      NA
## `SourceYour Houston News`                                                                                NA
## `SourceYour Houston News (blog)`                                                                         NA
## `SourceYour Middle East`                                                                                 NA
## `SourceYour News Now`                                                                                    NA
## Sourceyourcentralvalley.com                                                                              NA
## SourceYourErie                                                                                           NA
## SourceYourStory.com                                                                                      NA
## SourceYourWestValley.com                                                                                 NA
## `SourceYouth Health Magzine`                                                                             NA
## `SourceYouth Ki Awaaz`                                                                                   NA
## SourceYubaNet                                                                                            NA
## SourceYugaTech                                                                                           NA
## `SourceYuma Sun`                                                                                         NA
## `SourceZacks via Yahoo Canada Finance`                                                                   NA
## `SourceZacks via Yahoo UK & Ireland Finance`                                                             NA
## `SourceZacks via Yahoo! Finance`                                                                         NA
## `SourceZacks via Yahoo! Finance India`                                                                   NA
## `SourceZacks via Yahoo! New Zealand Finance`                                                             NA
## `SourceZacks via Yahoo!7 Finance`                                                                        NA
## SourceZacks.com                                                                                          NA
## SourceZap2It                                                                                             NA
## `SourceZawya (registration)`                                                                             NA
## SourceZDNet                                                                                              NA
## `SourceZDNet (blog)`                                                                                     NA
## `SourceZDNet UK`                                                                                         NA
## `SourceZee News`                                                                                         NA
## SourceZergwatch                                                                                          NA
## `SourceZero Hedge`                                                                                       NA
## SourceZIK                                                                                                NA
## `SourceZimbabwe Independent`                                                                             NA
## `SourceZimEye - Zimbabwe News`                                                                           NA
## `SourceZME Science`                                                                                      NA
## SourceZNBC                                                                                               NA
## SourceZolmax                                                                                             NA
##                                                                                                     z value
## (Intercept)                                                                                       0.000e+00
## Topiceconomy                                                                                      0.000e+00
## Topicmicrosoft                                                                                    0.000e+00
## Topicobama                                                                                        6.711e+07
## Topicpalestine                                                                                           NA
## `Source `                                                                                                NA
## `Source/FILM`                                                                                            NA
## `Source+972 Magazine`                                                                                    NA
## `Source\\u009d\\u009d \\u009d\\u009d`                                                                    NA
## Source10News                                                                                             NA
## Source10TV                                                                                               NA
## Source11alive.com                                                                                        NA
## `Source12 News Phoenix`                                                                                  NA
## Source12news.com                                                                                         NA
## Source12NewsNow.Com                                                                                      NA
## `Source1340 WJOL`                                                                                        NA
## `Source13abc Action News`                                                                                NA
## Source13newsnow.com                                                                                      NA
## Source13WMAZ                                                                                             NA
## Source13WMAZ.com                                                                                         NA
## `Source14 News WFIE Evansville`                                                                          NA
## `Source14 WFIE Evansville`                                                                               NA
## `Source19 Action News Cleveland`                                                                         NA
## Source20minutes.fr                                                                                       NA
## Source21Alive                                                                                            NA
## `Source24/7 Wall St.`                                                                                    NA
## `Source24/7 Wall St. via Yahoo! Finance`                                                                 NA
## Source247Sports                                                                                          NA
## Source2paragraphs.com                                                                                    NA
## `Source3ders.org (blog)`                                                                                 NA
## Source3DPrint.com                                                                                        NA
## Source3news                                                                                              NA
## `Source3News NZ`                                                                                         NA
## `Source41 NBC News`                                                                                      NA
## Source4k                                                                                                 NA
## Source4NI                                                                                                NA
## `Source5 Eyewitness News St. Paul`                                                                       NA
## `Source550 KTSA`                                                                                         NA
## `Source570 News`                                                                                         NA
## `Source580 CFRA Radio`                                                                                   NA
## Source5newsonline.com                                                                                    NA
## `Source6 On Your Side`                                                                                   NA
## Source630ched.com                                                                                        NA
## `Source660 News`                                                                                         NA
## `Source680 News`                                                                                         NA
## Source6abc.com                                                                                           NA
## `Source7Online WSVN-TV`                                                                                  NA
## Source7sur7                                                                                              NA
## `Source88Nine Radio Milwaukee (blog)`                                                                    NA
## `Source89.3 KPCC`                                                                                        NA
## `Source89.3 WFPL`                                                                                        NA
## `Source9 News Denver`                                                                                    NA
## `Source9 to 5 Google`                                                                                    NA
## `Source9 to 5 Mac`                                                                                       NA
## `Source9 to 5 Mac (press release)`                                                                       NA
## `Source9&10 News`                                                                                        NA
## `Source93.1 WIBC Indianapolis`                                                                           NA
## Source9NEWS.com                                                                                          NA
## Source9news.com.au                                                                                       NA
## `SourceA.V. Club`                                                                                        NA
## `SourceA.V. Club (blog)`                                                                                 NA
## `SourceA.V. Club Denver/Boulder`                                                                         NA
## `SourceAaj Tv (press release) (blog)`                                                                    NA
## `SourceAAP via Yahoo! New Zealand Finance`                                                               NA
## `SourceAAP via Yahoo! New Zealand News`                                                                  NA
## `SourceAAP via Yahoo!7 Finance`                                                                          NA
## `SourceAAP via Yahoo!7 News`                                                                             NA
## `SourceAbbotsford News (registration) (blog)`                                                            NA
## `SourceABC 13 Houston`                                                                                   NA
## `SourceABC 15 Phoenix`                                                                                   NA
## `SourceABC 26 New Orleans`                                                                               NA
## `SourceABC 6 Providence`                                                                                 NA
## `SourceABC 7 Chicago`                                                                                    NA
## `SourceABC 7 Gulfshore News`                                                                             NA
## `SourceABC Action News Tampa Bay`                                                                        NA
## `SourceABC FOX Montana News`                                                                             NA
## `SourceABC Local`                                                                                        NA
## `SourceABC Montana`                                                                                      NA
## `SourceABC News`                                                                                         NA
## `SourceABC NEWS 4`                                                                                       NA
## `SourceABC News via Yahoo! News`                                                                         NA
## `SourceABC Online`                                                                                       NA
## `SourceABC Online (blog)`                                                                                NA
## SourceABC10.com                                                                                          NA
## `SourceABC11 Raleigh-Durham-Fayetteville`                                                                NA
## `SourceABC12 Mid-Michigan`                                                                               NA
## `SourceABC15 Arizona`                                                                                    NA
## SourceABC17News.com                                                                                      NA
## `SourceABC2 News`                                                                                        NA
## Sourceabc27                                                                                              NA
## SourceABC6OnYourSide.com                                                                                 NA
## Sourceabc7news.com                                                                                       NA
## `SourceAberdeen Press and Journal`                                                                       NA
## `SourceABI Research (press release) (subscription) (blog)`                                               NA
## `SourceAbove the Law`                                                                                    NA
## `SourceABP Live`                                                                                         NA
## `SourceABS-CBNNEWS.com`                                                                                  NA
## `SourceABS CBN News`                                                                                     NA
## `SourceAccess Hollywood`                                                                                 NA
## `SourceAccess Washington`                                                                                NA
## `SourceAccesswire via Yahoo! Finance`                                                                    NA
## `SourceAccounting Today`                                                                                 NA
## `SourceAccuracy in Academia`                                                                             NA
## `SourceAccuracy In Media`                                                                                NA
## `SourceAccuracy In Media (blog)`                                                                         NA
## `SourceACN Newswire via Yahoo! New Zealand Finance`                                                      NA
## `SourceACN Newswire via Yahoo!7 Finance`                                                                 NA
## `SourceAction Forex`                                                                                     NA
## SourceActionNewsJax.com                                                                                  NA
## SourceACTmedia                                                                                           NA
## `SourceActon Institute (blog)`                                                                           NA
## SourceAdAge.com                                                                                          NA
## `SourceAdAge.com (blog)`                                                                                 NA
## SourceAdExchanger                                                                                        NA
## SourceAdNews                                                                                             NA
## `SourceADT Magazine`                                                                                     NA
## `SourceAdvanced Television`                                                                              NA
## SourceAdvisor.ca                                                                                         NA
## SourceAdvocate.com                                                                                       NA
## SourceAdweek                                                                                             NA
## SourceAdWeek                                                                                             NA
## Sourceafaqs                                                                                              NA
## SourceAFKInsider                                                                                         NA
## `SourceAFL-CIO (blog)`                                                                                   NA
## `SourceAFP News via Yahoo! Philippines News`                                                             NA
## `SourceAFP News via Yahoo! Singapore News`                                                               NA
## `SourceAFP Relax News via Yahoo! News`                                                            0.000e+00
## `SourceAFP Relax via Yahoo! Philippines News`                                                     0.000e+00
## `SourceAFP Relax via Yahoo! Singapore News`                                                              NA
## `SourceAFP via Yahoo Maktoob News`                                                                       NA
## `SourceAFP via Yahoo UK & Ireland Finance`                                                               NA
## `SourceAFP via Yahoo UK & Ireland News`                                                                  NA
## `SourceAFP via Yahoo! Finance`                                                                           NA
## `SourceAFP via Yahoo! India News`                                                                 0.000e+00
## `SourceAFP via Yahoo! New Zealand News`                                                                  NA
## `SourceAFP via Yahoo! News`                                                                       0.000e+00
## `SourceAFP via Yahoo! Sports`                                                                            NA
## `SourceAFP via Yahoo!7 Finance`                                                                          NA
## `SourceAFP via Yahoo!7 News`                                                                             NA
## `SourceAfrica Middle East`                                                                               NA
## `SourceAfrican Arguments (registration)`                                                                 NA
## `SourceAfrican Manager (press release) (registration) (blog)`                                            NA
## SourceAfricanews                                                                                         NA
## SourceAfricaNews                                                                                         NA
## `SourceAfricanews (press release)`                                                                       NA
## SourceAfrik.com                                                                                          NA
## SourceAfterDawn                                                                                          NA
## `SourceAG Week`                                                                                          NA
## `SourceAgence France-Presse via Yahoo Canada News`                                                       NA
## SourceAgencySpy                                                                                          NA
## SourceAgenda.ge                                                                                          NA
## SourceAGERPRES                                                                                           NA
## SourceAgoraVox                                                                                           NA
## SourceAgriculture.com                                                                                    NA
## SourceAgriland                                                                                           NA
## SourceAgWeb                                                                                              NA
## `SourceAhlul Bayt News Agency (press release)`                                                           NA
## `SourceAhram Online`                                                                                     NA
## `SourceAir Force Link`                                                                                   NA
## `SourceAir Transport World`                                                                              NA
## `SourceAircraft Maintenance Technology`                                                                  NA
## SourceAirForceTimes.com                                                                                  NA
## `SourceAirline Reporter`                                                                                 NA
## `SourceAJIB.fr L'actualit\\u009d\\u009d de l'Islam et des musulmans en France`                           NA
## `SourceAkron Beacon Journal`                                                                             NA
## `SourceAl-Ahram Weekly`                                                                                  NA
## `SourceAl-Arabiya`                                                                                       NA
## `SourceAl-Arabiya (blog)`                                                                                NA
## `SourceAl-Bawaba`                                                                                        NA
## `SourceAl-Fanar Media`                                                                                   NA
## `SourceAl-Jazeerah.info`                                                                                 NA
## `SourceAl-Manar TV`                                                                                      NA
## `SourceAl-Monitor`                                                                                       NA
## `SourceAl-Resalah`                                                                                       NA
## `SourceAl Bawaba`                                                                                        NA
## `SourceAl Huffington Post`                                                                               NA
## `SourceAl Jazeera America`                                                                               NA
## `SourceAl Jazeera via Yahoo Maktoob News`                                                                NA
## `SourceAl Jazeera via Yahoo UK & Ireland News`                                                           NA
## SourceAL.com                                                                                             NA
## `SourceAlabama's News Leader`                                                                            NA
## `SourceAlabama NewsCenter`                                                                               NA
## `SourceAlaska Dispatch News`                                                                             NA
## `SourceAlaska Public Radio Network`                                                                      NA
## `SourceAlbanian Daily News`                                                                              NA
## `SourceAlbany Business Review`                                                                           NA
## `SourceAlbany Democrat Herald`                                                                           NA
## `SourceAlbany Times Union`                                                                               NA
## `SourceAlbany Times Union (blog)`                                                                        NA
## `SourceAlberni Valley News`                                                                              NA
## `SourceAlberta Daily Herald Tribune`                                                                     NA
## `SourceAlbuquerque Business First (blog)`                                                                NA
## `SourceAlbuquerque Journal`                                                                              NA
## `SourceAlex News (blog)`                                                                                 NA
## `SourceAlexandria Town Talk`                                                                             NA
## `SourceAlg\\u009d\\u009drie Presse Service`                                                              NA
## SourceAlgemeiner                                                                                         NA
## `Sourcealgerie-focus.com`                                                                                NA
## `SourceAlgérie Presse Service`                                                                           NA
## `SourceAliran Monthly`                                                                                   NA
## `SourceAliran Online`                                                                                    NA
## SourceAljazeera.com                                                                                      NA
## `SourceAljazeera.com (blog)`                                                                             NA
## `SourceAll About Hawke's Bay`                                                                            NA
## SourceAllAfrica.com                                                                                      NA
## `SourceAllCoinsNews.com (blog)`                                                                          NA
## `SourceAllentown Morning Call`                                                                           NA
## SourceAllGov                                                                                             NA
## `SourceAllure Magazine (blog)`                                                                           NA
## SourceAlphr                                                                                              NA
## `SourceAltEnergyMag (press release)`                                                                     NA
## `SourceAlternative Information Center (AIC)`                                                             NA
## `SourceAlternative Information Center (AIC) (blog)`                                                      NA
## SourceAlterNet                                                                                           NA
## `SourceAlton Telegraph`                                                                                  NA
## `SourceAlyaexpress-News`                                                                                 NA
## `SourceAmarillo Globe-News`                                                                              NA
## SourceAmarillo.com                                                                                       NA
## `SourceAmazinessNet (blog)`                                                                              NA
## SourceAMEinfo                                                                                            NA
## `SourceAmerica Magazine`                                                                                 NA
## `SourceAmerican Action Forum (blog)`                                                                     NA
## `SourceAmerican Banker`                                                                                  NA
## `SourceAmerican Center for Law and Justice (blog)`                                                       NA
## `SourceAmerican Enterprise Institute`                                                                    NA
## `SourceAmerican Free Press`                                                                              NA
## `SourceAmerican Journal of Transportation`                                                               NA
## `SourceAmerican Kennel Club (blog)`                                                                      NA
## `SourceAmerican Libraries (blog)`                                                                        NA
## `SourceAmerican Spectator`                                                                               NA
## `SourceAmerican Spectator (blog)`                                                                        NA
## `SourceAmerican Thinker`                                                                                 NA
## `SourceAmerican Thinker (blog)`                                                                          NA
## `SourceAmerican Trade Journal`                                                                           NA
## `SourceAmericans for Tax Reform (blog)`                                                                  NA
## `SourceAmericas Quarterly`                                                                               NA
## `SourceAmericas Quarterly (blog)`                                                                        NA
## SourceAmeriPublications                                                                                  NA
## `SourceAmes Tribune`                                                                                     NA
## SourceAmigobulls                                                                                         NA
## `SourceAmmoLand Shooting Sports News`                                                                    NA
## SourceamNewYork                                                                                          NA
## SourceamNY                                                                                               NA
## `SourceAn Phoblacht`                                                                                     NA
## `SourceAnadolu Agency`                                                                                   NA
## SourceAnandTech                                                                                          NA
## SourceAnarkismo.net                                                                                      NA
## `SourceAnchorage Daily News`                                                                             NA
## `SourceAndean Airmail & PERUVIAN TIMES`                                                                  NA
## `SourceAnderson Independent Mail`                                                                        NA
## `SourceAndroid Authority (blog)`                                                                         NA
## `SourceAndroid Central`                                                                                  NA
## `SourceAndroid Community`                                                                                NA
## `SourceAndroid Headlines - Android News`                                                                 NA
## `SourceAndroid Police`                                                                                   NA
## SourceAndroidOrigin                                                                                      NA
## `SourceAndroidPIT US (blog)`                                                                             NA
## SourceAngolaPress                                                                                        NA
## `SourceANI via Yahoo! India News`                                                                        NA
## `SourceAnimation World Network`                                                                          NA
## `SourceAnime News Network`                                                                               NA
## SourceANINEWS                                                                                            NA
## SourceAnorak                                                                                             NA
## `SourceANSA (registration)`                                                                              NA
## SourceANSAmed                                                                                            NA
## SourceANTARA                                                                                             NA
## `SourceAntigua Observer`                                                                                 NA
## SourceAntiwar.com                                                                                        NA
## `SourceAntiwar.com (blog)`                                                                               NA
## `SourceAOL Money UK`                                                                                     NA
## `SourceAOL News`                                                                                         NA
## `SourceAP S\\u009d\\u009dn\\u009d\\u009dgalaise`                                                         NA
## `SourceAP via Yahoo! New Zealand News`                                                                   NA
## `SourceAP via Yahoo!7 News`                                                                              NA
## SourceAPA                                                                                                NA
## `SourceAPEX Media`                                                                                       NA
## SourceAppAdvice                                                                                          NA
## `SourceAppeal-Democrat`                                                                                  NA
## `SourceApple Insider`                                                                                    NA
## `SourceAppleInsider (press release) (blog)`                                                              NA
## `SourceAppleton Post Crescent`                                                                           NA
## `SourceArab American News`                                                                               NA
## `SourceArab News`                                                                                        NA
## `SourceArab News via Yahoo Maktoob News`                                                                 NA
## `SourceArab Times Kuwait English Daily`                                                                  NA
## SourceArabianBusiness.com                                                                                NA
## SourceARC                                                                                                NA
## SourceArchinect                                                                                          NA
## `SourceArchitectural Digest`                                                                             NA
## SourceArcticStartup                                                                                      NA
## `SourceArizona Capitol Times`                                                                            NA
## `SourceArizona Daily Star`                                                                               NA
## `SourceArizona Daily Sun`                                                                                NA
## `SourceArkansas Business`                                                                                NA
## `SourceArkansas Democrat-Gazette`                                                                        NA
## `SourceArkansas News`                                                                                    NA
## `SourceArkansas Online`                                                                                  NA
## SourceArmeniaNow.com                                                                                     NA
## SourceArmenpress.am                                                                                      NA
## SourceArmyTimes.com                                                                                      NA
## SourceARNnet                                                                                             NA
## `SourceAround the Rings (subscription)`                                                                  NA
## `SourceArs Technica`                                                                              0.000e+00
## `SourceArs Technica UK`                                                                                  NA
## `SourceArt Newspaper`                                                                                    NA
## `SourceArtesia Daily Press`                                                                              NA
## SourceArtforum                                                                                           NA
## SourceArtLyst                                                                                            NA
## `Sourceartnet News`                                                                                      NA
## `SourceArtslink.co.za News (press release)`                                                              NA
## `SourceArutz Sheva`                                                                                      NA
## `SourceAS/COA Online`                                                                                    NA
## `SourceAsahi Shimbun`                                                                                    NA
## SourceAsahi.com                                                                                          NA
## `SourceAsbarez Armenian News`                                                                            NA
## `SourceAsbury Park Press`                                                                                NA
## `SourceAsharq Al-awsat (blog)`                                                                           NA
## `SourceAsharq Al-awsat English`                                                                          NA
## `SourceAsharq Alawsat`                                                                                   NA
## `SourceAsheboro Courier Tribune`                                                                         NA
## `SourceAsheville Citizen-Times`                                                                          NA
## `SourceAsia Pacific Report`                                                                              NA
## `SourceAsia Society`                                                                                     NA
## `SourceAsia Society (blog)`                                                                              NA
## `SourceAsia Times`                                                                                       NA
## `SourceAsian Correspondent`                                                                              NA
## `SourceAsian Image`                                                                                      NA
## `SourceAsian Tribune`                                                                                    NA
## SourceAsiaNews.it                                                                                        NA
## SourceAsiaOne                                                                                            NA
## `SourceAspen Times`                                                                                      NA
## `SourceAssociated Press of Pakistan`                                                                     NA
## `SourceAssociated Press via Yahoo Maktoob News`                                                          NA
## `SourceAssociated Press via Yahoo UK & Ireland Finance`                                                  NA
## `SourceAssociated Press via Yahoo UK & Ireland News`                                                     NA
## `SourceAssociated Press via Yahoo! Finance`                                                       1.000e-03
## `SourceAssociated Press via Yahoo! Finance India`                                                        NA
## `SourceAssociated Press via Yahoo! India News`                                                           NA
## `SourceAssociated Press via Yahoo! New Zealand Finance`                                                  NA
## `SourceAssociated Press via Yahoo! News`                                                          0.000e+00
## `SourceAssociated Press via Yahoo! Philippines News`                                                     NA
## `SourceAssociated Press via Yahoo! Philippines Sports`                                                   NA
## `SourceAssociated Press via Yahoo! Singapore News`                                                       NA
## `SourceAssociated Press via Yahoo! Singapore Sports`                                                     NA
## `SourceAssociated Press via Yahoo!7 Finance`                                                             NA
## `SourceAssociation France Palestine Solidarit\\u009d\\u009d`                                             NA
## `SourceAssociation France Palestine Solidarité`                                                          NA
## `SourceAstana Times`                                                                                     NA
## `SourceAstro Awani`                                                                                      NA
## `SourceAthens Banner-Herald`                                                                             NA
## `SourceAthens Daily Review`                                                                              NA
## `SourceAtlanta Black Star`                                                                               NA
## `SourceAtlanta Business Chronicle`                                                                       NA
## `SourceAtlanta Intown`                                                                                   NA
## `SourceAtlanta Journal-Constitution`                                                                     NA
## `SourceAtlanta Journal Constitution`                                                                     NA
## `SourceAtlanta Journal Constitution (blog)`                                                              NA
## `SourceAtlas Obscura`                                                                                    NA
## `SourceAttack of the Fanboy`                                                                             NA
## SourceATTN                                                                                               NA
## SourceATWOnline                                                                                          NA
## `SourceAuburn Citizen`                                                                                   NA
## `SourceAuburn Citizen (blog)`                                                                            NA
## `SourceAuckland stuff.co.nz`                                                                             NA
## `SourceAugusta Free Press`                                                                               NA
## SourceAusdroid                                                                                           NA
## `SourceAustin American-Statesman`                                                                        NA
## `SourceAustin Business Journal`                                                                          NA
## `SourceAustin Chronicle`                                                                                 NA
## `SourceAustin Inno`                                                                                      NA
## `SourceAustralia-Israel Jewish Affairs Council`                                                          NA
## `SourceAustralia Network News`                                                                           NA
## `SourceAustralian Aviation`                                                                              NA
## `SourceAustralian Broadcasting Corporation`                                                              NA
## `SourceAustralian Business Traveller`                                                                    NA
## `SourceAustralian FourFourTwo`                                                                           NA
## `SourceAustralian Jewish News`                                                                           NA
## `SourceAustralian Policy Online`                                                                         NA
## `SourceAutoblog (blog)`                                                                                  NA
## SourceAutocar                                                                                            NA
## `SourceAutocar India`                                                                                    NA
## Sourceautoevolution                                                                                      NA
## SourceAutoExpress                                                                                        NA
## SourceAutoGuide.com                                                                                      NA
## `SourceAutomation World`                                                                                 NA
## `SourceAutomotive News`                                                                                  NA
## `SourceAutomotive News Europe (registration)`                                                            NA
## `SourceAutomotiveIT International`                                                                       NA
## SourceAutooMobile.com                                                                                    NA
## SourceAutoweek                                                                                           NA
## `SourceAviation Week`                                                                                    NA
## SourceAviationPros.com                                                                                   NA
## `SourceAwful Announcing`                                                                                 NA
## `SourceAxis of Logic`                                                                                    NA
## Sourceazcentral.com                                                                                      NA
## SourceAzerNews                                                                                           NA
## SourceAZFamily                                                                                           NA
## `SourceB\\u009d\\u009do D\\u009d\\u009dn Vit`                                                            NA
## `SourceB2B Marketing Online`                                                                             NA
## SourceB92                                                                                                NA
## `SourceBABW News`                                                                                        NA
## `SourceBahamas Tribune`                                                                                  NA
## `SourceBahrain News Agency`                                                                              NA
## `SourceBalitang America`                                                                                 NA
## `SourceBalkan Insight`                                                                                   NA
## `SourceBalkans.com Business News`                                                                        NA
## `SourceBaltic Times`                                                                                     NA
## `SourceBaltimore Business Journal (blog)`                                                                NA
## `SourceBaltimore Sun`                                                                                    NA
## `SourceBaltimore Sun (blog)`                                                                             NA
## SourceBaltimoreRavens.com                                                                                NA
## `SourceBangalore Mirror`                                                                                 NA
## `SourceBangkok Post`                                                                                     NA
## `SourceBangladesh News 24 hours`                                                                         NA
## `SourceBangor Daily News`                                                                                NA
## `SourceBank of Canada`                                                                                   NA
## `SourceBanking Technology`                                                                               NA
## SourceBankrate.com                                                                                       NA
## `SourceBankrate.com via Yahoo Canada Finance`                                                            NA
## `SourceBankrate.com via Yahoo! Finance`                                                                  NA
## `SourceBarbados Advocate`                                                                                NA
## `SourceBarca Blaugranes (blog)`                                                                          NA
## `SourceBarre Montpelier Times Argus`                                                                     NA
## `SourceBarron's`                                                                                         NA
## `SourceBarron's (blog)`                                                                                  NA
## `SourceBarron&#39;s Online`                                                                              NA
## SourceBaseline                                                                                           NA
## `SourceBaseline (blog)`                                                                                  NA
## `SourceBasic Income News`                                                                                NA
## `SourceBasingstoke Gazette`                                                                              NA
## `SourceBasta !`                                                                                          NA
## `SourceBath Chronicle`                                                                                   NA
## `SourceBattle Creek Enquirer`                                                                            NA
## `SourceBaxter Bulletin`                                                                                  NA
## `SourceBay Area Indymedia`                                                                               NA
## `SourceBay News 9`                                                                                       NA
## `SourceBay Today`                                                                                        NA
## `SourceBaytown Sun`                                                                                      NA
## `SourceBBC News`                                                                                  0.000e+00
## `SourceBBC NI`                                                                                           NA
## `SourceBBC Sport`                                                                                        NA
## `SourceBBC world`                                                                                        NA
## SourceBCBusiness                                                                                         NA
## SourceBDlive                                                                                             NA
## `SourceBeacon Examiner`                                                                                  NA
## SourceBeanstockd                                                                                         NA
## `SourceBearing Arms`                                                                                     NA
## `SourceBeatrice Daily Sun`                                                                               NA
## `SourceBeaumont Enterprise`                                                                              NA
## `SourceBecker's Hospital Review`                                                                         NA
## `SourceBecker's Orthopedic & Spine`                                                                      NA
## `SourceBeckley Register-Herald`                                                                          NA
## `SourceBedford Today`                                                                                    NA
## `SourceBeef Magazine (blog)`                                                                             NA
## `SourceBelarus Digest`                                                                                   NA
## `SourceBelarus News (BelTA)`                                                                             NA
## `SourceBelfast Newsletter`                                                                               NA
## `SourceBelfast Telegraph`                                                                                NA
## `SourceBella Naija`                                                                                      NA
## SourceBellaciao                                                                                          NA
## `SourceBelleville News-Democrat`                                                                         NA
## `SourceBellevue Reporter`                                                                                NA
## `SourceBeloit Daily News`                                                                                NA
## `SourceBenchmark Monitor`                                                                                NA
## `SourceBend Bulletin`                                                                                    NA
## `SourceBenefits Canada`                                                                                  NA
## `SourceBenton Evening News`                                                                              NA
## SourceBenzinga                                                                                           NA
## `SourceBenzinga via Yahoo! Finance`                                                                      NA
## `SourceBerkshire Eagle (subscription)`                                                                   NA
## SourceBernama                                                                                            NA
## SourceBernews                                                                                            NA
## `SourceBerwick Advertiser`                                                                               NA
## `SourceBerwick Today`                                                                                    NA
## SourceBET                                                                                                NA
## `SourceBET (blog)`                                                                                       NA
## SourceBetaBoston                                                                                         NA
## SourceBetaKit                                                                                            NA
## SourceBetaNews                                                                                    0.000e+00
## SourceBGR                                                                                                NA
## `SourceBGR India`                                                                                        NA
## `SourceBGR News via Yahoo! News`                                                                  1.000e-03
## `SourceBharat Press`                                                                                     NA
## `SourceBharat Times`                                                                                     NA
## `SourceBi-College News`                                                                                  NA
## `SourceBidness ETC`                                                                                      NA
## `SourceBig Island Now`                                                                                   NA
## `SourceBig Issue`                                                                                        NA
## `SourceBig News Network.com`                                                                             NA
## `SourceBig Think`                                                                                        NA
## `SourceBig Think (blog)`                                                                                 NA
## `SourceBigPond News`                                                                                     NA
## `SourceBigPond Sport`                                                                                    NA
## SourceBILD                                                                                               NA
## SourceBillboard                                                                                          NA
## `SourceBillings Gazette`                                                                                 NA
## SourceBillMoyers.com                                                                                     NA
## SourceBiography                                                                                          NA
## `SourceBiomass Magazine`                                                                                 NA
## `SourceBiometric Update`                                                                                 NA
## `SourceBirmingham Business Journal`                                                                      NA
## `SourceBirmingham Mail`                                                                                  NA
## `SourceBirmingham Post`                                                                                  NA
## `SourceBismarck Tribune`                                                                                 NA
## SourceBisnow                                                                                             NA
## `Sourcebit-tech.net`                                                                                     NA
## SourceBitbag                                                                                             NA
## `SourceBitcoin Magazine`                                                                                 NA
## SourceBitcoinist.net                                                                                     NA
## `SourcebizEDGE NZ`                                                                                       NA
## SourceBizNews                                                                                            NA
## `SourceBizPac Review`                                                                                    NA
## SourceBizReport                                                                                          NA
## `SourceBizTech Magazine`                                                                                 NA
## `SourceBizTimes.com (Milwaukee)`                                                                         NA
## SourceBLABBERMOUTH.NET                                                                                   NA
## `SourceBlack Agenda Report`                                                                              NA
## `SourceBlack Enterprise`                                                                                 NA
## `SourceBlack Mountain News`                                                                              NA
## SourceBlackburnNews.com                                                                                  NA
## `SourceBlackmore Vale Magazine`                                                                          NA
## SourceBlackNews.com                                                                                      NA
## `SourceBlackNews.com (press release)`                                                                    NA
## `SourceBlasting News`                                                                                    NA
## SourceBlastr                                                                                             NA
## `SourceBleacher Report`                                                                                  NA
## `SourceBleeding Cool News`                                                                               NA
## SourceBlic                                                                                               NA
## `SourceBlockchain News`                                                                                  NA
## `SourceBlogging Censorship`                                                                              NA
## `SourceBloody Disgusting`                                                                                NA
## SourceBloomberg                                                                                  -1.000e-03
## `SourceBloomberg Big Law Business`                                                                       NA
## `SourceBloomberg BNA`                                                                                    NA
## `SourceBloomberg Government (blog)`                                                                      NA
## `SourceBloomberg via Yahoo UK & Ireland Finance`                                                         NA
## `SourceBloomberg via Yahoo! Finance`                                                                     NA
## `SourceBloomberg via Yahoo! Finance India`                                                               NA
## `SourceBloomberg via Yahoo! New Zealand Finance`                                                         NA
## `SourceBloomberg via Yahoo!7 Finance`                                                                    NA
## `SourceBloomberg View`                                                                                   NA
## `SourceBloomer Advance (subscription)`                                                                   NA
## `SourceBloomington Pantagraph`                                                                           NA
## SourceBlorge                                                                                             NA
## `SourceBlue Nation Review`                                                                               NA
## `SourceBluefield Daily Telegraph`                                                                        NA
## `SourceBluffton Today`                                                                                   NA
## `SourceBMWBLOG (blog)`                                                                                   NA
## SourceBnet.com.au                                                                                        NA
## Sourcebnn.ca                                                                                             NA
## `SourceBNO News`                                                                                         NA
## `SourceBob Sullivan.net`                                                                                 NA
## `SourceBobsguide (press release)`                                                                        NA
## `SourceBoing Boing`                                                                                      NA
## `SourceBonham Journal`                                                                                   NA
## `SourceBonner County Daily Bee`                                                                          NA
## `SourceBooks LIVE (blog)`                                                                                NA
## SourceBorderstan                                                                                         NA
## SourceBostInno                                                                                           NA
## `SourceBoston Business Journal`                                                                          NA
## `SourceBoston Business Journal (blog)`                                                                   NA
## `SourceBoston Herald`                                                                                    NA
## `SourceBoston Review`                                                                                    NA
## SourceBoston.com                                                                                         NA
## `SourceBoulder Daily Camera`                                                                             NA
## `SourceBoulder Weekly`                                                                                   NA
## `SourceBournemouth Echo`                                                                                 NA
## `SourceBowling Green Daily News`                                                                         NA
## SourceBoxscore                                                                                           NA
## `SourceBrad Jones, Digital Trends via Yahoo! News`                                                       NA
## `SourceBradenton Herald`                                                                                 NA
## `SourceBradford Telegraph`                                                                               NA
## `SourceBradford Telegraph and Argus`                                                                     NA
## `SourceBrampton Guardian`                                                                                NA
## `SourceBrandon Sun`                                                                                      NA
## `SourceBrattleboro Reformer`                                                                             NA
## `SourceBrave New Coin`                                                                                   NA
## `SourceBrazil-Arab News Agency (ANBA)`                                                                   NA
## `SourceBreaking Belize News (blog)`                                                                      NA
## `SourceBreaking Israel News`                                                                             NA
## SourceBreakingNews.com                                                                                   NA
## SourceBreakingNews.ie                                                                                    NA
## SourceBreakingviews                                                                                      NA
## SourceBREATHEcast                                                                                        NA
## `SourceBreitbart News`                                                                                   NA
## `SourceBretton Woods Observer`                                                                           NA
## `SourceBrian Madden (blog)`                                                                              NA
## `SourceBrides.com (blog)`                                                                                NA
## `SourceBriefing.com via Yahoo! Finance`                                                                  NA
## SourceBright                                                                                             NA
## `SourceBright Green`                                                                                     NA
## `SourceBrisbane Times`                                                                                   NA
## `SourceBristol Herald Courier`                                                                           NA
## `SourceBristol Herald Courier (press release) (blog)`                                                    NA
## `SourceBristol Post`                                                                                     NA
## `SourceBristol Press`                                                                                    NA
## `SourceBritish Journal of Photography`                                                                   NA
## `SourceBroadband TV News`                                                                                NA
## SourceBroadcaster                                                                                        NA
## `SourceBroadcasting & Cable`                                                                             NA
## SourceBroadly                                                                                            NA
## `SourceBrookings Institution`                                                                            NA
## `SourceBrookings Institution (blog)`                                                                     NA
## `SourceBrookson (press release) (blog)`                                                                  NA
## `SourceBrown County Democrat`                                                                            NA
## `SourceBrownwood Bulletin`                                                                               NA
## SourceBruDirect.com                                                                                      NA
## `SourceBryan-College Station Eagle`                                                                      NA
## SourceBT.com                                                                                             NA
## `SourceBU Today`                                                                                         NA
## `SourceBuckingham Advertiser`                                                                            NA
## SourceBucks.com                                                                                          NA
## `SourceBudapest Business Journal`                                                                        NA
## `SourceBudapest Times`                                                                                   NA
## `SourceBuenos Aires Herald`                                                                              NA
## `SourceBuffalo Business First`                                                                           NA
## `SourceBuffalo News`                                                                                     NA
## `SourceBuilder Magazine`                                                                                 NA
## `SourceBullard Banner News`                                                                              NA
## `SourceBulletin of the Atomic Scientists`                                                                NA
## `SourceBunbury Mail`                                                                                     NA
## `SourceBundaberg News Mail`                                                                              NA
## `SourceBurlington County Times (subscription)`                                                           NA
## `SourceBurlington Times News`                                                                            NA
## SourceBurlingtonFreePress.com                                                                            NA
## `SourceBusiness 2 Community`                                                                             NA
## `SourceBusiness Cloud News`                                                                              NA
## `SourceBusiness Cornwall Magazine`                                                                       NA
## `SourceBusiness Finance News`                                                                            NA
## `SourceBusiness Green`                                                                                   NA
## `SourceBusiness Green (blog)`                                                                            NA
## `SourceBusiness In Savannah`                                                                             NA
## `SourceBusiness in Vancouver`                                                                            NA
## `SourceBusiness Insider`                                                                          1.000e-03
## `SourceBusiness Insider Australia`                                                                       NA
## `SourceBusiness Insider Nordic`                                                                          NA
## `SourceBusiness Insider UK`                                                                              NA
## `SourceBusiness Insider UK Finance via Yahoo Canada Finance`                                      0.000e+00
## `SourceBusiness Insider UK Finance via Yahoo UK & Ireland Finance`                                0.000e+00
## `SourceBusiness Insider UK Finance via Yahoo! Finance India`                                             NA
## `SourceBusiness Insider via Yahoo Canada Finance`                                                        NA
## `SourceBusiness Insider via Yahoo Maktoob News`                                                          NA
## `SourceBusiness Insider via Yahoo UK & Ireland Finance`                                                  NA
## `SourceBusiness Insider via Yahoo! Finance`                                                      -6.711e+07
## `SourceBusiness Insider via Yahoo! Finance India`                                                        NA
## `SourceBusiness Insider via Yahoo! India News`                                                           NA
## `SourceBusiness Insurance`                                                                               NA
## `SourceBusiness Management Daily`                                                                        NA
## `SourceBusiness MattersBusiness Matters`                                                                 NA
## `SourceBusiness Mirror`                                                                                  NA
## `SourceBusiness News`                                                                                    NA
## `SourceBusiness News Americas`                                                                           NA
## `SourceBusiness News Americas (subscription)`                                                            NA
## `SourceBusiness News Daily`                                                                              NA
## `SourceBusiness News Wales (press release)`                                                              NA
## `SourceBusiness Recorder`                                                                                NA
## `SourceBusiness Recorder (press release) (registration) (blog)`                                          NA
## `SourceBusiness Reporter`                                                                                NA
## `SourceBusiness Review`                                                                                  NA
## `SourceBusiness Solutions Magazine`                                                                      NA
## `SourceBusiness Spectator`                                                                               NA
## `SourceBusiness Standard`                                                                                NA
## `SourceBusiness Standard (press release) (registration) (blog)`                                          NA
## `SourceBusiness Standard India`                                                                          NA
## `SourceBusiness Times of Western Colorado`                                                               NA
## `SourceBusiness Today`                                                                                   NA
## `SourceBusiness Travel News`                                                                             NA
## `SourceBusiness Traveller`                                                                               NA
## `SourceBusiness Weekly`                                                                                  NA
## `SourceBusiness Wire`                                                                                    NA
## `SourceBusiness Wire (press release)`                                                                    NA
## `SourceBusiness Wire via Yahoo Canada Finance`                                                           NA
## `SourceBusiness Wire via Yahoo UK & Ireland Finance`                                                     NA
## `SourceBusiness Wire via Yahoo! Finance`                                                                 NA
## `SourceBusiness Wire via Yahoo! Finance India`                                                           NA
## `SourceBusiness Wire via Yahoo! New Zealand Finance`                                                     NA
## SourceBusiness.com                                                                                       NA
## SourceBusinessBecause                                                                                    NA
## SourceBusinessDay                                                                                        NA
## `SourceBusinessDesk via Yahoo! New Zealand Finance`                                                      NA
## `SourceBusinessinsider India`                                                                            NA
## SourceBusinessKorea                                                                                      NA
## SourceBusinessNorth.com                                                                                  NA
## SourceBusinessTech                                                                                       NA
## `SourceBusinessWorld Online`                                                                             NA
## `SourceBusinessWorld Online Edition`                                                                     NA
## SourceBustle                                                                                             NA
## `SourceBuying Business Travel`                                                                           NA
## `SourceBuzzFeed News`                                                                                    NA
## SourceBwog                                                                                               NA
## `SourceByron Shire News`                                                                                 NA
## SourceCainTV                                                                                             NA
## `SourceCaixin Media`                                                                                     NA
## `SourceCalcutta News`                                                                                    NA
## `SourceCalcutta Telegraph`                                                                               NA
## `SourceCalgary Herald`                                                                                   NA
## `SourceCalgary Sun`                                                                                      NA
## `SourceCalifornia Economy Reporting`                                                                     NA
## `SourceCambridge Community Television`                                                                   NA
## `SourceCambridge Evening News`                                                                           NA
## `SourceCambridge News`                                                                                   NA
## `SourceCampaign Asia-Pacific`                                                                            NA
## SourceCampaignLive                                                                                       NA
## `SourceCampus Reform`                                                                                    NA
## `SourceCampus Technology`                                                                                NA
## `SourceCampus Watch`                                                                                     NA
## `SourceCanada Free Press`                                                                                NA
## `SourceCanada NewsWire (press release)`                                                                  NA
## `SourceCanada Politics via Yahoo Canada News`                                                            NA
## SourceCanada.com                                                                                         NA
## `SourceCanadian HR Reporter`                                                                             NA
## `SourceCanadian Jewish News`                                                                             NA
## `SourceCanadian Jewish News (blog)`                                                                      NA
## `SourceCanadian Mining Journal`                                                                          NA
## `SourceCanadian Mortgage Broker News`                                                                    NA
## `SourceCanadian Reviewer`                                                                                NA
## SourceCanadianBusiness.com                                                                               NA
## `SourceCanadianBusiness.com (blog)`                                                                      NA
## `SourceCanberra Times`                                                                                   NA
## SourceCanoe                                                                                       1.000e-03
## `SourceCAPA - Centre for Aviation`                                                                       NA
## `SourceCape Breton Post`                                                                                 NA
## `SourceCape Business News`                                                                               NA
## `SourceCape Business News South Africa Business`                                                         NA
## SourceCapeTalk                                                                                           NA
## `SourceCapital City Weekly`                                                                              NA
## `SourceCapital FM Kenya (press release) (blog)`                                                          NA
## `SourceCapital Public Radio News`                                                                        NA
## `SourceCapital.gr (press release)`                                                                       NA
## SourceCapitalGazette.com                                                                                 NA
## `SourceCar and Driver (blog)`                                                                            NA
## SourceCarAdvice                                                                                          NA
## `SourceCarbon Brief`                                                                                     NA
## `SourceCarbonated.tv (blog)`                                                                             NA
## SourceCarBuzz                                                                                            NA
## SourceCardPlayer.com                                                                                     NA
## SourceCare2.com                                                                                          NA
## `SourceCaribbean360.com (subscription)`                                                                  NA
## `SourceCarlisle Sentinel`                                                                                NA
## `SourceCarlsbad Current-Argus`                                                                           NA
## `SourceCarnegie Endowment for International Peace`                                                       NA
## `SourceCarnegie Europe`                                                                                  NA
## SourceCarolinacoastonline                                                                                NA
## `SourceCarroll County Times`                                                                             NA
## `SourceCarscoops (blog)`                                                                                 NA
## `SourceCarteret County News-Times`                                                                       NA
## `SourceCasper Star-Tribune Online`                                                                       NA
## SourceCastanet.net                                                                                       NA
## `SourceCatch News`                                                                                       NA
## `SourceCatholic Culture`                                                                                 NA
## `SourceCatholic Herald`                                                                                  NA
## `SourceCatholic Herald Online`                                                                           NA
## `SourceCatholic New York`                                                                                NA
## `SourceCatholic News Agency`                                                                             NA
## `SourceCatholic News Service`                                                                            NA
## `SourceCatholic Online`                                                                                  NA
## `SourceCatholic University of America The Tower`                                                         NA
## `SourceCato Institute`                                                                                   NA
## `SourceCato Institute (blog)`                                                                            NA
## `SourceCayman Compass (press release) (registration)`                                                    NA
## `SourceCayman News Service`                                                                              NA
## `SourceCBBC Newsround`                                                                                   NA
## `SourceCBC Edmonton`                                                                                     NA
## `SourceCBC Montreal`                                                                                     NA
## `SourceCBC Newfoundland and Labrador`                                                                    NA
## `SourceCBC via Yahoo Canada News`                                                                        NA
## SourceCBC.ca                                                                                             NA
## `SourceCBS 19 Tyler`                                                                                     NA
## `SourceCBS 2 Los Angeles`                                                                                NA
## `SourceCBS 46 News Atlanta`                                                                              NA
## `SourceCBS 5 Phoenix`                                                                                    NA
## `SourceCBS 6 Richmond`                                                                                   NA
## `SourceCBS 8 San Diego`                                                                                  NA
## `SourceCBS Baltimore`                                                                                    NA
## `SourceCBS Chicago`                                                                                      NA
## `SourceCBS Dallas - Fort Worth`                                                                          NA
## `SourceCBS Denver`                                                                                       NA
## `SourceCBS Detroit`                                                                                      NA
## `SourceCBS Local`                                                                                        NA
## `SourceCBS Miami`                                                                                        NA
## `SourceCBS Minnesota`                                                                                    NA
## `SourceCBS MoneyWatch`                                                                                   NA
## `SourceCBS MoneyWatch via Yahoo! Finance`                                                                NA
## `SourceCBS New York`                                                                                     NA
## `SourceCBS News`                                                                                         NA
## `SourceCBS Philadelphia`                                                                                 NA
## `SourceCBS Pittsburgh`                                                                                   NA
## `SourceCBS San Francisco`                                                                                NA
## `SourceCBS Sports`                                                                                       NA
## `SourceCBS sports.com (blog)`                                                                            NA
## SourceCBSSports.com                                                                                      NA
## SourceCCM                                                                                                NA
## SourceCCTV                                                                                               NA
## `SourceCCTV-America`                                                                                     NA
## `SourceCDA News`                                                                                         NA
## `SourceCebu Daily News`                                                                                  NA
## `SourceCebu Tech Blogger`                                                                                NA
## `SourceCecil Whig`                                                                                       NA
## SourceCedarCreekLake.com                                                                                 NA
## `SourceCelebrating Progress Africa`                                                                      NA
## `SourceCellular News`                                                                                    NA
## `SourceCentenary News`                                                                                   NA
## `SourceCenter For American Progress`                                                                     NA
## `SourceCenter for Research on Globalization`                                                             NA
## `SourceCenter for Strategic and International Studies`                                                   NA
## `SourceCentral Chronicle`                                                                                NA
## `SourceCentral Florida Future`                                                                           NA
## `SourceCentral Penn Business Journal`                                                                    NA
## `SourceCentral Washington University`                                                                    NA
## `SourceCentre Daily Times`                                                                               NA
## `SourceCeylon Daily News`                                                                                NA
## `SourceCFA Institute Enterprising Investor (blog)`                                                       NA
## `SourceCFJC Today Kamloops`                                                                              NA
## SourceCFO                                                                                                NA
## `SourceCGMA Magazine`                                                                                    NA
## `SourceChampaign/Urbana News-Gazette`                                                                    NA
## SourceChampion                                                                                           NA
## `SourceChandigarh Tribune`                                                                               NA
## `SourceChannel 24`                                                                                       NA
## `SourceChannel 4 News`                                                                                   NA
## `SourceChannel 4 News (blog)`                                                                            NA
## `SourceChannel 8 San Diego`                                                                              NA
## `SourceChannel Insider`                                                                                  NA
## `SourceChannel News Asia`                                                                                NA
## `SourceChannel NewsAsia`                                                                                 NA
## `SourceChannel Partners`                                                                                 NA
## `SourceChannel Partners (blog)`                                                                          NA
## `SourceChannel Pro`                                                                                      NA
## `SourceChannel3000.com - WISC-TV3`                                                                       NA
## SourceChannel4000.com                                                                                    NA
## SourceChannelBiz                                                                                         NA
## SourceChannelBuzz.ca                                                                                     NA
## `SourceChannelLife Australia`                                                                            NA
## `SourceChannelLife NZ`                                                                                   NA
## SourceChannelnomics                                                                                      NA
## `SourceChannelnomics EU (registration)`                                                                  NA
## `SourceCHANNELS TELEVISION`                                                                              NA
## `SourceCharisma News`                                                                                    NA
## `SourceCharleston Gazette-Mail (subscription)`                                                           NA
## `SourceCharleston Post Courier`                                                                          NA
## `SourceCharleston Post Courier (press release)`                                                          NA
## `SourceCharlotte Business Journal`                                                                       NA
## `SourceCharlotte Business Journal (blog)`                                                                NA
## `SourceCharlotte Observer`                                                                               NA
## SourceChartAttack                                                                                        NA
## `SourceCharter 97`                                                                                       NA
## `SourceChase News & Stories`                                                                             NA
## `SourceChattanooga Times Free Press`                                                                     NA
## SourceChemicalOnline                                                                                     NA
## `SourceCherry Hill Courier Post`                                                                         NA
## `SourceCherwell Online`                                                                                  NA
## `SourceChicago Business Journal`                                                                         NA
## `SourceChicago Daily Herald`                                                                             NA
## `SourceChicago Inno`                                                                                     NA
## `SourceChicago Reader`                                                                                   NA
## `SourceChicago Sun-Times`                                                                                NA
## `SourceChicago Tonight | WTTW`                                                                           NA
## `SourceChicago Tribune`                                                                           0.000e+00
## SourceChicagoist                                                                                         NA
## `SourceChicagoNow (blog)`                                                                                NA
## `SourceChichester Observer`                                                                              NA
## `SourceChillicothe Gazette`                                                                              NA
## `SourceChilliwack Progress`                                                                              NA
## `SourceChina Daily`                                                                                      NA
## `SourceChina Daily HK Edition`                                                                           NA
## `SourceChina Digital Times`                                                                              NA
## `SourceChina Economic Net`                                                                               NA
## `SourceChina Economic Review`                                                                            NA
## `SourceChina Post`                                                                                       NA
## SourceChina.org.cn                                                                                       NA
## `SourceChinadaily USA`                                                                                   NA
## SourceChinaFile                                                                                          NA
## SourceChinapost                                                                                          NA
## SourceChinatopix                                                                                         NA
## SourceChinaTopix                                                                                         NA
## `SourceChip Chick`                                                                                       NA
## SourceCHOICE                                                                                             NA
## `SourceChristian Broadcasting Network`                                                                   NA
## `SourceChristian Daily`                                                                                  NA
## `SourceChristian News Network`                                                                           NA
## `SourceChristian Post`                                                                                   NA
## `SourceChristian Science Monitor`                                                                        NA
## `SourceChristian Science Monitor via Yahoo Canada News`                                                  NA
## `SourceChristian Science Monitor via Yahoo UK & Ireland News`                                            NA
## `SourceChristian Science Monitor via Yahoo! News`                                                        NA
## `SourceChristian Today`                                                                                  NA
## SourceChristianityToday.com                                                                              NA
## SourceChristianToday                                                                                     NA
## SourceChron.com                                                                                          NA
## `SourceChron.com (blog)`                                                                                 NA
## SourceChronicle                                                                                          NA
## `SourceChronicle of Higher Education (subscription)`                                                     NA
## `SourceChronicle of Higher Education (subscription) (blog)`                                              NA
## `SourceChronicle of Philanthropy (subscription)`                                                         NA
## SourceChronicleLive                                                                                      NA
## `SourceChurch Militant`                                                                                  NA
## `SourceChurch Times`                                                                                     NA
## `SourceCihan News Agency`                                                                                NA
## SourceCILISOS.MY                                                                                         NA
## `SourceCincinnati Business Courier`                                                                      NA
## `SourceCincinnati Business Courier (blog)`                                                               NA
## SourceCincinnati.com                                                                                     NA
## `SourceCincinnati.com (blog)`                                                                            NA
## `SourceCinema Blend`                                                                                     NA
## SourceCInewsNow                                                                                          NA
## SourceCIO                                                                                                NA
## `SourceCIO Australia`                                                                                    NA
## `SourceCIO Dive`                                                                                         NA
## `SourceCIO Insight`                                                                                      NA
## `SourceCIO New Zealand`                                                                                  NA
## `SourceCIO Today`                                                                                        NA
## `SourceCIO UK`                                                                                           NA
## `SourceCIOReview (press release)`                                                                        NA
## SourceCirculate                                                                                          NA
## `SourceCities Today`                                                                                     NA
## SourceCitifmonline                                                                                       NA
## SourceCitizen                                                                                            NA
## `SourceCitizen TV (press release)`                                                                       NA
## `SourceCitizens Voice`                                                                                   NA
## `SourceCitrus County Chronicle`                                                                          NA
## `SourceCity & County of San Francisco (press release)`                                                   NA
## `SourceCity A.M.`                                                                                        NA
## `SourceCity Limits`                                                                                      NA
## `SourceCity Pages`                                                                                       NA
## SourceCityLab                                                                                            NA
## SourceCityMetric                                                                                         NA
## SourceCityNews                                                                                           NA
## SourceCitywire.co.uk                                                                                     NA
## `SourceCivil Society Media`                                                                              NA
## `SourceCIWM Journal Online`                                                                              NA
## SourceCJOB                                                                                               NA
## `SourceCKGSB Knowledge`                                                                                  NA
## `SourceCKNW News Talk 980`                                                                               NA
## SourceClaimsJournal.com                                                                                  NA
## SourceClapway                                                                                            NA
## `SourceClaremore Daily Progress`                                                                         NA
## `SourceClarence Valley Daily Examiner`                                                                   NA
## `SourceClarksville Leaf Chronicle`                                                                       NA
## `SourceClay County Times-Democrat`                                                                       NA
## SourceCleanTechnica                                                                                      NA
## `SourceCleveland 19 News`                                                                                NA
## Sourcecleveland.com                                                                                      NA
## `SourceClick Green`                                                                                      NA
## SourceClickOnDetroit                                                                                     NA
## `SourceClimate Central`                                                                                  NA
## `SourceClimate Home`                                                                                     NA
## `SourceClinton Herald`                                                                                   NA
## `SourceCloud Computing Intelligence (registration)`                                                      NA
## `SourceCloud Pro`                                                                                        NA
## `SourceCloud Tech`                                                                                       NA
## SourceCloudTech                                                                                          NA
## SourceCloudWedge                                                                                         NA
## `SourceCLTV Chicago`                                                                                     NA
## SourceCMSWire                                                                                            NA
## SourceCNBC                                                                                        0.000e+00
## `SourceCNBC (subscription)`                                                                              NA
## `SourceCNBC via Yahoo Canada Finance`                                                                    NA
## `SourceCNBC via Yahoo! Finance`                                                                   0.000e+00
## `SourceCNBC via Yahoo! Finance India`                                                                    NA
## `SourceCNBC via Yahoo! New Zealand Finance`                                                              NA
## `SourceCNBC via Yahoo!7 Finance`                                                                         NA
## SourceCNBCAfrica.com                                                                                     NA
## SourceCNET                                                                                               NA
## `SourceCNET en español via Yahoo! News`                                                                  NA
## `SourceCNET UK`                                                                                   0.000e+00
## `SourceCNET via Yahoo! Finance`                                                                          NA
## `SourceCNET via Yahoo! News`                                                                             NA
## SourceCNN                                                                                                NA
## `SourceCNN International`                                                                                NA
## `SourceCNN Money`                                                                                        NA
## `SourceCNN Philippines`                                                                                  NA
## SourceCNN.com                                                                                            NA
## SourceCNNMoney                                                                                           NA
## SourceCNSNews.com                                                                                        NA
## `SourceCNSNews.com (blog)`                                                                               NA
## `SourceCNW Group via Yahoo Canada Finance`                                                               NA
## `SourceCNW Group via Yahoo! Finance`                                                                     NA
## `SourceCo-operative News`                                                                                NA
## SourceCo.Create                                                                                          NA
## SourceCo.Design                                                                                          NA
## `SourceCo.Design (blog)`                                                                                 NA
## SourceCo.Exist                                                                                           NA
## `SourceCoAssets via Yahoo! Singapore News`                                                               NA
## `SourceCoast Reporter`                                                                           -6.710e+07
## `SourceCochrane Times`                                                                                   NA
## `SourceCoconuts Bangkok`                                                                                 NA
## `SourceCoconuts Hong Kong`                                                                               NA
## `SourceCoffs Coast Advocate`                                                                             NA
## SourceCoinDesk                                                                                           NA
## SourceCoinReport                                                                                         NA
## SourceCoinTelegraph                                                                                      NA
## `SourceColombia Reports`                                                                                 NA
## `SourceColombo Gazette`                                                                                  NA
## `SourceColorado Springs Gazette`                                                                         NA
## `SourceColorLines magazine`                                                                              NA
## `SourceColumbia Daily Herald`                                                                            NA
## `SourceColumbia Daily Tribune`                                                                           NA
## `SourceColumbia Journalism Review`                                                                       NA
## `SourceColumbia Missourian`                                                                              NA
## `SourceColumbus Business First`                                                                          NA
## `SourceColumbus Dispatch`                                                                                NA
## `SourceColumbus Dispatch (blog)`                                                                         NA
## `SourceColumbus Ledger-Enquirer`                                                                         NA
## `SourceComcast SportsNet Philadelphia`                                                                   NA
## `SourceComet 24`                                                                                         NA
## SourceComicbook.com                                                                                      NA
## `SourceCommBank MyWealth`                                                                                NA
## `SourceCommentary Magazine`                                                                              NA
## `SourceCommercial Property Executive`                                                                    NA
## `SourceCommittee for Accuracy in Middle East Reporting in America`                                       NA
## `SourceCommittee for Accuracy in Middle East Reporting in America (blog)`                                NA
## `SourceCommon Dreams (press release)`                                                                    NA
## SourceCommonDreams.org                                                                                   NA
## SourceCommonSpace                                                                                        NA
## `SourceCommonweal (blog)`                                                                                NA
## `SourceCommonWealth magazine`                                                                            NA
## `SourceCommunist Party USA`                                                                              NA
## `SourceCommunity Financial News`                                                                         NA
## `SourceComox Valley Record`                                                                              NA
## `SourceComplete Music Update`                                                                            NA
## SourceComplex                                                                                            NA
## `SourceComputer Business Review`                                                                         NA
## `SourceComputer Dealer News`                                                                             NA
## `SourceComputer Weekly`                                                                                  NA
## `SourceComputer World Australia`                                                                         NA
## SourceComputerWeekly.com                                                                                 NA
## `SourceComputerWeekly.com (blog)`                                                                        NA
## SourceComputerworld                                                                                      NA
## `SourceComputerworld Australia`                                                                          NA
## `SourceComputerworld New Zealand`                                                                        NA
## SourceComputerworldUK                                                                                    NA
## SourceComputing                                                                                          NA
## SourceComputing.co.uk                                                                                    NA
## `SourceConcord Monitor`                                                                                  NA
## `SourceConcord Transcript`                                                                               NA
## `SourceCond\\u009d\\u009d Nast Traveler`                                                                 NA
## `SourceCondé Nast Traveller`                                                                             NA
## `SourceConnecticut Jewish Ledger`                                                                        NA
## `SourceConnecticut Post`                                                                                 NA
## `SourceConsequence of Sound (blog)`                                                                      NA
## `SourceConservative Home`                                                                                NA
## `SourceConsortium News`                                                                                  NA
## Sourceconsortiumnews.com                                                                                 NA
## `SourceConstitution Daily (blog)`                                                                        NA
## `SourceConstruction Week Online`                                                                         NA
## SourceConsultancy.uk                                                                                     NA
## `SourceConsumer Reports via Yahoo Canada Finance`                                                        NA
## `SourceConsumer Reports via Yahoo! Finance`                                                              NA
## `SourceContra Costa Times`                                                                               NA
## `SourceContractor UK`                                                                                    NA
## `SourceCoos Bay World`                                                                                   NA
## `SourceCops 2.0`                                                                                         NA
## `SourceCordele Dispatch`                                                                                 NA
## `SourceCorn and Soybean Digest (blog)`                                                                   NA
## `SourceCornell Chronicle`                                                                                NA
## `SourceCornell University The Cornell Daily Sun`                                                         NA
## `SourceCornish Guardian`                                                                                 NA
## `SourceCorpus Christi Caller-Times`                                                                      NA
## `SourceCorsicana Daily Sun`                                                                              NA
## `SourceCorvallis Gazette Times`                                                                          NA
## `SourceCorvus Business Newswire`                                                                         NA
## SourceCosmopolitan.com                                                                                   NA
## `SourceCoStar Group`                                                                                     NA
## `SourceCotswold Journal`                                                                                 NA
## `SourceCouncil on Foreign Relations`                                                                     NA
## `SourceCouncil on Foreign Relations (blog)`                                                              NA
## `SourceCounsel & Heal`                                                                                   NA
## SourceCounterCurrents.org                                                                                NA
## SourceCounterPunch                                                                                       NA
## `SourceCourier Mail`                                                                                     NA
## `SourceCoventry City FC`                                                                                 NA
## `SourceCoventry Telegraph`                                                                               NA
## `SourceCP24 Toronto's Breaking News`                                                                     NA
## `SourceCPI Financial`                                                                                    NA
## `SourceCQ Politics`                                                                                      NA
## SourceCrackBerry.com                                                                                     NA
## `SourceCrain's Chicago Business`                                                                         NA
## `SourceCrain's Chicago Business (blog)`                                                                  NA
## `SourceCrain's Cleveland Business`                                                                       NA
## `SourceCrain's Detroit Business`                                                                         NA
## `SourceCrain's Detroit Business (blog)`                                                                  NA
## `SourceCrain's New York Business`                                                                        NA
## `SourceCrain's New York Business (blog)`                                                                 NA
## `SourceCrain&#39;s New York Business`                                                                    NA
## `SourceCrave Online`                                                                                     NA
## `SourceCreamer Media's Engineering News`                                                                 NA
## `SourceCreamer Media's Mining Weekly`                                                                    NA
## SourceCreativity                                                                                         NA
## `SourceCredit.com via Yahoo! Finance`                                                                    NA
## SourceCRIENGLISH.com                                                                                     NA
## SourceCrikey                                                                                             NA
## `SourceCrikey (registration)`                                                                            NA
## SourceCRN                                                                                                NA
## `SourceCRN - UK`                                                                                         NA
## `SourceCRN Australia`                                                                                    NA
## `SourceCrookston Daily Times`                                                                            NA
## `SourceCross Rhythms`                                                                                    NA
## `SourceCrowdfund Insider`                                                                                NA
## SourceCrowdsourcing.org                                                                                  NA
## `SourceCrux: Covering all things Catholic`                                                               NA
## SourceCryptoCoinsNews                                                                                    NA
## `SourceCSO Australia`                                                                                    NA
## `SourceCSO Online`                                                                                       NA
## SourceCSPnet.com                                                                                         NA
## `SourceCSRwire.com (press release)`                                                                      NA
## `SourceCT Post`                                                                                          NA
## SourceCTR                                                                                                NA
## `SourceCTV British Columbia News`                                                                        NA
## `SourceCTV Calgary News`                                                                                 NA
## `SourceCTV Montreal News`                                                                                NA
## `SourceCTV News`                                                                                         NA
## `SourceCTV Ottawa News`                                                                                  NA
## `SourceCTV Toronto`                                                                                      NA
## SourceCTV.ca                                                                                             NA
## `SourceCU Boulder News & Events`                                                                         NA
## `SourceCU Columbia Spectator`                                                                            NA
## `SourceCult of Mac`                                                                                      NA
## SourceCurbed                                                                                             NA
## `SourceCurbed Chicago`                                                                                   NA
## `SourceCurbed DC`                                                                                        NA
## `SourceCustomer Think`                                                                                   NA
## `SourceCW39 NewsFix`                                                                                     NA
## SourceCXOToday.com                                                                                       NA
## `SourceCycling Weekly`                                                                                   NA
## `SourceCyprus Mail`                                                                                      NA
## `SourceCzech Happenings`                                                                                 NA
## `SourceD Magazine`                                                                                       NA
## `SourceDaiji World`                                                                                      NA
## SourceDaijiworld.com                                                                                     NA
## `SourceDaily American Online`                                                                            NA
## `SourceDaily Astorian`                                                                                   NA
## `SourceDaily Aztec`                                                                                      NA
## `SourceDaily Beast`                                                                                      NA
## `SourceDaily Bruin`                                                                                      NA
## `SourceDaily Californian`                                                                                NA
## `SourceDaily Caller`                                                                                     NA
## `SourceDaily Capital (Capital TV)`                                                                       NA
## `SourceDaily Commercial`                                                                                 NA
## `SourceDaily Courier`                                                                                    NA
## `SourceDaily Democrat`                                                                                   NA
## `SourceDaily Echo`                                                                                       NA
## `SourceDaily Excelsior`                                                                                  NA
## `SourceDaily Express`                                                                                    NA
## `SourceDaily Free Press (subscription)`                                                                  NA
## `SourceDaily Herald`                                                                                     NA
## `SourceDaily Journal`                                                                                    NA
## `SourceDaily Kos`                                                                                        NA
## `SourceDaily Life`                                                                                       NA
## `SourceDaily Local News`                                                                                 NA
## `SourceDaily Mail`                                                                                0.000e+00
## `SourceDaily Maverick`                                                                                   NA
## `SourceDaily Mirror`                                                                                     NA
## `SourceDaily News`                                                                                       NA
## `SourceDaily News & Analysis`                                                                            NA
## `SourceDaily News | The National Newspaper (press release) (blog)`                                       NA
## `SourceDaily News Egypt`                                                                                 NA
## `SourceDaily Nexus`                                                                                      NA
## `SourceDaily NK`                                                                                         NA
## `SourceDaily Northwestern`                                                                               NA
## `SourceDaily Pakistan`                                                                                   NA
## `SourceDaily Pioneer`                                                                                    NA
## `Sourcedaily post`                                                                                       NA
## `SourceDaily Post Nigeria`                                                                               NA
## `SourceDaily Post North Wales`                                                                           NA
## `SourceDaily Press`                                                                                      NA
## `SourceDaily Reckoning - Australian Edition`                                                             NA
## `SourceDaily Record`                                                                                     NA
## `SourceDaily Sabah`                                                                                      NA
## `SourceDaily Signal`                                                                                     NA
## `SourceDaily Star`                                                                                       NA
## `SourceDaily Star Gazette`                                                                               NA
## `SourceDaily Sun`                                                                                        NA
## `SourceDaily Telegraph`                                                                                  NA
## `SourceDaily Times`                                                                                      NA
## `SourceDaily Times Nigeria`                                                                              NA
## `SourceDaily Trojan Online`                                                                              NA
## `SourceDaily Trust`                                                                                      NA
## `SourceDaily Yonder`                                                                                     NA
## SourceDailyFinance                                                                                       NA
## SourceDailyForex.com                                                                                     NA
## SourceDailyFX                                                                                            NA
## `SourceDailyFX via Yahoo! Finance`                                                                       NA
## `SourceDailyFX via Yahoo! New Zealand Finance`                                                           NA
## `SourceDailyFX via Yahoo!7 Finance`                                                                      NA
## SourceDailyNews                                                                                          NA
## SourceDailyO                                                                                             NA
## `SourceDailyPost Nigeria`                                                                                NA
## Sourcedailytelegraph.com.au                                                                              NA
## SourceDailyuw                                                                                            NA
## `SourceDakota Financial News`                                                                            NA
## `SourceDallas Business Journal`                                                                          NA
## `SourceDallas Business Journal (blog)`                                                                   NA
## `SourceDallas Morning News`                                                                              NA
## `SourceDallas Morning News (blog)`                                                                       NA
## `SourceDallas Sun Times`                                                                                 NA
## `SourceDanbury News Times`                                                                               NA
## `SourceDarien News-Review`                                                                               NA
## `SourceDark Reading`                                                                                     NA
## `SourceData Center Knowledge`                                                                            NA
## SourceDatamation                                                                                         NA
## SourceDatanami                                                                                           NA
## SourceDATAQUEST                                                                                          NA
## `SourceDavid Curry, Digital Trends via Yahoo! News`                                                      NA
## SourceDawn                                                                                               NA
## SourceDAWN.com                                                                                           NA
## `SourceDay Herald`                                                                                       NA
## `SourceDayton Business Journal`                                                                          NA
## `SourceDayton Daily News`                                                                                NA
## `SourceDaytona Beach News-Journal`                                                                       NA
## `SourceDazeinfo (blog)`                                                                                  NA
## `SourceDC Inno`                                                                                          NA
## SourceDCist.com                                                                                          NA
## `SourceDe Dagelijkse Standaard (Blog)`                                                                   NA
## `SourceDe Montfort University (press release)`                                                           NA
## SourceDeadline                                                                                           NA
## `SourceDeadline Hollywood`                                                                               NA
## SourceDeadspin                                                                                           NA
## SourceDealBreaker                                                                                        NA
## SourceDEALSTREETASIA                                                                                     NA
## `SourceDeath and Taxes`                                                                                  NA
## `SourceDEBKA file`                                                                                       NA
## SourceDEBKAfile                                                                                          NA
## `SourceDeccan Chronicle`                                                                                 NA
## `SourceDeccan Herald`                                                                                    NA
## SourceDeepika                                                                                            NA
## `SourceDefense One`                                                                                      NA
## SourceDefenseNews.com                                                                                    NA
## `SourceDeKalb Daily Chronicle`                                                                           NA
## `SourceDelaware First Media`                                                                             NA
## SourceDelimiter                                                                                          NA
## `SourceDelmarva Daily Times`                                                                             NA
## SourceDelo                                                                                               NA
## `SourceDelta Farm Press`                                                                                 NA
## `SourceDemocracy Now!`                                                                                   NA
## `SourceDemocracy Now! (blog)`                                                                            NA
## `SourceDentistry IQ`                                                                                     NA
## `SourceDenver Business Journal (blog)`                                                                   NA
## `SourceDenver Post`                                                                                      NA
## `SourceDenver Sun Times`                                                                                 NA
## `SourceDepartment of Defense`                                                                            NA
## `SourceDerby Telegraph`                                                                                  NA
## `SourceDerbyshire Times`                                                                                 NA
## `SourceDerry Journal`                                                                                    NA
## `SourceDerry Now`                                                                                        NA
## `SourceDeseret News`                                                                                     NA
## `SourceDesign & Trend`                                                                                   NA
## `SourceDesign Week`                                                                                      NA
## `SourceDesign World Network`                                                                             NA
## `SourceDesignboom (blog)`                                                                                NA
## SourceDesignNews                                                                                         NA
## SourceDESINFOS.com                                                                                       NA
## `SourceDeSmog Canada`                                                                                    NA
## SourceDesMoinesRegister.com                                                                              NA
## `SourceDestination CRM`                                                                                  NA
## SourceDestinyMan                                                                                         NA
## SourceDestructoid                                                                                        NA
## SourceDetails                                                                                            NA
## `SourceDetroit Free Press`                                                                               NA
## `SourceDetroit News`                                                                                     NA
## `SourceDeutsche Welle`                                                                                   NA
## SourceDevelop                                                                                            NA
## `SourceDeveloper Tech`                                                                                   NA
## SourceDeveloper.com                                                                                      NA
## SourceDeveloperTech                                                                                      NA
## SourceDevex                                                                                              NA
## `SourceDevils Lake Journal`                                                                              NA
## SourceDexigner                                                                                           NA
## SourceDezeen                                                                                             NA
## Sourcedh.be                                                                                              NA
## `SourceDhaka Tribune`                                                                                    NA
## SourceDhakaTribune                                                                                       NA
## `SourceDiamondback Online`                                                                               NA
## `SourceDickinson Press`                                                                                  NA
## `SourceDigi Times`                                                                                       NA
## SourceDigiday                                                                                            NA
## SourceDiginomica                                                                                         NA
## SourceDigit                                                                                              NA
## `SourceDigital Arts Online`                                                                              NA
## `SourceDigital Journal`                                                                                  NA
## `SourceDigital Music News`                                                                               NA
## `SourceDigital Spy`                                                                                      NA
## `SourceDigital Trends`                                                                                   NA
## `SourceDigital Trends via Yahoo Canada News`                                                             NA
## `SourceDigital Trends via Yahoo Maktoob News`                                                            NA
## `SourceDigital Trends via Yahoo UK & Ireland News`                                                       NA
## `SourceDigital Trends via Yahoo! Finance`                                                                NA
## `SourceDigital Trends via Yahoo! News`                                                            0.000e+00
## `SourceDigital Trends via Yahoo! Sports`                                                          0.000e+00
## SourceDigitalBroadcastingcom                                                                             NA
## SourceDIGITALLOOK                                                                                        NA
## SourceDigitalTVEurope.net                                                                                NA
## SourceDigitimes                                                                                          NA
## `SourceDin Merican`                                                                                      NA
## `SourceDirect Marketing News`                                                                            NA
## SourceDirectionsMag.com                                                                                  NA
## `SourceDirector magazine`                                                                                NA
## `SourceDisability Scoop`                                                                                 NA
## SourceDiscover                                                                                           NA
## `SourceDiscover Humboldt`                                                                                NA
## `SourceDiscover Magazine (blog)`                                                                         NA
## `SourceDiscovery News`                                                                                   NA
## `SourceDissident Voice`                                                                                  NA
## `SourceDiverse: Issues in Higher Education`                                                              NA
## SourceDividend.com                                                                                       NA
## SourceDJBooth.net                                                                                        NA
## `SourceDL-Online`                                                                                        NA
## `SourceDNA India`                                                                                        NA
## SourceDNAinfo                                                                                            NA
## SourceDOGOnews                                                                                           NA
## `SourceDoha News`                                                                                        NA
## `SourceDomain News`                                                                                      NA
## `SourceDominican Today`                                                                                  NA
## SourceDoordarshan                                                                                        NA
## `SourceDorking and Leatherhead Advertiser`                                                               NA
## `SourceDorset Echo`                                                                                      NA
## `SourceDothan Eagle`                                                                                     NA
## `SourceDothan First`                                                                                     NA
## `SourceDouglas Budget`                                                                                   NA
## `SourceDover Post`                                                                                       NA
## `SourceDownload.com via Yahoo! News`                                                                     NA
## `SourceDream Team FC`                                                                                    NA
## `SourceDreuz Info`                                                                                       NA
## `SourceDrexel University The Triangle Online`                                                            NA
## SourceDriving                                                                                            NA
## SourceDSNews.com                                                                                         NA
## `SourceDubuque Telegraph Herald`                                                                         NA
## `SourceDuluth News Tribune`                                                                              NA
## `SourceDuncan Banner`                                                                                    NA
## `SourceDunyaNews Pakistan`                                                                               NA
## `SourceDunyaNews Pakistan (blog)`                                                                        NA
## `SourceDurham Herald Sun`                                                                                NA
## SourceDutchNews.nl                                                                                       NA
## `SourceDZ Foot`                                                                                          NA
## `SourceDZone News`                                                                                       NA
## `SourceE-Commerce Times`                                                                          0.000e+00
## `SourceE-Flux`                                                                                           NA
## `SourceE-Pao.net`                                                                                        NA
## `SourceE Kantipur`                                                                                       NA
## `SourceE! Online`                                                                                        NA
## `SourceE&T magazine`                                                                                     NA
## Sourcee27                                                                                                NA
## `Sourcee27 via Yahoo! Singapore News`                                                                    NA
## `SourceEagle-Tribune`                                                                                    NA
## `SourceEagle Radio`                                                                                      NA
## `SourceEast African Business Week`                                                                       NA
## `SourceEast Anglian Daily Times`                                                                         NA
## `SourceEast Asia Forum`                                                                                  NA
## `SourceEast Bay Express`                                                                                 NA
## `SourceEast Bay Times`                                                                                   NA
## `SourceEast Coast Radio`                                                                                 NA
## `SourceEast London and West Essex Guardian Series`                                                       NA
## `SourceEast Oregonian (subscription)`                                                                    NA
## `SourceEastbourne Herald`                                                                                NA
## SourceEastday.com                                                                                        NA
## `SourceEat Out Magazine`                                                                                 NA
## SourceEater                                                                                              NA
## `SourceEater Austin`                                                                                     NA
## `SourceEater DC`                                                                                         NA
## `SourceEater Detroit (blog)`                                                                             NA
## `SourceEater Seattle`                                                                                    NA
## `SourceeCampus News`                                                                                     NA
## `SourceECB Publishing`                                                                                   NA
## SourceEcho                                                                                               NA
## SourceEchonetdaily                                                                                       NA
## SourceECNmag.com                                                                                         NA
## Sourceecns                                                                                               NA
## `Sourceeco-business.com`                                                                                 NA
## Sourceeconomia                                                                                           NA
## `SourceEconomic Calendar`                                                                                NA
## `SourceEconomic Times`                                                                                   NA
## `SourceEconomic Times (blog)`                                                                            NA
## SourceEconomics21                                                                                        NA
## `SourceEconoMonitor (blog)`                                                                              NA
## SourceEconomy                                                                                            NA
## SourceEconomyWatch.com                                                                                   NA
## SourceEconoTimes                                                                                         NA
## `SourceEContent (press release)`                                                                         NA
## SourceEcoWatch                                                                                           NA
## `SourceEcumenical News`                                                                                  NA
## Sourceedie.net                                                                                           NA
## `SourceEdmond Sun`                                                                                       NA
## `SourceEdmonton Journal`                                                                                 NA
## `SourceEdmonton Sun`                                                                                     NA
## SourceEdmunds.com                                                                                        NA
## SourceEdSurge                                                                                            NA
## `SourceEdTech Magazine: Focus on Higher Education`                                                       NA
## `SourceEducation Dive`                                                                                   NA
## `SourceEducation Week (subscription)`                                                                    NA
## `SourceEducation Week (subscription) (blog)`                                                             NA
## `SourceEducators NZ`                                                                                     NA
## `SourceEE Times`                                                                                         NA
## `SourceEE Times Asia`                                                                                    NA
## SourceEETimes                                                                                            NA
## SourceEFF                                                                                                NA
## `SourceEffingham's News Leader`                                                                          NA
## `SourceEffingham Daily News`                                                                             NA
## `SourceEgypt Independent`                                                                                NA
## `SourceEgypt SIS (press release)`                                                                        NA
## `SourceEgyptian Streets`                                                                                 NA
## `SourceEJ Insight`                                                                                       NA
## SourceEkklesia                                                                                           NA
## `SourceEl Moudjahid`                                                                                     NA
## `SourceEl Paisano`                                                                                       NA
## `SourceEl Watan`                                                                                         NA
## `Sourceelan: The Guide to Global Muslim Culture`                                                         NA
## `SourceElectronic Beats (press release) (blog)`                                                          NA
## `SourceElectronics EETimes (registration)`                                                               NA
## `SourceElectronics Weekly`                                                                               NA
## `SourceElectronics Weekly (blog)`                                                                        NA
## `SourceElite Daily`                                                                                      NA
## `SourceElite Daily (blog)`                                                                               NA
## `SourceElizabethtown News Enterprise`                                                                    NA
## `SourceElko Daily Free Press`                                                                            NA
## `SourceELLE UK`                                                                                          NA
## SourceELLE.com                                                                                           NA
## `SourceElliott Wave`                                                                                     NA
## SourceEllwoodCity.org                                                                                    NA
## `SourceEly News`                                                                                         NA
## SourceeMarketer                                                                                          NA
## `SourceEmbassy News (subscription)`                                                                      NA
## `SourceEmergency Management (blog)`                                                                      NA
## Sourceemergingmarkets.org                                                                                NA
## `SourceEmirates 24|7`                                                                                    NA
## SourceEMQ                                                                                                NA
## `SourceEN DELFI`                                                                                         NA
## `SourceEN DELFI (subscription)`                                                                          NA
## SourceeNCA                                                                                               NA
## `SourceEnergy Matters`                                                                                   NA
## `SourceEnergy Voice`                                                                                     NA
## `SourceEnergy.gov (blog)`                                                                                NA
## `SourceeNews Park Forest`                                                                                NA
## SourceEngadget                                                                                    0.000e+00
## `SourceEngadget (blog)`                                                                                  NA
## SourceENGINEERING.com                                                                                    NA
## SourceEnnahar                                                                                            NA
## `SourceEnough Project`                                                                                   NA
## `SourceEnough Project (blog)`                                                                            NA
## `SourceENPI Info Centre`                                                                                 NA
## SourceEnsia                                                                                              NA
## SourceEnstarz                                                                                            NA
## `SourceEnter Stage Right`                                                                                NA
## `SourceEnterprise Apps Tech`                                                                             NA
## `SourceEnterprise Innovation`                                                                            NA
## `SourceEnterprise Irregulars (blog)`                                                                     NA
## `SourceEnterprise Leader`                                                                                NA
## `SourceEnterprise Times`                                                                                 NA
## `SourceEnterpriseContentManagementConnection-ECM`                                                        NA
## SourceEnterpriseTech                                                                                     NA
## `SourceEntertainment Tonight`                                                                            NA
## `SourceEntertainment Tonight via Yahoo Canada News`                                                      NA
## `SourceEntertainment Weekly`                                                                             NA
## `SourceEntertainment Weekly (blog)`                                                                      NA
## SourceEntrepreneur                                                                                       NA
## `SourceEntrepreneur via Yahoo Canada Finance`                                                            NA
## `SourceEntrepreneur via Yahoo! Finance`                                                                  NA
## SourceEntrpreneur                                                                                        NA
## `SourceEnvironment & Energy Publishing`                                                                  NA
## `SourceEnvironmental Data Interactive Exchange`                                                          NA
## `SourceEnvironmental Defense Fund (blog)`                                                                NA
## `SourceEnvironmental Finance`                                                                            NA
## `SourceEnvironmental Leader`                                                                             NA
## `SourceEnvironmental News Network`                                                                       NA
## `SourceEnvironmental Working Group`                                                                      NA
## SourceeParisExtra.com                                                                                    NA
## `SourceEqual Times`                                                                                      NA
## `SourceEquilibrio Informativo`                                                                           NA
## SourceEquities.com                                                                                       NA
## `SourceErie Times-News`                                                                                  NA
## `SourceErvik.as (press release) (registration) (blog)`                                                   NA
## `Sourceeské noviny`                                                                                      NA
## SourceESPN                                                                                               NA
## `SourceESPN (blog)`                                                                                      NA
## `SourceESPN Blogs`                                                                                       NA
## `SourceESPN FC`                                                                                          NA
## `SourceESPN FC (blog)`                                                                                   NA
## SourceESPNcricinfo.com                                                                                   NA
## SourceEsquire.com                                                                                        NA
## SourceEssence.com                                                                                        NA
## `SourceEssex Chronicle`                                                                                  NA
## SourceETAuto.com                                                                                         NA
## SourceETCIO.com                                                                                          NA
## `SourceETF Daily News`                                                                                   NA
## `SourceETF Trends via Yahoo! Finance`                                                                    NA
## `SourceETF.com via Yahoo! Finance`                                                                       NA
## SourceETFinalScore.com                                                                                   NA
## `SourceETonline via Yahoo Celebrity`                                                                     NA
## SourceETRetail.com                                                                                       NA
## SourceETtech.com                                                                                         NA
## SourceETTelecom.com                                                                                      NA
## SourceeTurboNews                                                                                         NA
## `SourceEu Business`                                                                                      NA
## `SourceEU News`                                                                                          NA
## `SourceEUbusiness (press release)`                                                                       NA
## SourceEUobserver                                                                                         NA
## SourceEurActiv                                                                                           NA
## `SourceEurasia Review`                                                                                   NA
## SourceEurasiaNet                                                                                         NA
## `SourceEureka Times Standard`                                                                            NA
## `SourceEurekAlert (press release)`                                                                       NA
## `SourceEurekAlert!`                                                                                      NA
## SourceEurogamer.net                                                                                      NA
## `SourceEuromoney magazine`                                                                               NA
## Sourceeuronews                                                                                           NA
## SourceEuroNews                                                                                           NA
## `SourceEurope Online Magazine`                                                                           NA
## `SourceEuropean Council on Foreign Relations`                                                            NA
## `SourceEuropean Jewish Press`                                                                            NA
## `SourceEuropean Parliament (press release)`                                                              NA
## SourceEuropeanCEO                                                                                        NA
## `SourceEUROPP - European Politics and Policy (blog)`                                                     NA
## SourceEuroScientist                                                                                      NA
## SourceEurosport                                                                                          NA
## SourceEURweb                                                                                             NA
## SourceEurweb.com                                                                                         NA
## `SourceEvenimentul Zilei`                                                                                NA
## `SourceEvening Chronicle`                                                                                NA
## `SourceEvening Standard`                                                                                 NA
## `SourceEveningTimes Online`                                                                              NA
## `SourceEvent Magazine`                                                                                   NA
## SourceEventHubs                                                                                          NA
## `SourceEverett Herald`                                                                                   NA
## Sourceevertiq.com                                                                                        NA
## SourceEverythingLubbock.com                                                                              NA
## SourceeWeek                                                                                              NA
## `SourceExaminer Enterprise`                                                                              NA
## `SourceExaminer Gazette`                                                                                 NA
## SourceExaminer.com                                                                                       NA
## `SourceExaminerPost.com (blog)`                                                                          NA
## `SourceExcalibur Online`                                                                                 NA
## `SourceExchange News Direct`                                                                             NA
## `SourceExchange Rates UK`                                                                                NA
## `SourceExchangeWire (blog)`                                                                              NA
## `SourceExecutive Mosaic Media (blog)`                                                                    NA
## `SourceExecutiveBiz (blog)`                                                                              NA
## `SourceExpert Reviews`                                                                                   NA
## `SourceExperts Exchange (blog)`                                                                          NA
## `SourceExpress Computer`                                                                                 NA
## SourceExpress.co.uk                                                                                      NA
## Sourceexpressandstar.com                                                                                 NA
## SourceExtremeTech                                                                                        NA
## `SourceEye For Travel`                                                                                   NA
## Sourceeyefortravel.com                                                                                   NA
## `SourceEyewitness News`                                                                                  NA
## `SourceEyewitness News 3 Hartford`                                                                       NA
## SourceeZadar                                                                                             NA
## `SourceFabius Maximus website (blog)`                                                                    NA
## SourceFactCheck.org                                                                                      NA
## SourceFAIR                                                                                               NA
## `SourceFair Observer`                                                                                    NA
## `SourceFairbanks Daily News-Miner`                                                                       NA
## `SourceFairfield Daily Republic`                                                                         NA
## `SourceFamagusta Gazette`                                                                                NA
## `SourceFamily Security Matters`                                                                          NA
## SourceFanSided                                                                                           NA
## `SourceFarm Business Communications`                                                                     NA
## `SourceFarm Futures`                                                                                     NA
## `SourceFarm Weekly`                                                                                      NA
## SourceFarmersWeekly                                                                                      NA
## `SourceFarming Life`                                                                                     NA
## `SourceFarmington Daily Times`                                                                           NA
## `SourceFashionista (blog)`                                                                               NA
## `SourceFast Company`                                                                                     NA
## `SourceFast Company Magazine`                                                                            NA
## `SourceFayetteville Observer`                                                                            NA
## `SourceFC Inter.it`                                                                                      NA
## Sourcefdanewsalert.com                                                                                   NA
## `SourceFederal Computer Week`                                                                            NA
## `SourceFederal Reserve Bank of San Francisco`                                                            NA
## `SourceFederal Reserve Bank of San Francisco (blog)`                                                     NA
## `SourceFederal Times`                                                                                    NA
## SourceFederalNewsRadio.com                                                                               NA
## SourceFedScoop                                                                                           NA
## SourceFeedstuffs                                                                                         NA
## `SourceFG Insight`                                                                                       NA
## SourceFIBA                                                                                               NA
## SourceFibre2fashion.com                                                                                  NA
## `SourceFIDH (Communiqu\\u009d\\u009d de presse)`                                                         NA
## `SourceFIDH (press release)`                                                                             NA
## SourceFierceCIO                                                                                          NA
## SourceFierceContentManagement                                                                            NA
## SourceFierceEnterpriseCommunications                                                                     NA
## SourceFierceGovernmentIT                                                                                 NA
## `SourceFierceMedicalDevices (press release) (registration)`                                              NA
## SourceFierceMobileIT                                                                                     NA
## SourceFierceTelecom                                                                                      NA
## SourceFierceWireless                                                                                     NA
## SourceFIFA                                                                                               NA
## SourceFIFA.com                                                                                           NA
## `SourceFife Today`                                                                                       NA
## `SourceFight Back! Newspaper`                                                                            NA
## `SourceFiji Sun Online`                                                                                  NA
## `SourceFiji Times`                                                                                       NA
## `SourceFileHippo News`                                                                                   NA
## `SourceFinalCall.com News`                                                                               NA
## `SourceFinance and Commerce`                                                                             NA
## `SourceFinance Magnates`                                                                                 NA
## `SourceFinance Magnates (blog)`                                                                          NA
## SourceFinanceAsia                                                                                        NA
## `SourceFinancial Advisor Magazine (registration)`                                                        NA
## `SourceFinancial Director`                                                                               NA
## `SourceFinancial Express`                                                                                NA
## `SourceFinancial Express Bangladesh`                                                                     NA
## `SourceFinancial Market News`                                                                            NA
## `SourceFinancial News (subscription)`                                                                    NA
## `SourceFinancial Planning`                                                                               NA
## `SourceFinancial Post`                                                                                   NA
## `SourceFinancial Times`                                                                                  NA
## `SourceFinancial Times via Yahoo! New Zealand Finance`                                                   NA
## SourceFinancialSpots.com                                                                                 NA
## SourceFinanzen.net                                                                                       NA
## SourcefindBIOMETRICS                                                                                     NA
## Sourcefinder.com.au                                                                                      NA
## SourceFinextra                                                                                           NA
## `SourceFinextra (press release)`                                                                         NA
## `SourceFingal Independent`                                                                               NA
## `SourceFirst Things (blog)`                                                                              NA
## SourceFirstcoastnews.com                                                                                 NA
## SourceFirstpost                                                                                          NA
## `SourceFirstpost (satire)`                                                                               NA
## SourceFiveThirtyEight                                                                                    NA
## `SourceFlathead Beacon`                                                                                  NA
## SourceFlavorwire                                                                                         NA
## `SourceFleet Owner (blog)`                                                                               NA
## SourceFleetNews                                                                                          NA
## `SourceFleetwood Today`                                                                                  NA
## SourceFlightglobal                                                                                       NA
## `SourceFlorida Flambeau`                                                                                 NA
## `SourceFlorida Politics (blog)`                                                                          NA
## `SourceFlorida Times-Union`                                                                              NA
## `SourceFlorida Today`                                                                                    NA
## `SourceFlorida Trend`                                                                                    NA
## `SourceFlyer News`                                                                                       NA
## `SourceFM World`                                                                                         NA
## `SourceFocus News`                                                                                       NA
## `SourceFocus Taiwan News Channel`                                                                        NA
## `SourceFond du Lac Reporter`                                                                             NA
## `SourceFood Tank (blog)`                                                                                 NA
## SourceFoodManufacture.co.uk                                                                              NA
## `SourceFoodNavigator-Asia.com`                                                                           NA
## SourceFoodProductionDaily.com                                                                            NA
## `SourceFor The Win`                                                                                      NA
## SourceForbes                                                                                             NA
## `SourceForbes India`                                                                                     NA
## `SourceForbes via Yahoo! Finance`                                                                        NA
## `SourceForbes via Yahoo! News`                                                                           NA
## `SourceForeign Affairs`                                                                                  NA
## `SourceForeign Affairs (subscription)`                                                                   NA
## `SourceForeign Policy`                                                                                   NA
## `SourceForeign Policy (blog)`                                                                            NA
## `SourceForeign Policy Blogs (blog)`                                                                      NA
## `SourceForeign Policy In Focus`                                                                          NA
## `SourceForeign Policy Journal`                                                                           NA
## `SourceForeign Relations`                                                                                NA
## `SourceForex Factory`                                                                                    NA
## SourceForexLive                                                                                          NA
## `SourceFormtek Blog (blog)`                                                                              NA
## `SourceFort Wayne Journal Gazette`                                                                       NA
## `SourceFort Wayne Journal Gazette (blog)`                                                                NA
## `SourceFort Worth Star-Telegram`                                                                         NA
## `SourceFort Worth Star Telegram`                                                                         NA
## `SourceFort Worth Star Telegram (blog)`                                                                  NA
## SourceFortune                                                                                            NA
## `SourceFortune via Yahoo Canada Finance`                                                                 NA
## `SourceFortune via Yahoo! Finance`                                                                       NA
## SourceForward                                                                                            NA
## `SourceFoster's Daily Democrat`                                                                          NA
## SourceFourFourTwo                                                                                        NA
## `SourceFourFourTwo via Yahoo Canada Sports`                                                              NA
## `SourceFOX 11 Los Angeles`                                                                               NA
## `SourceFOX 11 Reno`                                                                                      NA
## `SourceFOX 12 Oregon`                                                                                    NA
## `SourceFOX 13 News, Tampa Bay`                                                                           NA
## `SourceFOX 13 Utah`                                                                                      NA
## `SourceFOX 19 Cincinnati`                                                                                NA
## `SourceFox 2 Detroit`                                                                                    NA
## `SourceFOX 2 News St. Louis`                                                                             NA
## `SourceFox 28`                                                                                           NA
## `SourceFOX 28 South Bend`                                                                                NA
## `SourceFOX 29 News Philadelphia`                                                                         NA
## `SourceFOX 31 Denver`                                                                                    NA
## `SourceFox 32 Chicago`                                                                                   NA
## `SourceFox 35 Orlando`                                                                                   NA
## `SourceFOX 4 Kansas City`                                                                                NA
## `SourceFOX 4 News`                                                                                       NA
## `SourceFOX 41 Louisville`                                                                                NA
## `SourceFOX 43 Harrisburg`                                                                                NA
## `SourceFOX 46 Charlotte`                                                                                 NA
## `SourceFOX 5 Atlanta`                                                                                    NA
## `SourceFOX 5 Las Vegas`                                                                                  NA
## `SourceFOX 5 San Diego`                                                                                  NA
## `SourceFox 59`                                                                                           NA
## `SourceFOX 59 Indianapolis`                                                                              NA
## `SourceFOX 6 Milwaukee`                                                                                  NA
## `SourceFOX 6 News Birmingham`                                                                            NA
## `SourceFOX 61`                                                                                           NA
## `SourceFOX 7 Austin`                                                                                     NA
## `SourceFOX 7 WTVW Evansville`                                                                            NA
## `SourceFOX 8 Cleveland`                                                                                  NA
## `SourceFOX 8 New Orleans`                                                                                NA
## `SourceFOX 8 WGHP`                                                                                       NA
## `SourceFox Business`                                                                                     NA
## `SourceFOX Business`                                                                                     NA
## `SourceFox Business via Yahoo! Finance`                                                                  NA
## `SourceFOX CT Hartford`                                                                                  NA
## `SourceFOX Illinois`                                                                                     NA
## `SourceFox News`                                                                                         NA
## `SourceFox News Insider`                                                                                 NA
## `SourceFox News Latino`                                                                                  NA
## `SourceFOX News Radio (blog)`                                                                            NA
## `SourceFox Sports`                                                                                       NA
## SourceFox11online.com                                                                                    NA
## `SourceFOX13 Memphis`                                                                                    NA
## Sourcefox13now.com                                                                                       NA
## SourceFox17                                                                                              NA
## SourceFOX21News.com                                                                                      NA
## Sourcefox2now.com                                                                                        NA
## `SourceFOX30 / CBS47 Jacksonville`                                                                       NA
## `SourceFOX31 Denver`                                                                                     NA
## SourceFOX40                                                                                              NA
## `SourceFOX40 Sacramento`                                                                                 NA
## SourceFOX43.com                                                                                          NA
## Sourcefox4kc.com                                                                                         NA
## SourceFox5NY                                                                                             NA
## Sourcefox5sandiego.com                                                                                   NA
## Sourcefox6now.com                                                                                        NA
## Sourcefox8.com                                                                                           NA
## SourceFoxReno.com                                                                                        NA
## SourceFOXSports.com                                                                                      NA
## `SourceFRANCE 24`                                                                                        NA
## `SourceFranklin Independent`                                                                             NA
## `SourceFranklin News Post`                                                                               NA
## `SourceFraser Coast Chronicle`                                                                           NA
## `SourceFrederick News Post (subscription)`                                                               NA
## SourceFredericksburg.com                                                                                 NA
## `SourceFree Malaysia Today`                                                                       0.000e+00
## `SourceFree Press Journal`                                                                               NA
## `SourceFreedom Newspaper`                                                                                NA
## SourceFreestonecountytimesonline                                                                         NA
## `SourceFresh Business Thinking`                                                                          NA
## SourceFreshPlaza                                                                                         NA
## `SourceFresno Bee`                                                                                       NA
## `SourceFresno Bee (blog)`                                                                                NA
## `SourceFresno Business Journal`                                                                          NA
## `SourceFrome Standard`                                                                                   NA
## `SourceFrome Times`                                                                                      NA
## SourceFRONTLINE                                                                                          NA
## `SourceFrontPage Magazine`                                                                               NA
## `SourceFrost Illustrated`                                                                                NA
## SourceFSView                                                                                             NA
## `SourceFT Adviser`                                                                                       NA
## `SourceFT Alphaville (registration)`                                                                     NA
## `SourceFT.com (blog)`                                                                                    NA
## `SourceFT.com (registration) (blog)`                                                                     NA
## `SourceFudzilla (blog)`                                                                                  NA
## `SourceFuelFix (blog)`                                                                                   NA
## `SourceFulton News`                                                                                      NA
## `SourceFund Strategy`                                                                                    NA
## Sourcefuse.tv                                                                                            NA
## `SourceFuseworks via Yahoo! New Zealand Finance`                                                         NA
## SourceFusion                                                                                             NA
## SourceFXStreet                                                                                           NA
## SourceGadget                                                                                             NA
## SourceGadgette                                                                                           NA
## `SourceGainesville Sun`                                                                                  NA
## `SourceGainesville Times`                                                                                NA
## `SourceGalesburg Register-Mail`                                                                          NA
## SourceGalleyCat                                                                                          NA
## SourceGallup                                                                                             NA
## SourceGallup.com                                                                                         NA
## SourceGamasutra                                                                                          NA
## `SourceGamasutra (blog)`                                                                                 NA
## `SourceGame Debate`                                                                                      NA
## `SourceGame Informer`                                                                                    NA
## `SourceGame Rant`                                                                                        NA
## `SourceGame Revolution`                                                                                  NA
## SourceGameDev.net                                                                                        NA
## SourceGamenguide                                                                                         NA
## SourceGamepur                                                                                            NA
## `SourceGameranx (blog)`                                                                                  NA
## `SourceGamereactor UK`                                                                                   NA
## `SourceGames Radar`                                                                                      NA
## Sourcegamesindustry.biz                                                                                  NA
## SourceGamesIndustry.biz                                                                                  NA
## `SourceGamesIndustry.biz (registration)`                                                                 NA
## SourceGameSpot                                                                                           NA
## `SourceGameSpot (blog)`                                                                                  NA
## `SourceGameSpot via Yahoo! News`                                                                         NA
## SourceGamespresso                                                                                        NA
## `SourceGamesRadar (blog)`                                                                                NA
## SourceGameZone                                                                                           NA
## SourceGamingBolt                                                                                         NA
## `SourceGant Daily`                                                                                       NA
## `SourceGas 2.0`                                                                                          NA
## `SourceGatestone Institute`                                                                              NA
## SourceGawker                                                                                             NA
## `SourceGazette Live`                                                                                     NA
## `SourceGazette News`                                                                                     NA
## SourceGazetteNET                                                                                         NA
## `SourceGazetteUnion,com (blog)`                                                                          NA
## Sourcegbtimes                                                                                            NA
## SourceGCaptain                                                                                           NA
## SourceGCN.com                                                                                            NA
## `SourceGear Junkie (blog)`                                                                               NA
## Sourcegearburn                                                                                           NA
## SourceGearNuke                                                                                           NA
## SourceGeek                                                                                               NA
## `SourceGeek Snack`                                                                                       NA
## SourceGeek.com                                                                                           NA
## SourceGeekSided                                                                                          NA
## SourceGeektime                                                                                           NA
## SourceGeekWire                                                                                           NA
## `SourceGeeky Gadgets`                                                                                    NA
## `SourceGeelong Advertiser`                                                                               NA
## SourceGematsu                                                                                            NA
## SourceGenomeWeb                                                                                          NA
## `SourceGeo News, Pakistan`                                                                               NA
## `SourceGeorgetown University The Hoya`                                                                   NA
## `SourceGeorgia Today`                                                                                    NA
## Sourcegetreading                                                                                         NA
## Sourcegetwestlondon                                                                                      NA
## `SourceGhacks Technology News`                                                                           NA
## `SourceGhana Broadcasting Corporation`                                                                   NA
## SourceGhanasoccernet.com                                                                                 NA
## SourceGhanaWeb                                                                                           NA
## SourceGhanaweb.com                                                                                       NA
## `SourceGia \\u009dnh Vnexpresss`                                                                         NA
## SourceGigaom                                                                                             NA
## `SourceGigaom via Yahoo! Finance`                                                                        NA
## `SourceGilmer Mirror`                                                                                    NA
## `SourceGippsland Times`                                                                                  NA
## `SourceGisborne Herald`                                                                                  NA
## SourceGizbot                                                                                             NA
## Sourcegizmag                                                                                             NA
## SourceGizmag                                                                                             NA
## SourceGizmodo                                                                                     1.000e-03
## `SourceGizmodo Australia`                                                                                NA
## `SourceGizmodo India`                                                                                    NA
## `SourceGizmodo UK`                                                                                       NA
## SourceGizmoids                                                                                           NA
## `SourceGladstone Observer`                                                                               NA
## SourceGlamour                                                                                            NA
## `SourceGlamour (blog)`                                                                                   NA
## `SourceGlasgow Daily Times`                                                                              NA
## `SourceGlasgow Evening Times`                                                                            NA
## `SourceGlens Falls Post-Star`                                                                            NA
## `SourceGlenwood Springs Post Independent`                                                                NA
## `SourceGlobal Envision`                                                                                  NA
## `SourceGlobal Grind`                                                                                     NA
## `SourceGlobal Indonesian Voices (GIVnews.com)`                                                           NA
## `SourceGlobal Investor`                                                                                  NA
## `SourceGlobal News`                                                                                      NA
## `SourceGlobal Risk Insights`                                                                             NA
## `SourceGlobal Times`                                                                                     NA
## `SourceGlobal Trade Review (GTR)`                                                                        NA
## `SourceGlobal Voices Online`                                                                             NA
## SourceGlobalMeatNews.com                                                                                 NA
## SourceGlobalnews.ca                                                                                      NA
## SourceGlobalPost                                                                                         NA
## `SourceGlobeNewswire (press release)`                                                                    NA
## `SourceGlobeNewswire via Yahoo Canada Finance`                                                           NA
## `SourceGlobeNewswire via Yahoo UK & Ireland Finance`                                                     NA
## `SourceGlobeNewswire via Yahoo! Finance`                                                                 NA
## `SourceGlobeNewswire via Yahoo! Finance India`                                                           NA
## `SourceGlobeNewswire via Yahoo! New Zealand Finance`                                                     NA
## `SourceGlobeNewswire via Yahoo!7 Finance`                                                                NA
## SourceGlobes                                                                                             NA
## `SourceGlobes Online`                                                                                    NA
## SourceGlobeSt.com                                                                                        NA
## `SourceGMA News`                                                                                         NA
## `SourceGMA News Online`                                                                                  NA
## `SourceGo Certify`                                                                                       NA
## SourceGoal.com                                                                                           NA
## `SourceGoal.com via Yahoo! Sports`                                                                       NA
## SourceGoDanRiver.com                                                                                     NA
## SourceGoErie.com                                                                                         NA
## `SourceGold Coast Bulletin`                                                                              NA
## `SourceGold Seek`                                                                                        NA
## `SourceGolden Gate Xpress`                                                                               NA
## SourceGoldSeek.com                                                                                       NA
## SourceGolf.com                                                                                           NA
## SourceGolfDigest.com                                                                                     NA
## SourceGoLocalProv                                                                                        NA
## `SourceGood Gear Guide`                                                                                  NA
## `SourceGOOD Magazine`                                                                                    NA
## `SourceGood Morning America via Yahoo! News`                                                             NA
## `SourceGood News Network`                                                                                NA
## `SourceGood News Pilipinas`                                                                              NA
## SourceGood4Utah                                                                                          NA
## `SourceGoodCall News (blog)`                                                                             NA
## `SourceGoogle (press release)`                                                                           NA
## SourceGOPUSA                                                                                             NA
## `SourceGoshen News`                                                                                      NA
## `SourceGospel Herald`                                                                                    NA
## `SourceGossip Monthly Magazine`                                                                          NA
## `SourceGotham Gazette`                                                                                   NA
## SourceGothamist                                                                                          NA
## `SourceGotta Be Mobile`                                                                                  NA
## SourceGovConWire                                                                                         NA
## `SourceGovernance Now`                                                                                   NA
## SourceGoverning                                                                                          NA
## `SourceGovernment of Canada News`                                                                        NA
## `SourceGovernment of Jamaica, Jamaica Information Service`                                               NA
## `SourceGovernment of Ontario News`                                                                       NA
## `SourceGovernment Technology`                                                                            NA
## `SourceGQ Magazine`                                                                                      NA
## SourceGQ.com                                                                                             NA
## `SourceGraham Cluley Security News`                                                                      NA
## `SourceGrand Forks Herald`                                                                               NA
## `SourceGrand Island Independent`                                                                         NA
## `SourceGrand Junction Daily Sentinel`                                                                    NA
## `SourceGrand Rapids Herald-Review`                                                                       NA
## `SourceGrand River Sachem`                                                                               NA
## `SourceGrande Prairie Daily Herald-Tribune`                                                              NA
## `SourceGreat Falls Tribune`                                                                              NA
## SourceGreatandhra.com                                                                                    NA
## `SourceGreater Baton Rouge Business Report`                                                              NA
## `SourceGreater Greater Washington`                                                                       NA
## `SourceGreater Kashmir`                                                                                  NA
## `SourceGreek Reporter`                                                                                   NA
## `SourceGreeley Tribune`                                                                                  NA
## `SourceGreen Bay Press Gazette`                                                                          NA
## `SourceGreen Car Reports`                                                                                NA
## `SourceGreen Left Weekly`                                                                                NA
## `SourceGreen Valley News`                                                                                NA
## SourceGreenBiz                                                                                           NA
## SourceGreenbot                                                                                           NA
## `SourceGreene County Messenger`                                                                          NA
## `SourceGreenfield Daily Reporter`                                                                        NA
## `SourceGreenock Telegraph`                                                                               NA
## `SourceGreensboro News & Record`                                                                         NA
## `SourceGreentech Media`                                                                                  NA
## `SourceGreenville News`                                                                                  NA
## `SourceGreenwich Time`                                                                                   NA
## `SourceGrimsby Telegraph`                                                                                NA
## SourceGrist                                                                                              NA
## `SourceGroesbeck Journal`                                                                                NA
## SourcegroovyPost                                                                                         NA
## `SourceGrub Street`                                                                                      NA
## SourceGSMArena.com                                                                                       NA
## `SourceGuardian Liberty Voice`                                                                           NA
## `SourceGuitar World Magazine`                                                                            NA
## `SourceGulf Business News`                                                                               NA
## `SourceGulf Digital News`                                                                                NA
## `SourceGulf News`                                                                                        NA
## `SourceGulf News Journal`                                                                                NA
## `SourceGulf News via Yahoo Maktoob News`                                                                 NA
## `SourceGulf Times`                                                                                       NA
## `SourceGulf Today`                                                                                       NA
## Sourcegulfnews.com                                                                                       NA
## SourceGuns.com                                                                                           NA
## `SourceGuru Focus`                                                                                       NA
## `Sourceguru3d.com (press release)`                                                                       NA
## SourceGuruFocus.com                                                                                      NA
## `SourceGuruFocus.com via Yahoo! Finance`                                                                 NA
## `SourceGW Today`                                                                                         NA
## `SourceGympie Times`                                                                                     NA
## `SourceH\\u009d\\u009d Ni Mi`                                                                            NA
## SourceHaaretz                                                                                            NA
## `SourceHaaretz Daily`                                                                                    NA
## `SourceHack Read`                                                                                        NA
## SourceHackaday                                                                                           NA
## SourceHaitilibre.com                                                                                     NA
## `SourceHamilton Journal News`                                                                            NA
## `SourceHamilton Spectator`                                                                               NA
## `SourceHampshire Chronicle`                                                                              NA
## `SourceHandelsblatt Global Edition (subscription)`                                                       NA
## `SourceHanford Sentinel`                                                                                 NA
## `SourceHardcore Gamer`                                                                                   NA
## `SourceHardOCP (press release)`                                                                          NA
## `SourceHardware Secrets`                                                                                 NA
## SourceHardwareZone                                                                                       NA
## `SourceHardwareZone via Yahoo! Philippines News`                                                         NA
## `SourceHardwareZone via Yahoo! Singapore News`                                                           NA
## SourceHarpersBAZAAR.com                                                                                  NA
## `SourceHartford Courant`                                                                                 NA
## `SourceHartlepool Mail`                                                                                  NA
## `SourceHarvard Business Review`                                                                          NA
## `SourceHarvard Gazette`                                                                                  NA
## `SourceHarvard Law Record`                                                                               NA
## `SourceHarvard Law School News`                                                                          NA
## `SourceHastings Tribune`                                                                                 NA
## `SourceHavana Times`                                                                                     NA
## Sourcehaveeruonline                                                                                      NA
## `SourceHawaii 24/7 (press release)`                                                                      NA
## `SourceHawaii News Now`                                                                                  NA
## `SourceHeadlines & Global News`                                                                          NA
## `SourceHealth Affairs (blog)`                                                                            NA
## `SourceHealth Aim`                                                                                       NA
## `SourceHealthcare IT News`                                                                               NA
## SourceHealthline                                                                                         NA
## `SourceHeat Street`                                                                                      NA
## `SourceHeavy Duty Trucking`                                                                              NA
## SourceHeavy.com                                                                                          NA
## `SourceHelena Daily World`                                                                               NA
## `SourceHelena Independent Record`                                                                        NA
## `SourceHellenic News of America`                                                                         NA
## `SourceHellenic Shipping News Worldwide`                                                                 NA
## `SourceHello Beautiful - Interactive One (blog)`                                                         NA
## Sourcehellomagazine.com                                                                                  NA
## `SourceHelsingin Sanomat`                                                                                NA
## `SourceHenderson Daily News`                                                                             NA
## `SourceHerald-Mail Media`                                                                                NA
## `SourceHerald & Review`                                                                                  NA
## `SourceHerald & Review (blog)`                                                                           NA
## `SourceHerald and News`                                                                                  NA
## `SourceHerald Scotland`                                                                                  NA
## `SourceHerald Sun`                                                                                       NA
## `SourceHerald Times Reporter`                                                                            NA
## SourceHerald.ie                                                                                          NA
## SourceHeraldNet                                                                                          NA
## `SourceHere And Now`                                                                                     NA
## `SourceHereford Times`                                                                                   NA
## `SourceHeritage Florida Jewish News`                                                                     NA
## `SourceHeritage Foundation`                                                                              NA
## SourceHeritage.org                                                                                       NA
## `SourceHerts and Essex Observer`                                                                         NA
## `SourceHexa News`                                                                                        NA
## SourceHEXUS                                                                                              NA
## `SourceHibbing Daily Tribune`                                                                            NA
## `SourceHickory Daily Record`                                                                             NA
## `SourceHigh Country News`                                                                                NA
## `SourceHigh Country Press`                                                                               NA
## `SourceHigh Plains Journal`                                                                              NA
## `SourceHigh Point University (press release) (blog)`                                                     NA
## `SourceHIGH TIMES`                                                                                       NA
## `SourceHighbrow Magazine`                                                                                NA
## `SourceHighlands Today`                                                                                  NA
## SourceHighsnobiety                                                                                       NA
## `SourceHill Times (subscription)`                                                                        NA
## `SourceHimalayan Times`                                                                                  NA
## `SourceHindu Business Line`                                                                              NA
## `SourceHindustan Times`                                                                                  NA
## `SourceHints News Network`                                                                               NA
## SourceHipHopDX                                                                                           NA
## `SourceHistory News Network (HNN)`                                                                       NA
## `SourceHIT Consultant`                                                                                   NA
## SourceHITC                                                                                               NA
## `SourceHollywood Life`                                                                                   NA
## `SourceHollywood Reporter`                                                                               NA
## SourceHolyrood.com                                                                                       NA
## SourceHometownlife.com                                                                                   NA
## `SourceHonest Reporting Canada`                                                                          NA
## SourceHonestreporting.com                                                                                NA
## `SourceHong Kong Free Press`                                                                             NA
## `SourceHong Kong Standard`                                                                               NA
## `SourceHong Kong Standard (press release)`                                                               NA
## `SourceHonolulu Civil Beat`                                                                              NA
## `SourceHonolulu Star-Advertiser`                                                                         NA
## `SourceHoosier Ag Today`                                                                                 NA
## `SourceHope Star`                                                                                        NA
## `SourceHornell Evening Tribune`                                                                          NA
## `SourceHospitality Net`                                                                                  NA
## `SourceHot Air`                                                                                          NA
## `SourceHot Hardware`                                                                                     NA
## `SourceHot Springs Sentinel`                                                                             NA
## `SourceHot Stocks Point`                                                                                 NA
## `SourceHotel News Now`                                                                                   NA
## `SourceHotel News Resource (press release)`                                                              NA
## `SourceHotelier Middle East`                                                                             NA
## SourceHotNewHipHop                                                                                       NA
## `SourceHouma Courier`                                                                                    NA
## SourceHousingWire                                                                                        NA
## `SourceHousingWire (blog)`                                                                               NA
## `SourceHouston Chronicle`                                                                                NA
## `SourceHouston Public Media`                                                                             NA
## `SourceHoustonia Magazine`                                                                               NA
## `SourceHoward University The District Chronicles`                                                        NA
## `SourceHowStuffWorks NOW`                                                                                NA
## SourceHPCwire                                                                                            NA
## `SourceHQ Grande Prairie`                                                                                NA
## SourceHRHub                                                                                              NA
## `SourceHSUS News`                                                                                        NA
## `SourceHSUS News (blog)`                                                                                 NA
## `Sourcehttp://hamodia.com`                                                                               NA
## `Sourcehttp://wales.gov.uk/`                                                                             NA
## `Sourcehttp://www.newsgram.com/`                                                                         NA
## `SourceHuddersfield Daily Examiner`                                                                      NA
## `SourceHuddersfield Examiner`                                                                            NA
## `SourceHuffington Post`                                                                                  NA
## `SourceHuffington Post (blog)`                                                                           NA
## `SourceHuffington Post Australia`                                                                        NA
## `SourceHuffington Post Canada`                                                                           NA
## `SourceHuffington Post India`                                                                            NA
## `SourceHuffington Post UK`                                                                               NA
## SourceHUH.                                                                                               NA
## `SourceHuman Capital`                                                                                    NA
## `SourceHuman Events`                                                                                     NA
## `SourceHuman Resources Online`                                                                           NA
## `SourceHuman Rights Campaign (blog)`                                                                     NA
## `SourceHuman Rights First`                                                                               NA
## `SourceHuman Rights First (blog)`                                                                        NA
## `SourceHuman Rights Watch`                                                                               NA
## SourceHumanosphere                                                                                       NA
## `SourceHungary Today`                                                                                    NA
## `SourceHuntington Herald Dispatch`                                                                       NA
## `SourceHuntsville Item`                                                                                  NA
## `SourceHuron Daily Tribune`                                                                              NA
## `SourceHurriyet Daily News`                                                                              NA
## `SourceHybrid Cars News`                                                                                 NA
## `SourceHyde Park Herald`                                                                                 NA
## SourceHydrocarbonOnline                                                                                  NA
## SourceHyperallergic                                                                                      NA
## `SourceHypergrid Business`                                                                               NA
## `SourceI am in dna of India`                                                                             NA
## Sourcei24news                                                                                            NA
## `SourceI4U News`                                                                                         NA
## SourceiAfrica.com                                                                                        NA
## `SourceIAM (registration) (blog)`                                                                        NA
## SourceiamWire                                                                                            NA
## `SourceIANS India Private Limited via Yahoo! India News`                                                 NA
## `SourceIANS India Private Limited via Yahoo! Singapore News`                                             NA
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! India News`                         0.000e+00
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! Singapore News`                     0.000e+00
## `SourceIANS via Yahoo Maktoob News`                                                               0.000e+00
## `SourceIANS via Yahoo! Finance India`                                                                    NA
## `SourceIB Times via Yahoo UK & Ireland News`                                                             NA
## `SourceIB Times via Yahoo! Singapore News`                                                               NA
## `SourceIBN live`                                                                                         NA
## SourceIBN7                                                                                               NA
## SourceIBNLive                                                                                            NA
## `SourceIBNLive (blog)`                                                                                   NA
## `SourceIceland Monitor`                                                                                  NA
## SourceIceNews                                                                                            NA
## SourceICIS                                                                                               NA
## SourceiClarified                                                                                         NA
## `SourceICRC (press release)`                                                                             NA
## `SourceIdaho State Journal`                                                                              NA
## `SourceIdaho Statesman`                                                                                  NA
## `SourceIDEX Online`                                                                                      NA
## SourceiDigitalTimes.com                                                                                  NA
## `SourceIDN InDepthNews | Analysis That Matters`                                                          NA
## `SourceIEEE Spectrum`                                                                                    NA
## `SourceiFiber One`                                                                                       NA
## SourceIGN                                                                                                NA
## `SourceIGN Videogames`                                                                                   NA
## `SourceIGN Xbox One Games`                                                                               NA
## `SourceIHS Electronics360`                                                                               NA
## `SourceIJ Review`                                                                                        NA
## SourceikhwanWeb.com                                                                                      NA
## `SourceIlford Recorder`                                                                                  NA
## `SourceIlford Recorder 24`                                                                               NA
## `SourceIllawarra Mercury`                                                                                NA
## SourceIlliniHQ.com                                                                                       NA
## Sourceiloubnan.info                                                                                      NA
## SourceiMediaEthics                                                                                       NA
## `SourceImmortal News`                                                                                    NA
## Sourceimpact24                                                                                           NA
## `SourceImperial College London`                                                                          NA
## `SourceImperial Valley Press`                                                                            NA
## `SourceIn-Cyprus (press release) (subscription) (blog)`                                                  NA
## `SourceIn Defense of Marxism`                                                                            NA
## `SourceIn Homeland Security`                                                                             NA
## `SourceIn These Times`                                                                                   NA
## SourceInc.com                                                                                            NA
## SourceInDaily                                                                                            NA
## `SourceIndependent Australia`                                                                            NA
## `SourceIndependent Catholic News`                                                                        NA
## `SourceIndependent Florida Alligator`                                                                    NA
## `SourceIndependent Media Review Analysis (IMRA)`                                                         NA
## `SourceIndependent Online`                                                                               NA
## `SourceIndependent Reporter`                                                                             NA
## `SourceIndependent Tribune`                                                                              NA
## SourceIndependent.ae                                                                                     NA
## SourceIndex.hr                                                                                           NA
## `SourceIndia Infoline`                                                                                   NA
## `SourceIndia Today`                                                                                      NA
## `SourceIndia Today Group via Yahoo! Finance India`                                                       NA
## `SourceIndia Tribune`                                                                                    NA
## `SourceIndia TV`                                                                                         NA
## SourceIndia.com                                                                                          NA
## Sourceindiablooms                                                                                        NA
## SourceIndiainfoline                                                                                      NA
## `SourceIndian Country Today Media Network`                                                               NA
## `SourceIndiana Public Media`                                                                             NA
## `SourceIndiana&#39;s NewsCenter`                                                                         NA
## `SourceIndianapolis Business Journal`                                                                    NA
## `SourceIndianapolis Business Journal (blog)`                                                             NA
## `SourceIndianapolis Star`                                                                                NA
## SourceIndiatimes.com                                                                                     NA
## `SourceIndie Shuffle Music News (blog)`                                                                  NA
## `SourceIndie Wire`                                                                                       NA
## `SourceIndie Wire (blog)`                                                                                NA
## `SourceIndo American News`                                                                               NA
## `SourceIndonesia Investments (press release)`                                                            NA
## `SourceIndustrial Laser Solutions Magazine`                                                              NA
## `SourceIndustry Leaders Magazine`                                                                        NA
## `SourceIndustry Week`                                                                                    NA
## SourceIndustryWeek                                                                                       NA
## SourceiNews                                                                                              NA
## SourceiNews880.com                                                                                       NA
## SourceInferse                                                                                            NA
## `Sourceinfo-europa`                                                                                      NA
## `SourceInfo-Palestine`                                                                                   NA
## `Sourceinfo komputer`                                                                                    NA
## SourceInfoQ.com                                                                                          NA
## `SourceInformation Age`                                                                           2.720e-01
## SourceInformationWeek                                                                                    NA
## SourceINFORUM                                                                                            NA
## `SourceInfosecurity Magazine`                                                                            NA
## `SourceInfoTel News Ltd`                                                                                 NA
## SourceInfoToday.com                                                                                      NA
## SourceInfoWorld                                                                                          NA
## SourceInhabitat                                                                                          NA
## `SourceInnovation Excellence (blog)`                                                                     NA
## SourceInquirer                                                                                           NA
## SourceInquirer.net                                                                                       NA
## `SourceInSerbia News`                                                                                    NA
## `SourceInside Bay Area`                                                                                  NA
## `SourceInside Edition`                                                                                   NA
## `SourceInside Higher Ed`                                                                                 NA
## `SourceInside Higher Ed (blog)`                                                                          NA
## `SourceInside INdiana Business`                                                                          NA
## `SourceInside NoVA`                                                                                      NA
## `SourceInside Trade`                                                                                     NA
## `SourceInside Tucson Business`                                                                           NA
## `SourceInside World Football`                                                                            NA
## `SourceInsideClimate News`                                                                               NA
## SourceInsideHalton.com                                                                                   NA
## `SourceInsider Louisville (press release) (registration)`                                                NA
## `SourceInsider Media`                                                                                    NA
## `SourceInsider Monkey (blog)`                                                                            NA
## `SourceInsider Trading Report`                                                                           NA
## SourceInsideSources                                                                                      NA
## `SourceInsight via Yahoo Canada Finance`                                                                 NA
## `SourceInstitute for Defence Studies and Analyses`                                                       NA
## `SourceInstitutional Investor`                                                                           NA
## `SourceInstitutional Investor (blog)`                                                                    NA
## SourceInStyle                                                                                            NA
## `SourceInsurance Journal`                                                                                NA
## `SourceIntelligence & Terrorism Information Center`                                                      NA
## `SourceIntelligence Online (subscription)`                                                               NA
## `SourceInter Press Service`                                                                              NA
## `SourceInteractive Investor`                                                                             NA
## SourceInterAksyon                                                                                        NA
## SourceInterfax                                                                                           NA
## `SourceIntermountain Jewish News`                                                                        NA
## `SourceInternational Adviser`                                                                            NA
## `SourceInternational Business Times`                                                              0.000e+00
## `SourceInternational Business Times AU`                                                                  NA
## `SourceInternational Business Times UK`                                                           0.000e+00
## `SourceInternational Business Times via Yahoo UK & Ireland News`                                  0.000e+00
## `SourceInternational Business Times, India Edition`                                                      NA
## `SourceInternational Business Times, Singapore Edition`                                                  NA
## `SourceInternational Chamber of Commerce`                                                                NA
## `SourceInternational Falls Journal`                                                                      NA
## `SourceInternational Federation of Red Cross and Red Crescent Societies`                                 NA
## `SourceInternational Herald Tribune`                                                                     NA
## `SourceInternational Middle East Media Center`                                                           NA
## `SourceInternational Monetary Fund`                                                                      NA
## `SourceInternational New York Times`                                                                     NA
## `SourceInternational Paralymic Committee`                                                                NA
## `SourceInternational Solidarity Movement`                                                                NA
## SourceinTheBay                                                                                           NA
## `SourceIntifada Palestine`                                                                               NA
## SourceInverse                                                                                            NA
## SourceInvestCorrectly                                                                                    NA
## SourceInvesting.com                                                                                      NA
## `SourceInvestment Executive`                                                                             NA
## `SourceInvestment U`                                                                                     NA
## `SourceInvestment Week`                                                                                  NA
## SourceInvestmentNews                                                                                     NA
## SourceInvestopedia                                                                                       NA
## `SourceInvestor's Business Daily`                                                                        NA
## `SourceInvestor Newswire`                                                                                NA
## SourceInvestorGuide                                                                                      NA
## `SourceInvestorIdeas.com (press release)`                                                                NA
## SourceInvestorplace.com                                                                                  NA
## `SourceInvestors Chronicle`                                                                              NA
## Sourceio9                                                                                                NA
## `SourceIoT Evolution World (blog)`                                                                       NA
## `SourceIoT Hub`                                                                                          NA
## `SourceIowa City Press Citizen`                                                                          NA
## `SourceiPolitics.ca (subscription)`                                                                      NA
## SourceiProgrammer                                                                                        NA
## `SourceIpsos News & Polls (subscription)`                                                                NA
## `SourceIpswich Star`                                                                                     NA
## SourceIPWatchdog.com                                                                                     NA
## `SourceIRA Market Report`                                                                                NA
## `SourceIran News Update`                                                                                 NA
## SourceIRINnews.org                                                                                       NA
## `SourceIrish Building Magazine`                                                                          NA
## `SourceIrish Examiner`                                                                                   NA
## `SourceIrish Independent`                                                                                NA
## `SourceIrish Legal News`                                                                                 NA
## `SourceIrish Mirror`                                                                                     NA
## `SourceIrish Times`                                                                                      NA
## SourceIrishCentral                                                                                       NA
## `SourceIrvine World News`                                                                                NA
## `SourceIs stories`                                                                                       NA
## SourceiSchoolGuide                                                                                       NA
## `SourceIsland Packet`                                                                                    NA
## `SourceIsland Sun`                                                                                       NA
## SourceISM                                                                                                NA
## SourceISPreview                                                                                          NA
## `SourceIsrael Hayom`                                                                                     NA
## `Sourceisrael heute ltd.`                                                                                NA
## `SourceIsrael Today`                                                                                     NA
## SourceIsraelValley                                                                                       NA
## SourceIsthmus                                                                                            NA
## `SourceIT Business Edge`                                                                                 NA
## `SourceIT Business Edge (blog)`                                                                          NA
## `SourceiT News`                                                                                          NA
## `SourceiT News (blog)`                                                                                   NA
## `SourceIT News Africa`                                                                                   NA
## `SourceIT PRO`                                                                                           NA
## `SourceIT World`                                                                                         NA
## `SourceIT World Canada`                                                                                  NA
## `SourceIT World Canada (blog)`                                                                           NA
## SourceITBusiness.ca                                                                                      NA
## `SourceiTech Post`                                                                                       NA
## `SourceIthaca Journal`                                                                                   NA
## SourceITProPortal                                                                                        NA
## `SourceITS International`                                                                                NA
## `SourceITV News`                                                                                         NA
## SourceITV.com                                                                                            NA
## SourceITWeb                                                                                              NA
## SourceiTWire                                                                                             NA
## `SourceiTWire (press release)`                                                                           NA
## SourceITworld                                                                                            NA
## `SourceJ-Wire Jewish Australian News Service`                                                            NA
## `SourceJ Weekly`                                                                                         NA
## `SourceJacaranda FM`                                                                                     NA
## `SourceJackson Clarion Ledger`                                                                           NA
## `SourceJackson Free Press`                                                                               NA
## `SourceJackson Hole News & Guide`                                                                        NA
## `SourceJackson Sun`                                                                                      NA
## `SourceJacksonville Business Journal`                                                                    NA
## `SourceJacksonville Daily Progress`                                                                      NA
## `SourceJacksonville Journal Courier`                                                                     NA
## `SourceJacobin magazine`                                                                                 NA
## SourceJadaliyya                                                                                          NA
## `SourceJakarta Globe`                                                                                    NA
## `SourceJakarta Post`                                                                                     NA
## SourceJalopnik                                                                                           NA
## `SourceJamaica Gleaner`                                                                                  NA
## `SourceJamaica Observer`                                                                                 NA
## `SourceJamestown Sun`                                                                                    NA
## `SourceJanesville Gazette`                                                                               NA
## `SourceJapan Today`                                                                                      NA
## `SourceJefferson City News Tribune`                                                                      NA
## `SourceJerusalem Center for Public Affairs`                                                              NA
## `SourceJerusalem Post Israel News`                                                                       NA
## `SourceJerusalem Post Israel News (blog)`                                                                NA
## `SourceJeune Afrique`                                                                                    NA
## `SourceJewish Business News`                                                                             NA
## `SourceJewish Chronicle`                                                                                 NA
## `SourceJewish Ledger`                                                                                    NA
## `SourceJewish Link of New Jersey`                                                                        NA
## `SourceJewish News`                                                                                      NA
## `SourceJewish Post`                                                                                      NA
## `SourceJewish Telegraphic Agency`                                                                        NA
## SourceJewschool                                                                                          NA
## SourceJezebel                                                                                            NA
## SourceJNS.org                                                                                            NA
## `SourceJobs & Hire`                                                                                      NA
## SourceJOC.com                                                                                            NA
## SourceJOE                                                                                                NA
## SourceJOE.co.uk                                                                                          NA
## `SourceJohannesburg Sunday World`                                                                        NA
## `SourceJohnson City Press`                                                                               NA
## `SourceJoplin Globe`                                                                                     NA
## `SourceJordan Times`                                                                                     NA
## `SourceJournal and Courier`                                                                              NA
## `SourceJournal Gazette and Times-Courier`                                                                NA
## `SourceJournal of Turkish Weekly`                                                                        NA
## `SourceJournal Online`                                                                                   NA
## `SourceJournal Pioneer`                                                                                  NA
## `SourceJournal Times`                                                                                    NA
## SourceJournalism.co.uk                                                                                   NA
## `SourceJP Updates`                                                                                       NA
## `SourceJspace News`                                                                                      NA
## `SourceJuneau Empire (subscription)`                                                                     NA
## `SourceJunior College`                                                                                   NA
## SourceJunkee                                                                                             NA
## SourceJURIST                                                                                             NA
## `Sourcejust-style.com (subscription)`                                                                    NA
## `SourceJust International`                                                                               NA
## `SourceJust Jared`                                                                                       NA
## `SourceJust Security`                                                                                    NA
## SourceJustmeans                                                                                          NA
## `SourceJustmeans (blog)`                                                                                 NA
## SourceJweekly.com                                                                                        NA
## `SourceK24 TV`                                                                                           NA
## `SourceKABC-TV`                                                                                          NA
## `SourceKABC-TV Los Angeles`                                                                              NA
## `SourceKaiser Family Foundation`                                                                         NA
## SourceKAKE                                                                                               NA
## SourceKALW                                                                                               NA
## SourceKanglaOnline                                                                                       NA
## `SourceKankakee Daily Journal`                                                                           NA
## `SourceKansas City Business Journal`                                                                     NA
## `SourceKansas City InfoZine`                                                                             NA
## `SourceKansas City Star`                                                                                 NA
## `SourceKansas City Star (blog)`                                                                          NA
## SourceKAPP                                                                                               NA
## SourceKARE                                                                                               NA
## SourceKARK                                                                                               NA
## `SourceKashmir Life`                                                                                     NA
## `SourceKashmir Media Service`                                                                            NA
## `SourceKashmir Reader`                                                                                   NA
## `SourceKashmir Watch`                                                                                    NA
## `SourceKasmir Monitor`                                                                                   NA
## `SourceKATC Lafayette News`                                                                              NA
## SourceKathimerini                                                                                        NA
## `SourceKathmandu Post`                                                                                   NA
## `SourceKatib\\u009d\\u009dn`                                                                             NA
## `SourceKatoikos.eu (satire) (registration) (blog)`                                                       NA
## SourceKATU                                                                                               NA
## SourceKATV                                                                                               NA
## `SourceKaufman Herald`                                                                                   NA
## `SourceKAUZ-TV`                                                                                          NA
## `SourceKawartha Media Group`                                                                             NA
## `SourceKawowo Sports`                                                                                    NA
## `SourceKBS WORLD Radio News`                                                                             NA
## SourceKBTX                                                                                               NA
## `SourceKBTX 3 Bryan - College Station`                                                                   NA
## `SourceKCBD-TV Lubbock`                                                                                  NA
## `SourceKCCI 8 Des Moines`                                                                                NA
## `SourceKCCI Des Moines`                                                                                  NA
## `SourceKCEN-TV`                                                                                          NA
## SourceKCET                                                                                               NA
## `SourceKCRA 3 Sacramento`                                                                                NA
## `SourceKCRA Sacramento`                                                                                  NA
## SourceKCRG                                                                                               NA
## `SourceKCTV 5 Kansas City`                                                                               NA
## `SourceKDLT News`                                                                                        NA
## SourceKdminer                                                                                            NA
## SourceKDramaStars                                                                                        NA
## `SourceKearney Hub`                                                                                      NA
## `SourceKELO AM-FM`                                                                                       NA
## `SourceKELOLAND TV`                                                                                      NA
## `SourceKelowna Capital News`                                                                             NA
## `SourceKenai Peninsula Online`                                                                           NA
## `SourceKennebec Journal & Morning Sentinel`                                                              NA
## `SourceKENS 5 TV`                                                                                        NA
## `SourceKent Online`                                                                                      NA
## `SourceKERA News`                                                                                        NA
## `SourceKERA North Texas`                                                                                 NA
## `SourceKern Golden Empire`                                                                               NA
## SourceKESQ                                                                                               NA
## `SourceKETV 7 Omaha`                                                                                     NA
## `SourceKETV Omaha`                                                                                       NA
## `SourceKEVN Black Hills Fox`                                                                             NA
## `SourceKewanee Star Courier`                                                                             NA
## `SourceKEYE TV`                                                                                          NA
## SourceKEYT                                                                                               NA
## SourceKFDA                                                                                               NA
## `SourceKFDA-TV Amarillo`                                                                                 NA
## SourceKFDI                                                                                               NA
## SourceKFGO                                                                                               NA
## Sourcekfor.com                                                                                           NA
## `SourceKFOX 14 El Paso`                                                                                  NA
## `SourceKFOX El Paso`                                                                                     NA
## `SourceKFSM Ft. Smith-Fayetteville`                                                                      NA
## `SourceKFSN-TV`                                                                                          NA
## `SourceKFSN-TV Fresno`                                                                                   NA
## SourceKFVS                                                                                               NA
## SourceKgab                                                                                               NA
## `SourceKGBT-TV`                                                                                          NA
## SourceKGMI                                                                                               NA
## SourceKGNS.tv                                                                                            NA
## `SourceKGO-TV`                                                                                           NA
## `SourceKGO-TV Bay Area`                                                                                  NA
## SourceKGOU                                                                                               NA
## `SourceKGTV San Diego`                                                                                   NA
## Sourcekgw.com                                                                                            NA
## `SourceKhaama Press (press release) (blog)`                                                              NA
## `SourceKhaleej Times`                                                                                    NA
## `SourceKhaleej Times via Yahoo Maktoob News`                                                             NA
## `SourceKHBS - KHOG Fort Smith - Fayetteville`                                                            NA
## SourceKHON2                                                                                              NA
## SourceKHOU                                                                                               NA
## SourceKHOU.com                                                                                           NA
## `SourceKHQ Right Now`                                                                                    NA
## `SourceKHQ Spokane`                                                                                      NA
## `SourceKiama Independent`                                                                                NA
## SourceKicker                                                                                             NA
## `SourceKIII TV3`                                                                                         NA
## `SourceKilgore News Herald`                                                                              NA
## `SourceKill Screen (blog)`                                                                               NA
## `SourceKilleen Daily Herald`                                                                             NA
## `SourceKIMT 3`                                                                                           NA
## SourceKING5.com                                                                                          NA
## SourceKIONrightnow.com                                                                                   NA
## `SourceKiplinger Personal Finance`                                                                       NA
## SourceKiplinger.com                                                                                      NA
## `SourceKipp Report`                                                                                      NA
## `SourceKIRO 7 Seattle-Tacoma`                                                                            NA
## `SourceKIRO Seattle`                                                                                     NA
## `SourceKitchener - Waterloo Record`                                                                      NA
## SourceKitGuru                                                                                            NA
## `SourceKitsap Sun`                                                                                       NA
## `SourceKITV Honolulu`                                                                                    NA
## `SourceKKTV 11 Colorado Springs`                                                                         NA
## `SourceKKTV 11 News`                                                                                     NA
## `SourceKLAS-TV`                                                                                          NA
## SourceKLTV                                                                                               NA
## `SourceKLTV 7 Tyler`                                                                                     NA
## `SourceKMBC-TV Kansas City`                                                                              NA
## `SourceKMBC Kansas City`                                                                                 NA
## SourceKMOV.com                                                                                           NA
## SourceKMUW                                                                                               NA
## `SourceKMWorld Magazine`                                                                                 NA
## `SourceKNBN Rapid City`                                                                                  NA
## Sourceknopnews2                                                                                          NA
## `SourceKnow Your Mobile`                                                                                 NA
## `SourceKnowledge at Wharton`                                                                             NA
## `SourceKnowledge Wharton Today`                                                                          NA
## `SourceKnowledge@Wharton`                                                                                NA
## `SourceKnowTechie (blog)`                                                                                NA
## `SourceKnoxville News Sentinel`                                                                          NA
## `SourceKOAA.com Colorado Springs and Pueblo News`                                                        NA
## `SourceKOAM-TV`                                                                                          NA
## `SourceKOAM-TV Pittsburg`                                                                                NA
## `SourceKOAT Albuquerque`                                                                                 NA
## `SourceKOB 4 Albuquerque`                                                                                NA
## SourceKOB.com                                                                                            NA
## `SourceKOBI-TV NBC5 / KOTI-TV NBC2`                                                                      NA
## `SourceKOCO 5 Oklahoma City`                                                                             NA
## `SourceKOCO Oklahoma City`                                                                               NA
## `SourceKokomo Tribune`                                                                                   NA
## `SourceKOLD News 13 Tuscon`                                                                              NA
## SourceKOLO                                                                                               NA
## `SourceKOLO 8 Reno`                                                                                      NA
## SourceKomando                                                                                            NA
## `SourceKOMO News`                                                                                        NA
## `SourceKOMO Seattle`                                                                                     NA
## `SourceKOMU Columbia`                                                                                    NA
## `SourceKorea JoongAng Daily`                                                                             NA
## `SourceKorea Portal (English Edition)`                                                                   NA
## `SourceKorea Times`                                                                                      NA
## SourceKOSU                                                                                               NA
## SourceKotaku                                                                                             NA
## `SourceKotaku Australia`                                                                                 NA
## SourceKotatv                                                                                             NA
## `SourceKPAX-TV`                                                                                          NA
## SourceKPBS                                                                                               NA
## `SourceKPBS San Diego`                                                                                   NA
## `SourceKPCC Pasadena`                                                                                    NA
## `Sourcekpfa 94.1fm`                                                                                      NA
## `SourceKPHO Phoenix`                                                                                     NA
## `SourceKPLR 11 St. Louis`                                                                                NA
## `SourceKPLU News for Seattle and the Northwest`                                                          NA
## `SourceKPRC Houston`                                                                                     NA
## `SourceKPRC Local 2 Houston`                                                                             NA
## `SourceKPVI News 6`                                                                                      NA
## SourceKQED                                                                                               NA
## SourceKRBD                                                                                               NA
## SourceKRCRTV.COM                                                                                         NA
## SourceKRDO                                                                                               NA
## `SourceKRDO Colorado Springs`                                                                            NA
## `SourceKrebs on Security`                                                                                NA
## SourceKRGV                                                                                               NA
## `SourceKRIS Corpus Christi News`                                                                         NA
## `SourceKRNV My News 4`                                                                                   NA
## SourceKRON4.com                                                                                          NA
## `SourceKRQE & KASA FOX 2 Albuquerque`                                                                    NA
## `SourceKRQE News 13`                                                                                     NA
## `SourceKRTV Great Falls News`                                                                            NA
## `SourceKSAT San Antonio`                                                                                 NA
## `SourceKSBY San Luis Obispo News`                                                                        NA
## SourceKSDK                                                                                               NA
## SourceKSDK.com                                                                                           NA
## SourceKSHB                                                                                               NA
## `SourceKSHB-TV Kansas City`                                                                              NA
## SourceKSL.com                                                                                            NA
## `SourceKSLA-TV`                                                                                          NA
## `SourceKSLA-TV Shreveport`                                                                               NA
## `SourceKSNT (press release) (registration) (blog)`                                                       NA
## SourceKSPR                                                                                               NA
## SourceKSWO                                                                                               NA
## `SourceKSWO Lawton-Wichita Falls`                                                                        NA
## SourceKTAL                                                                                               NA
## `SourceKTAL Shreveport`                                                                                  NA
## SourceKTAR.com                                                                                           NA
## SourceKTBS                                                                                               NA
## SourceKTIC                                                                                               NA
## SourceKTLA                                                                                               NA
## SourceKTOO                                                                                               NA
## SourceKTRE                                                                                               NA
## `SourceKTRE Lufkin and Nacogdoches`                                                                      NA
## `SourceKTRK-TV`                                                                                          NA
## `SourceKTTC Rochester`                                                                                   NA
## `SourceKTTS 94.7`                                                                                        NA
## SourceKTUL                                                                                               NA
## SourceKTUU.com                                                                                           NA
## `SourceKTVA.com - Anchorage, Alaska`                                                                     NA
## SourceKTVB                                                                                               NA
## SourceKTVB.com                                                                                           NA
## SourceKTVN                                                                                               NA
## `SourceKTVN Reno`                                                                                        NA
## `SourceKTVQ Billings News`                                                                               NA
## `SourceKTVU San Francisco`                                                                               NA
## SourceKTVZ                                                                                               NA
## SourceKTXS                                                                                               NA
## `SourceKuensel, Buhutan's National Newspaper`                                                            NA
## `SourceKUOW News and Information`                                                                        NA
## SourceKUT                                                                                                NA
## `SourceKUTV 2News`                                                                                       NA
## `SourceKuwait News Agency`                                                                               NA
## `SourceKuwait Times`                                                                                     NA
## `SourceKVOA Tucson News`                                                                                 NA
## SourceKVUE                                                                                               NA
## SourceKVUE.com                                                                                           NA
## Sourcekwbe                                                                                               NA
## SourceKWCH                                                                                               NA
## `SourceKWQC-TV6`                                                                                         NA
## `SourceKWTV News9`                                                                                       NA
## Sourcekwwl.com                                                                                           NA
## `SourceKX TV North Dakota`                                                                               NA
## SourceKXAN.com                                                                                           NA
## `SourceKXLH Helena News`                                                                                 NA
## SourceKXNet.com                                                                                          NA
## `SourceKXXV News Channel 25`                                                                             NA
## `SourceKXXV Waco`                                                                                        NA
## SourceKY3                                                                                                NA
## `SourceKyiv Post`                                                                                        NA
## `SourceKYIV Post`                                                                                        NA
## `SourceKykernel.com (subscription)`                                                                      NA
## SourceKYMA                                                                                               NA
## SourceKYTX                                                                                               NA
## SourceKYUK                                                                                               NA
## `SourceL'Express`                                                                                        NA
## `SourceL'Expression`                                                                                     NA
## `SourceL'Humanit\\u009d\\u009d`                                                                          NA
## `SourceL'Humanité`                                                                                       NA
## `SourceL'info en direct d'Isra\\u009d\\u009dl 24h/24 (Communiqu\\u009d\\u009d de presse) (Blog)`         NA
## `SourceL'Orient-Le Jour`                                                                                 NA
## `SourceL&#39;Atelier`                                                                                    NA
## `SourceL.A. Biz`                                                                                         NA
## `SourceL.A. Weekly`                                                                                      NA
## `SourceLa Croix`                                                                                         NA
## `SourceLa Crosse Tribune`                                                                                NA
## `SourceLA Daily News`                                                                                    NA
## SourceLabourList                                                                                         NA
## Sourceladepeche.fr                                                                                       NA
## `SourceLadysmith Gazette`                                                                                NA
## SourceLAist                                                                                              NA
## `SourceLake Cowichan Gazette`                                                                            NA
## `SourceLake Tahoe News`                                                                                  NA
## SourceLakenewsonline.com                                                                                 NA
## `SourceLakeshore Public Media`                                                                           NA
## `SourceLamorinda Sun`                                                                                    NA
## `SourceLancashire Evening Post`                                                                          NA
## `SourceLancashire Telegraph`                                                                             NA
## `SourceLancaster Eagle Gazette`                                                                          NA
## `SourceLancaster Today`                                                                                  NA
## SourceLancasterOnline                                                                                    NA
## `SourceLanka Business Online`                                                                            NA
## `SourceLansing State Journal`                                                                            NA
## `SourceLaptop Mag`                                                                                       NA
## `SourceLas Cruces Sun-News`                                                                              NA
## `SourceLas Vegas Review-Journal`                                                                         NA
## `SourceLas Vegas Review-Journal (blog)`                                                                  NA
## `SourceLas Vegas Sun`                                                                                    NA
## `SourceLast Night On`                                                                                    NA
## `SourceLatin American Herald Tribune`                                                                    NA
## `SourceLatin Correspondent`                                                                              NA
## `SourceLatin Post`                                                                                       NA
## `SourceLatin Times`                                                                                      NA
## `SourceLatino Post`                                                                                      NA
## `SourceLatinos Post`                                                                                     NA
## `SourceLawfare (blog)`                                                                                   NA
## SourceLawNewz                                                                                            NA
## `SourceLawrence Berkeley National Laboratory`                                                            NA
## `SourceLawrence Journal-World`                                                                           NA
## `SourceLawrence Journal World`                                                                           NA
## `SourceLawrence Journal World (blog)`                                                                    NA
## `SourceLawyer Herald`                                                                                    NA
## `SourceLayman Online`                                                                                    NA
## SourceLazygamer                                                                                          NA
## `SourceLBC 97.3`                                                                                         NA
## `SourceLe Club de Mediapart (Blog)`                                                                      NA
## `SourceLe Figaro`                                                                                        NA
## `SourceLe Grand Soir.info`                                                                               NA
## `SourceLe Mauricien`                                                                                     NA
## `SourceLe Mirabel`                                                                                       NA
## `SourceLe Monde`                                                                                         NA
## `SourceLe Monde Diplomatique`                                                                            NA
## `SourceLe Monde Diplomatique (blog)`                                                                     NA
## `SourceLe Parisien`                                                                                      NA
## `SourceLe Soleil`                                                                                        NA
## `SourceLe T\\u009d\\u009dl\\u009d\\u009dgramme`                                                          NA
## `SourceLeader-Telegram`                                                                                  NA
## `SourceLeader Journal`                                                                                   NA
## `SourceLeaders Tunisie`                                                                                  NA
## `SourceLeadership Newspapers`                                                                            NA
## SourceLeafly                                                                                             NA
## `SourceLeamington Courier`                                                                               NA
## SourceLearnBonds                                                                                         NA
## SourceLEDinside                                                                                          NA
## `SourceLee's Summit Journal`                                                                             NA
## `SourceLeek Post & Times`                                                                                NA
## `SourceLeesville Daily Leader`                                                                           NA
## SourceLeFaso.net                                                                                         NA
## `SourceLeft Foot Forward`                                                                                NA
## `SourceLeftLane News`                                                                                    NA
## `Sourcelegal Insurrection (blog)`                                                                        NA
## `SourceLehigh Valley Business`                                                                           NA
## Sourcelehighvalleylive.com                                                                               NA
## `SourceLeicester Mercury`                                                                                NA
## SourceleJDD.fr                                                                                           NA
## SourceleJSD                                                                                              NA
## `SourceLet Me Know About This`                                                                           NA
## `SourceLethbridge Herald`                                                                                NA
## Sourceletsrecycle.com                                                                                    NA
## `SourceLexington Herald-Leader`                                                                          NA
## `SourceLexington Herald Leader`                                                                          NA
## `SourceLexology (registration)`                                                                          NA
## `SourceLGBTQ Nation`                                                                                     NA
## `SourceLiberal Democrat Voice`                                                                           NA
## SourceLiberation                                                                                         NA
## `SourceLiberian Daily Observer`                                                                          NA
## `SourceLiberty News Now`                                                                                 NA
## SourceLifehacker                                                                                         NA
## `SourceLifehacker Australia`                                                                             NA
## `SourceLifehacker UK`                                                                                    NA
## SourceLifeNews.com                                                                                       NA
## SourceLifesite                                                                                           NA
## SourceLifestyles                                                                                         NA
## SourceLifeZette                                                                                          NA
## `SourceLight Reading`                                                                                    NA
## SourceLiliputing                                                                                         NA
## `SourceLim Kit Siang`                                                                                    NA
## `SourceLimerick Post`                                                                                    NA
## `SourceLincoln Journal Star`                                                                             NA
## `SourceLincolnshire Echo`                                                                                NA
## `SourceLinkedIn (blog)`                                                                                  NA
## `SourceLinn's Stamp News`                                                                                NA
## SourceLinux                                                                                              NA
## `SourceLinux Journal`                                                                                    NA
## `SourceLinux Today`                                                                                      NA
## `SourceLinux.com (blog)`                                                                                 NA
## SourceLinuxInsider.com                                                                                   NA
## `SourceLion's Roar`                                                                                      NA
## `SourceLisbon Morning Journal`                                                                           NA
## `SourceLive 5 News Charleston`                                                                           NA
## `SourceLive Science`                                                                                     NA
## `SourceLive Trading News`                                                                                NA
## SourceLivemint                                                                                           NA
## `SourceLiverpool Echo`                                                                                   NA
## `SourceLiveScience.com via Yahoo! News`                                                                  NA
## `SourceLivingston Daily`                                                                                 NA
## SourceLLRX.com                                                                                           NA
## SourceLobeLog                                                                                            NA
## `SourceLocal 10`                                                                                         NA
## `SourceLocal 10 Miami`                                                                                   NA
## `SourceLocal 6 Orlando`                                                                                  NA
## `SourceLocal 8 Now`                                                                                      NA
## SourceLocalNews8.com                                                                                     NA
## `SourceLockport Union-Sun & Journal`                                                                     NA
## `SourceLogistics Management`                                                                             NA
## `SourceLompoc Record`                                                                                    NA
## `SourceLondon Evening Standard`                                                                          NA
## `SourceLondon Free Press`                                                                                NA
## `SourceLondon Loves Business`                                                                            NA
## `SourceLondon Review of Books (subscription)`                                                            NA
## `SourceLondon School of Business and Finance (blog)`                                                     NA
## `SourceLondon South East (registration) (blog)`                                                          NA
## SourceLondon24                                                                                           NA
## `SourceLondonderry Today`                                                                                NA
## SourceLondonist                                                                                          NA
## `SourceLong Beach Press Telegram`                                                                        NA
## `SourceLong Island Business News`                                                                        NA
## `SourceLong Island Business News (subscription)`                                                         NA
## `SourceLong War Journal`                                                                                 NA
## `SourceLongview Daily News`                                                                              NA
## `SourceLongview News-Journal`                                                                            NA
## `SourceLonoke News`                                                                                      NA
## `SourceLos Angeles Business Journal`                                                                     NA
## `SourceLos Angeles Daily News`                                                                           NA
## `SourceLos Angeles Sun Times`                                                                            NA
## `SourceLos Angeles Times`                                                                                NA
## `SourceLost Coast Outpost`                                                                               NA
## SourceLoudwire                                                                                           NA
## `SourceLowell Sun`                                                                                       NA
## SourceLubbockOnline.com                                                                                  NA
## `SourceLudwig von Mises Institute`                                                                       NA
## `SourceLusaka Times`                                                                                     NA
## `SourceLuton Today`                                                                                      NA
## `SourceLuxemburger Wort - English Edition`                                                               NA
## `SourceLuxury Daily`                                                                                     NA
## `SourceLynchburg News and Advance`                                                                       NA
## `SourceLynn News`                                                                                        NA
## `SourceM\\u009d\\u009ddecins Sans Fronti\\u009d\\u009dres (MSF) International`                           NA
## `SourceM\\u009d\\u009ddias-Presse-Info`                                                                  NA
## `SourceM\\u009d\\u009dtro Montr\\u009d\\u009dal`                                                         NA
## `SourceMac Kung Fu (satire) (blog)`                                                                      NA
## `SourceMac Rumors`                                                                                       NA
## `SourceMacau Daily Times`                                                                                NA
## SourceMacDailyNews                                                                                       NA
## `SourceMackay Daily Mercury`                                                                             NA
## SourceMacleans.ca                                                                                        NA
## SourceMacNN                                                                                              NA
## `SourceMacroBusiness (blog)`                                                                             NA
## SourceMacworld                                                                                           NA
## `SourceMacworld (blog)`                                                                                  NA
## `SourceMacworld UK`                                                                               1.000e-03
## `SourceMadame Figaro`                                                                                    NA
## `SourceMadame Noire`                                                                                     NA
## SourceMadameNoire                                                                                        NA
## SourceMadison.com                                                                                        NA
## `SourceMaidenhead Advertiser`                                                                            NA
## `SourceMail & Guardian`                                                                                  NA
## `SourceMail & Guardian Africa`                                                                           NA
## `SourceMail & Guardian Online`                                                                           NA
## `SourceMail Today via Yahoo! India News`                                                                 NA
## `SourceMain Line Times`                                                                                  NA
## `SourceMaine Public Broadcasting`                                                                        NA
## SourceMainStreet                                                                                         NA
## `SourceMaison des Droits de l'Homme de Limoges`                                                          NA
## SourceMakeUseOf                                                                                          NA
## SourceMalawi24                                                                                           NA
## `SourceMalay Mail Online`                                                                                NA
## `SourceMalaysia Chronicle`                                                                               NA
## `SourceMalaysiakini (subscription)`                                                                      NA
## `SourceMalaysian Digest`                                                                                 NA
## Sourcemalaysiandigest.com                                                                                NA
## `SourceMalta Independent Online`                                                                         NA
## `SourceMalta Independent Online (blog)`                                                                  NA
## `SourceMalta Star`                                                                                       NA
## SourceMaltaToday                                                                                         NA
## `SourceMaltaToday (blog)`                                                                                NA
## `SourceManagement Today`                                                                                 NA
## `SourceManawatu Standard`                                                                                NA
## `SourceManchester Evening News`                                                                          NA
## `SourceManila Bulletin`                                                                                  NA
## `SourceManila Standard Today`                                                                            NA
## `SourceMankato Free Press`                                                                               NA
## `SourceMansfield News Journal`                                                                           NA
## SourceManufacturing.net                                                                                  NA
## `SourceManx Radio`                                                                                       NA
## `SourceMaple Ridge News`                                                                                 NA
## `SourceMaple Ridge Times`                                                                                NA
## SourceMarca                                                                                              NA
## `SourceMarie Claire Australia`                                                                           NA
## SourceMarieClaire.com                                                                                    NA
## `SourceMarine Corps Times`                                                                               NA
## SourceMarineLink                                                                                         NA
## `SourceMarket Exclusive`                                                                                 NA
## `SourceMarket Realist`                                                                                   NA
## `SourceMarket Realist via Yahoo Canada Finance`                                                          NA
## `SourceMarket Realist via Yahoo UK & Ireland Finance`                                                    NA
## `SourceMarket Realist via Yahoo! Finance`                                                         1.000e-03
## `SourceMarket Realist via Yahoo! Finance India`                                                          NA
## `SourceMarket Realist via Yahoo! New Zealand Finance`                                                    NA
## `SourceMarket Realist via Yahoo!7 Finance`                                                               NA
## `SourceMarket Watch`                                                                                     NA
## SourceMarketing                                                                                          NA
## `SourceMarketing Interactive`                                                                            NA
## `SourceMarketing Land`                                                                                   NA
## `SourceMarketing magazine Australia (registration)`                                                      NA
## `SourceMarketingProfs.com (subscription)`                                                                NA
## SourceMarketplace.org                                                                                    NA
## `SourceMarketPulse (blog)`                                                                               NA
## `SourceMarkets Daily`                                                                                    NA
## `SourceMarkets Morning`                                                                                  NA
## SourceMarketWatch                                                                                        NA
## `SourceMarketWatch (blog)`                                                                               NA
## `SourceMarketWatch via Yahoo Canada Finance`                                                             NA
## `SourceMarketWatch via Yahoo UK & Ireland Finance`                                                       NA
## `SourceMarketWatch via Yahoo! Finance`                                                                   NA
## `SourceMarketWatch via Yahoo! Finance India`                                                             NA
## `SourceMarketWatch via Yahoo! New Zealand Finance`                                                       NA
## `SourceMarketWatch via Yahoo! News`                                                                      NA
## `SourceMarketWatch via Yahoo!7 Finance`                                                                  NA
## SourceMarketwire                                                                                         NA
## `SourceMarketwired (press release)`                                                                      NA
## `SourceMarketwired via Yahoo Canada Finance`                                                             NA
## `SourceMarketwired via Yahoo UK & Ireland Finance`                                                       NA
## `SourceMarketwired via Yahoo! Finance`                                                                   NA
## `SourceMarlborough Express`                                                                              NA
## `SourceMarquette Wire`                                                                                   NA
## `SourceMarTech Advisor`                                                                                  NA
## `SourceMartins Ferry Times Leader`                                                                       NA
## `SourceMartinsburg Journal`                                                                              NA
## `SourceMaryland Daily Record (subscription)`                                                             NA
## SourceMashable                                                                                    0.000e+00
## `SourceMashable Tech via Yahoo UK & Ireland News`                                                        NA
## `SourceMashable via Yahoo Canada News`                                                                   NA
## `SourceMashable via Yahoo! News`                                                                         NA
## `SourceMason City Globe Gazette`                                                                         NA
## `SourceMass Device`                                                                                      NA
## SourceMassLive.com                                                                                       NA
## `SourceMasterstudies News (blog)`                                                                        NA
## `SourceMaterial Handling & Logistics`                                                                    NA
## `SourceMaui Now`                                                                                         NA
## `SourceMaximum PC`                                                                                       NA
## `SourceMcClatchy Washington Bureau`                                                                      NA
## SourceMCV                                                                                                NA
## `SourceMeadville Tribune`                                                                                NA
## `SourceMeat and Poultry Online`                                                                          NA
## `SourceMed Device Online (press release)`                                                                NA
## `SourceMedCity News`                                                                                     NA
## `SourceMedia Life Magazine`                                                                              NA
## `SourceMedia Matters for America`                                                                        NA
## `SourceMedia Matters for America (blog)`                                                                 NA
## SourceMediaite                                                                                           NA
## SourceMediapart                                                                                          NA
## SourceMediaPost                                                                                          NA
## `SourceMediaPost Communications`                                                                         NA
## `SourceMedical Daily`                                                                                    NA
## `SourceMedical Xpress`                                                                                   NA
## `SourceMedicine Hat News`                                                                                NA
## SourceMedicineNet.com                                                                                    NA
## `SourceMedill Reports: Chicago`                                                                          NA
## `SourceMedPage Today`                                                                                    NA
## `SourceMEED (subscription)`                                                                              NA
## SourceMegaGames                                                                                          NA
## `SourceMehr News Agency - English Version`                                                               NA
## SourceMemeburn                                                                                           NA
## `SourceMemorial Examiner`                                                                                NA
## `SourceMemphis Business Journal`                                                                         NA
## `SourceMemphis Business Journal (blog)`                                                                  NA
## `SourceMemphis Commercial Appeal`                                                                        NA
## `SourceMemphis Daily News (blog)`                                                                        NA
## `SourceMemphis Flyer`                                                                                    NA
## `SourceMen's News Daily`                                                                                 NA
## `SourceMen&#39;s Journal Tech via Yahoo! News`                                                           NA
## SourceMENAFN                                                                                      0.000e+00
## SourceMENAFN.COM                                                                                         NA
## `SourceMennonite World Review`                                                                           NA
## SourceMensquare                                                                                          NA
## `SourceMerced Sun-Star`                                                                                  NA
## SourceMercoPress                                                                                         NA
## `SourceMercury Daily (blog)`                                                                             NA
## `SourceMeriden Record-Journal`                                                                           NA
## `SourceMeridian Booster`                                                                                 NA
## `SourceMeridian Star`                                                                                    NA
## SourceMerinews                                                                                           NA
## `SourceMeriTalk (blog)`                                                                                  NA
## `SourceMERRY JANE`                                                                                       NA
## `SourceMetal Injection.net`                                                                              NA
## SourceMetalMiner                                                                                         NA
## SourceMetro                                                                                       1.000e-03
## `SourceMetro Halifax`                                                                                    NA
## `SourceMetro TV News`                                                                                    NA
## SourceMetro.us                                                                                           NA
## `SourceMetroNews Canada`                                                                                 NA
## SourceMetrotvnews.com                                                                                    NA
## `SourceMetroWest Daily News`                                                                             NA
## `SourceMFA China`                                                                                        NA
## `SourceMiami Herald`                                                                                     NA
## `SourceMiami Herald (blog)`                                                                              NA
## `SourceMiami New Times`                                                                                  NA
## SourceMiBiz                                                                                              NA
## SourceMic                                                                                                NA
## Sourcemicebtn                                                                                            NA
## `SourceMichigan Journal`                                                                                 NA
## `SourceMichigan Radio`                                                                                   NA
## `SourceMichigan State University Extension`                                                              NA
## SourceMichronicleonline                                                                                  NA
## `SourceMicroCap Magazine`                                                                                NA
## `SourceMicrogrid Knowledge`                                                                              NA
## SourceMicroScope                                                                                         NA
## `SourceMicrosoft - Channel 9`                                                                            NA
## `SourceMicrosoft - Channel 9 (blog)`                                                                     NA
## `SourceMid-Day`                                                                                          NA
## `SourceMiddle East Confidential`                                                                         NA
## `SourceMiddle East Eye`                                                                                  NA
## `SourceMiddle East Forum`                                                                                NA
## `SourceMiddle East Forum (blog)`                                                                         NA
## `SourceMiddle East Monitor`                                                                              NA
## `SourceMiddle East Monitor (blog)`                                                                       NA
## `SourceMiddle East Newsline`                                                                             NA
## `SourceMiddle East Online`                                                                               NA
## `SourceMiddle East Report Online`                                                                        NA
## `SourceMiddletown Press`                                                                                 NA
## `SourceMidland Daily News`                                                                               NA
## `SourceMidland Reporter-Telegram`                                                                        NA
## `SourceMidlothian Exchange`                                                                              NA
## `SourceMilitary Times`                                                                                   NA
## SourceMilitary.com                                                                                       NA
## `SourceMille Babords (Communiqu\\u009d\\u009d de presse)`                                                NA
## `SourceMilli Gazette`                                                                                    NA
## `SourceMilpitas Post`                                                                                    NA
## `SourceMilwaukee Business Journal`                                                                       NA
## `SourceMilwaukee Journal Sentinel`                                                                       NA
## `SourceMilwaukee Journal Sentinel (blog)`                                                                NA
## SourceMINA                                                                                               NA
## SourceMineweb                                                                                            NA
## `SourceMining Journal (subscription)`                                                                    NA
## `SourceMining MX`                                                                                        NA
## SourceMINING.com                                                                                         NA
## `SourceMinistry of External Affairs (press release)`                                                     NA
## `SourceMinistry of Foreign Affairs of Denmark`                                                           NA
## `SourceMinneapolis-St. Paul Star Tribune`                                                                NA
## `SourceMinneapolis Star Tribune`                                                                         NA
## `SourceMinneapolis Sun Times`                                                                            NA
## `SourceMinnesota Daily`                                                                                  NA
## `SourceMinnesota Public Radio`                                                                           NA
## `SourceMinnesota Public Radio News`                                                                      NA
## SourceMinnPost                                                                                           NA
## `SourceMintpress News (blog)`                                                                            NA
## SourceMinyanville.com                                                                                    NA
## `SourceMirage News`                                                                                      NA
## SourceMirror.co.uk                                                                                       NA
## `SourceMIS Asia`                                                                                         NA
## `SourceMiscellany News`                                                                                  NA
## SourceMississauga                                                                                        NA
## `SourceMississauga News`                                                                                 NA
## `SourceMississippi Business Journal`                                                                     NA
## `SourceMississippi News Now`                                                                             NA
## `SourceMIT News`                                                                                         NA
## `SourceMIT Technology Review`                                                                            NA
## `SourceMitzpeh (press release)`                                                                          NA
## SourceMixmag                                                                                             NA
## `SourceMizzima News`                                                                                     NA
## SourceMLive.com                                                                                          NA
## `SourceMLT News`                                                                                         NA
## SourceMMAjunkie.com                                                                                      NA
## `SourceMmegi Online`                                                                                     NA
## SourceMMH.com                                                                                            NA
## `SourceMNR Daily`                                                                                        NA
## `SourceMo4ch News (press release) (blog)`                                                                NA
## `SourceMoberly Monitor-Index`                                                                            NA
## SourceMobiHealthNews                                                                                     NA
## `SourceMobile & Apps`                                                                                    NA
## `SourceMobile Burn`                                                                                      NA
## `SourceMobile Choice`                                                                                    NA
## `SourceMobile Computing Today`                                                                           NA
## `SourceMobile ID World`                                                                                  NA
## `SourceMobile News`                                                                                      NA
## `SourceMobile Payments Today`                                                                            NA
## `SourceMobile Press-Register`                                                                            NA
## `SourceMobile Today`                                                                                     NA
## `SourceMobile World Live`                                                                                NA
## SourceMobileSyrup.com                                                                                    NA
## SourceMobiPicker                                                                                         NA
## `SourceModel D`                                                                                          NA
## `SourceModern Diplomacy`                                                                                 NA
## `SourceModern Distribution Management`                                                                   NA
## SourceModernHealthcare.com                                                                               NA
## SourceModernMedicine                                                                                     NA
## `SourceModest Money (press release) (blog)`                                                              NA
## `SourceMohave Daily News`                                                                                NA
## `SourceMohave Valley News`                                                                               NA
## `SourceMonadnock Ledger Transcript`                                                                      NA
## `SourceMondaq News Alerts (registration)`                                                                NA
## SourceMondoweiss                                                                                         NA
## SourceMoney                                                                                              NA
## `SourceMoney Flow Index`                                                                                 NA
## `SourceMoney Magazine`                                                                                   NA
## `SourceMoney Marketing`                                                                                  NA
## `SourceMoney Marketing Online`                                                                           NA
## `SourceMoney Morning`                                                                                    NA
## `SourceMoney Morning Australia`                                                                          NA
## `SourceMoney News (press release)`                                                                       NA
## `SourceMoney Talks News via Yahoo! Finance`                                                              NA
## SourceMoneycontrol.com                                                                                   NA
## SourceMoneySense                                                                                         NA
## SourceMoneyweb.co.za                                                                                     NA
## SourceMoneyWeek                                                                                          NA
## SourceMonitor                                                                                            NA
## `SourceMonitor Online (blog)`                                                                            NA
## `SourceMonroe Evening News`                                                                              NA
## `SourceMonroe News Star`                                                                                 NA
## `SourceMontana Standard`                                                                                 NA
## `SourceMontana Tech`                                                                                     NA
## `SourceMonterey County Weekly`                                                                           NA
## `SourceMontgomery Advertiser`                                                                            NA
## `SourceMonthly Review`                                                                                   NA
## `SourceMontreal Gazette`                                                                                 NA
## `SourceMontserrat Reporter`                                                                              NA
## `SourceMoodys.com (press release) (subscription)`                                                        NA
## `SourceMorning Consult`                                                                                  NA
## `SourceMorning Journal News`                                                                             NA
## `SourceMorning News USA`                                                                                 NA
## `SourceMorning Star`                                                                                     NA
## `SourceMorning Star Online`                                                                              NA
## `SourceMorning Ticker`                                                                                   NA
## SourceMorningstar                                                                                        NA
## SourceMorningstar.com                                                                                    NA
## `SourceMorocco World News`                                                                               NA
## `SourceMorris Daily Herald`                                                                              NA
## `SourceMother Jones`                                                                                     NA
## `SourceMother Nature Network (blog)`                                                                     NA
## SourceMotherboard                                                                                        NA
## `SourceMotley Fool`                                                                                      NA
## `SourceMotley Fool Australia`                                                                            NA
## `SourceMotor Trend`                                                                                      NA
## SourceMotoring                                                                                           NA
## `SourceMotorsport.com, Edition: Global`                                                                  NA
## SourceMotorTrend                                                                                         NA
## `SourceMountain View Voice`                                                                              NA
## `SourceMovie TV Tech Geeks News`                                                                         NA
## SourceMoviefone                                                                                          NA
## Sourcemoviepilot.com                                                                                     NA
## SourceMovieWeb                                                                                           NA
## `SourceMRCTV (blog)`                                                                                     NA
## `SourceMRCTV (satire) (blog)`                                                                            NA
## `SourceMrTopStep.com via Yahoo! Finance`                                                                 NA
## SourceMSDynamicsWorld.com                                                                                NA
## `SourceMSN Autos`                                                                                        NA
## SourceMSNBC                                                                                              NA
## SourceMSPmentor                                                                                          NA
## `SourceMSPmentor (blog)`                                                                                 NA
## SourceMSPoweruser.com                                                                                    NA
## SourceMTPR                                                                                               NA
## SourceMTV.com                                                                                            NA
## `SourceMulti-Housing News`                                                                               NA
## `SourceMultichannel News`                                                                                NA
## `SourceMumbai Mirror`                                                                                    NA
## SourceMuMbrella                                                                                          NA
## `SourceMunchies_ Food by VICE`                                                                           NA
## `SourceMuncie Star Press`                                                                                NA
## `SourceMuscat Daily`                                                                                     NA
## `SourceMuscatine Journal`                                                                                NA
## `SourceMusic Business Worldwide`                                                                         NA
## SourceMusicrooms.net                                                                                     NA
## `SourceMuslimVillage.com (press release) (blog)`                                                         NA
## `SourceMWC News`                                                                                         NA
## `SourceMy Fox Boston`                                                                                    NA
## `SourceMy News LA`                                                                                       NA
## `SourceMy Nintendo News (blog)`                                                                          NA
## `SourceMy Twin Tiers.com`                                                                                NA
## SourceMyAJC                                                                                              NA
## `SourceMyAJC (blog)`                                                                                     NA
## `SourceMyanmar Times`                                                                                    NA
## SourceMyBroadband                                                                                        NA
## SourceMyCentralJersey.com                                                                                NA
## SourceMyDaytonDailyNews                                                                                  NA
## Sourcemyfox8.com                                                                                         NA
## SourceMYFOXZONE.com                                                                                      NA
## SourceMyjoyonline.com                                                                                    NA
## SourceMyMotherLode.com                                                                                   NA
## SourceMyNewsLA.com                                                                                       NA
## SourceMyNorthwest.com                                                                                    NA
## `SourceMyrtle Beach Sun News`                                                                            NA
## SourcemySanAntonio.com                                                                                   NA
## `SourcemySanAntonio.com (blog)`                                                                          NA
## SourceMyStateline.com                                                                                    NA
## SourceMyStatesman.com                                                                                    NA
## SourceMyTechBits                                                                                         NA
## `SourceN.C. State University Technician Online`                                                          NA
## SourceN4BB                                                                                               NA
## SourceNaharnet                                                                                           NA
## SourceNAIJ.COM                                                                                           NA
## `SourceNaked Capitalism`                                                                                 NA
## `SourceNaked Security`                                                                                   NA
## `SourceNaked Security (blog)`                                                                            NA
## `SourceNamibia Economist`                                                                                NA
## SourceNamibian                                                                                           NA
## `SourceNanaimo News Bulletin`                                                                            NA
## `SourceNanoNews (blog)`                                                                                  NA
## `SourceNapa Valley Register`                                                                             NA
## `SourceNaples Daily News`                                                                                NA
## `SourceNarendra Modi (press release) (blog)`                                                             NA
## SourceNascar                                                                                             NA
## SourceNasdaq                                                                                             NA
## `SourceNashua Telegraph`                                                                                 NA
## `SourceNashville Business Journal`                                                                       NA
## `SourceNashville Business Journal (blog)`                                                                NA
## `SourceNashville Chatter`                                                                                NA
## `SourceNathan McAlone, Business Insider via Yahoo! Finance`                                              NA
## `SourceNation News`                                                                                      NA
## `Sourcenation.lk - The Nation Newspaper`                                                                 NA
## `SourceNational Catholic Register`                                                                       NA
## `SourceNational Catholic Reporter`                                                                       NA
## `SourceNational Catholic Reporter (blog)`                                                                NA
## `SourceNational Constitution Center via Yahoo! News`                                                     NA
## `SourceNational Geographic`                                                                              NA
## `SourceNational Journal`                                                                                 NA
## `SourceNational Mirror`                                                                                  NA
## `SourceNational Observer`                                                                                NA
## `SourceNational Post`                                                                                    NA
## `SourceNational Review Online`                                                                           NA
## `SourceNational Science Foundation (press release)`                                                      NA
## `SourceNational Turk English`                                                                            NA
## `SourceNATO HQ (press release)`                                                                          NA
## `SourceNatural Gas Intelligence`                                                                         NA
## `SourceNatural Resources Defense Council`                                                                NA
## `SourceNatural Resources Defense Council (blog)`                                                         NA
## SourceNature                                                                                             NA
## `SourceNature World News`                                                                                NA
## SourceNature.com                                                                                         NA
## `SourceNBC 12 Richmond`                                                                                  NA
## `SourceNBC 2 Fort Myers`                                                                                 NA
## `SourceNBC 29 News`                                                                                      NA
## `SourceNBC 5 Dallas-Fort Worth`                                                                          NA
## `SourceNBC 6 South Florida`                                                                              NA
## `SourceNBC 7 San Diego`                                                                                  NA
## `SourceNBC Bay Area`                                                                                     NA
## `SourceNBC Chicago`                                                                                      NA
## `SourceNBC Chicago (blog)`                                                                               NA
## `SourceNBC Connecticut`                                                                                  NA
## `SourceNBC Montana`                                                                                      NA
## `SourceNBC Nebraska`                                                                                     NA
## `SourceNBC New York`                                                                                     NA
## `SourceNBC NEWS`                                                                                         NA
## `SourceNBC Southern California`                                                                          NA
## `SourceNBC2 News`                                                                                        NA
## `SourceNBC4 Washington`                                                                                  NA
## SourceNBC4i.com                                                                                          NA
## SourceNBCNews.com                                                                                        NA
## SourceNBCSports.com                                                                                      NA
## SourceNCAA.com                                                                                           NA
## `SourceNCR-Iran.org`                                                                                     NA
## SourceNDTV                                                                                               NA
## `SourceNDTV (blog)`                                                                                      NA
## SourceNDTVSports.com                                                                                     NA
## `SourceNearshore Americas`                                                                               NA
## `SourceNehanda Radio`                                                                                    NA
## `SourceNenagh Guardian`                                                                                  NA
## `SourceNeos Kosmos`                                                                                      NA
## `SourceNeosho Daily News`                                                                                NA
## SourceNeowin                                                                                             NA
## SourceNerdist                                                                                            NA
## `SourceNerdWallet (blog)`                                                                                NA
## SourceNESN.com                                                                                           NA
## `SourceNetGuide NZ`                                                                                      NA
## SourceNetimperative                                                                                      NA
## `SourceNetwork World`                                                                                    NA
## `SourceNetworks Asia`                                                                                    NA
## SourceNeurogadget                                                                                        NA
## `SourceNevada County Picayune`                                                                           NA
## `SourceNew America Media`                                                                                NA
## `SourceNew Bern Sun Journal`                                                                             NA
## `SourceNew Era`                                                                                          NA
## `SourceNew Europe`                                                                                       NA
## `SourceNew Hampshire Business Review`                                                                    NA
## `SourceNew Hampshire Public Radio`                                                                       NA
## `SourceNew Hampshire Union Leader`                                                                       NA
## `SourceNew Haven Register`                                                                               NA
## `SourceNew Historian`                                                                                    NA
## `SourceNew Internationalist (blog)`                                                                      NA
## `SourceNew Jersey 101.5 FM Radio`                                                                        NA
## `SourceNew Jersey Herald`                                                                                NA
## `SourceNew Kerala`                                                                                0.000e+00
## `SourceNew Matilda`                                                                                      NA
## `SourceNew Republic`                                                                                     NA
## `SourceNew Ross Standard`                                                                                NA
## `SourceNew Sabah Times`                                                                                  NA
## `SourceNew Scientist`                                                                                    NA
## `SourceNew Statesman`                                                                                    NA
## `SourceNew Straits Times Online`                                                                         NA
## `SourceNew Straits Times via Yahoo! Singapore News`                                                      NA
## `SourceNew University`                                                                                   NA
## `SourceNew Vision`                                                                                       NA
## `SourceNew York's PIX11 / WPIX-TV`                                                                       NA
## `SourceNew York Business Journal`                                                                        NA
## `SourceNew York Daily News`                                                                              NA
## `SourceNew York Magazine`                                                                                NA
## `SourceNew York Post`                                                                                    NA
## `SourceNew York Recorder`                                                                                NA
## `SourceNew York Review of Books`                                                                         NA
## `SourceNew York Sun`                                                                                     NA
## `SourceNew York Times`                                                                           -4.745e+07
## `SourceNew York Times (blog)`                                                                            NA
## `SourceNew York Times Finance`                                                                           NA
## `SourceNew Zealand Herald`                                                                               NA
## `SourceNew Zealand Listener`                                                                             NA
## `SourceNew Zimbabwe`                                                                                     NA
## `SourceNew Zimbabwe.com`                                                                                 NA
## SourceNewbritainherald                                                                                   NA
## `SourceNewcastle Herald`                                                                                 NA
## `SourceNewham Recorder`                                                                                  NA
## SourceNewNowNext                                                                                         NA
## `SourceNews-Medical.net`                                                                                 NA
## `SourceNews & Observer`                                                                                  NA
## `SourceNews & Observer (blog)`                                                                           NA
## `SourceNews & Star`                                                                                      NA
## `SourceNews 10NBC`                                                                                       NA
## `SourceNews 1130`                                                                                        NA
## `SourceNews 24 South Africa`                                                                             NA
## `SourceNews Channel 12 New Bern`                                                                         NA
## `SourceNews Every day`                                                                                   NA
## `SourceNews from Rutgers`                                                                                NA
## `SourceNews Ghana`                                                                                       NA
## `SourceNews On 6`                                                                                        NA
## `SourceNews On 6 Tulsa`                                                                                  NA
## `SourceNews One`                                                                                         NA
## `SourceNews Oracle`                                                                                      NA
## `SourceNews Radio 710 KEEL`                                                                              NA
## `SourceNews Sentinel`                                                                                    NA
## `SourceNews Talk 610 CKTB`                                                                               NA
## `SourceNews Talk 650 CKOM`                                                                               NA
## `SourceNews Talk 770 Calgary`                                                                            NA
## `SourceNews Talk Florida`                                                                                NA
## `SourceNews Tribe`                                                                                       NA
## `SourceNews Watch International`                                                                         NA
## `SourceNews West 9 Midland`                                                                              NA
## `SourceNews World India`                                                                                 NA
## SourceNews.Az                                                                                            NA
## SourceNews.com.au                                                                                        NA
## SourceNEWS.com.au                                                                                        NA
## `SourceNews.com.au Travel`                                                                               NA
## Sourcenews.delaware.gov                                                                                  NA
## `SourceNEWS10 ABC`                                                                                       NA
## SourceNews1130                                                                                           NA
## SourceNews18                                                                                             NA
## SourceNews24                                                                                             NA
## `SourceNews24 Nigeria`                                                                                   NA
## SourceNews3LV                                                                                            NA
## SourceNews4C                                                                                             NA
## `Sourcenews9.com KWTV`                                                                                   NA
## `SourceNewsAhead Agency`                                                                                 NA
## SourceNewsandtribune                                                                                     NA
## SourcenewsBTC                                                                                            NA
## SourceNewsbug.info                                                                                       NA
## `SourceNewsBusters (blog)`                                                                               NA
## SourceNewscenter1.tv                                                                                     NA
## `SourceNewschannel 6 Wichita Falls`                                                                      NA
## SourceNewsChannel5.com                                                                                   NA
## SourceNewsday                                                                                            NA
## SourceNewsDay                                                                                            NA
## SourceNewsdzeZimbabwe                                                                                    NA
## SourceNewser                                                                                             NA
## SourceNewsexaminer                                                                                       NA
## `SourceNewsFactor Network`                                                                               NA
## SourceNewsfirst                                                                                          NA
## SourceNewsGhana.com.gh                                                                                   NA
## `SourceNewsHounds (blog)`                                                                                NA
## SourceNewshub                                                                                            NA
## `SourceNewshub (blog)`                                                                                   NA
## SourceNewsInferno                                                                                        NA
## SourceNewsmax                                                                                            NA
## `SourceNewsnext Bangladesh`                                                                              NA
## SourceNewsOK.com                                                                                         NA
## SourceNewsQuench                                                                                         NA
## `SourceNewstalk 106-108 fm`                                                                              NA
## `SourceNewstalk ZB`                                                                                      NA
## `SourceNewsWay 21`                                                                                       NA
## SourceNewsweek                                                                                           NA
## `SourceNewsweek ME`                                                                                      NA
## `SourceNewsweek via Yahoo UK & Ireland News`                                                             NA
## `SourceNewsweek via Yahoo! News`                                                                         NA
## `SourceNewsweel ME (satire) (press release) (blog)`                                                      NA
## SourceNewsWest9.com                                                                                      NA
## SourceNewswise                                                                                           NA
## SourceNewsWithViews.com                                                                                  NA
## SourceNewsworks.org                                                                                      NA
## SourceNewsx                                                                                              NA
## SourceNewsy                                                                                              NA
## `SourceNewton Press Mentor`                                                                              NA
## SourceNewzy                                                                                              NA
## `SourceNext Big Future`                                                                                  NA
## `SourceNext City`                                                                                        NA
## SourceNextShark                                                                                          NA
## `SourceNFC World`                                                                                        NA
## SourceNFL.com                                                                                            NA
## `SourceNiagara Falls Review`                                                                             NA
## `SourceNiche Gamer`                                                                                      NA
## `SourceNigeria (press release) (blog)`                                                                   NA
## `SourceNightcap TV`                                                                                      NA
## `SourceNikkei Asian Review`                                                                              NA
## `SourceNine O&#39;Clock`                                                                                 NA
## `Sourceninemsn 9Stories`                                                                                 NA
## `SourceNintendo Life`                                                                                    NA
## `SourceNIU Newsroom`                                                                                     NA
## SourceNJ.com                                                                                             NA
## SourceNJBIZ                                                                                              NA
## `SourceNK News`                                                                                          NA
## `SourceNL Times`                                                                                         NA
## SourceNME                                                                                                NA
## SourceNME.com                                                                                            NA
## SourceNMPolitics.net                                                                                     NA
## `SourceNo Jitter`                                                                                        NA
## SourceNOLA.com                                                                                           NA
## SourceNooga.com                                                                                          NA
## SourceNoozhawk                                                                                           NA
## `SourceNorfolk Eastern Daily Press`                                                                      NA
## `SourceNorman Transcript`                                                                                NA
## `SourceNorth American Windpower`                                                                         NA
## `SourceNorth Bay Business Journal`                                                                       NA
## `SourceNorth Country Public Radio`                                                                       NA
## `SourceNorth Queensland Register`                                                                        NA
## `SourceNorthampton Chronicle & Echo`                                                                     NA
## `SourceNorthamptonshire Telegraph`                                                                       NA
## `SourceNortheast Mississippi Daily Journal`                                                              NA
## `SourceNorthern Californian`                                                                             NA
## `SourceNorthern Echo`                                                                                    NA
## `SourceNorthern Star`                                                                                    NA
## SourceNorthernLife.ca                                                                                    NA
## SourceNorthfield.org                                                                                     NA
## SourceNorthJersey.com                                                                                    NA
## `SourceNorthumberland Gazette`                                                                           NA
## `SourceNorthwest Arkansas News`                                                                          NA
## `SourceNorthwest Georgia News`                                                                           NA
## `SourceNorthwest Herald`                                                                                 NA
## `SourceNorthwestern University NewsCenter`                                                               NA
## `SourceNotebook Review`                                                                                  NA
## SourceNotebookReview.com                                                                                 NA
## `SourceNottingham Post`                                                                                  NA
## SourceNovinite                                                                                           NA
## SourceNovinite.com                                                                                       NA
## `SourceNOW Magazine`                                                                                     NA
## SourceNowGamer                                                                                           NA
## SourceNPR                                                                                                NA
## SourceNSEAVoice.com                                                                                      NA
## `SourceNT News`                                                                                          NA
## SourceNTV                                                                                                NA
## SourceNumbersUSA                                                                                         NA
## SourceNuvo                                                                                               NA
## `SourceNUVO Newsweekly`                                                                                  NA
## SourceNWAOnline                                                                                          NA
## SourceNWCN.com                                                                                           NA
## Sourcenwitimes.com                                                                                       NA
## `SourceNY Blueprint`                                                                                     NA
## `SourceNyasa Times`                                                                                      NA
## SourceNYCaribNews                                                                                        NA
## `SourceNYSE Post`                                                                                        NA
## `SourceNYU Washington Square News`                                                                       NA
## `SourceNZ Newswire via Yahoo! New Zealand News`                                                          NA
## `SourceNZ Newswire via Yahoo!7 News`                                                                     NA
## SourceNZCity                                                                                             NA
## `SourceOakland Tribune`                                                                                  NA
## `SourceOakville Beaver`                                                                                  NA
## SourceObserver                                                                                           NA
## `SourceObserver-Reporter`                                                                                NA
## `SourceObstacle Racing Media (press release) (blog)`                                                     NA
## SourceOcala                                                                                              NA
## SourceOCCRP                                                                                              NA
## SourceOCRegister                                                                                         NA
## `Sourceodditycentral (blog)`                                                                             NA
## `SourceOdessa American`                                                                                  NA
## SourceOilOnline                                                                                          NA
## SourceOilPrice.com                                                                                       NA
## `SourceOilprice.com via Yahoo Canada Finance`                                                            NA
## `SourceOilprice.com via Yahoo! Finance`                                                                  NA
## `SourceOilprice.com via Yahoo! New Zealand Finance`                                                      NA
## `SourceOilprice.com via Yahoo!7 Finance`                                                                 NA
## `SourceOK! Magazine`                                                                                     NA
## `SourceOklahoma&#39;s NewsChannel 4`                                                                     NA
## `SourceOldham Chronicle`                                                                                 NA
## `SourceOlean Times Herald`                                                                               NA
## `SourceOlhar Digital`                                                                                    NA
## `SourceOlive Press`                                                                                      NA
## `SourceOmaha World-Herald`                                                                               NA
## `SourceOMCT World Organisation Against Torture`                                                          NA
## `SourceOmnisport via Yahoo! Sports`                                                                      NA
## `SourceOn Cars India`                                                                                    NA
## `SourceOn Line opinion`                                                                                  NA
## `SourceOne India`                                                                                        NA
## SourceOneindia                                                                                           NA
## SourceOneNewsNow                                                                                         NA
## `SourceOneonta Daily Star`                                                                               NA
## `SourceOnline Athens`                                                                                    NA
## `SourceOnly Single Player`                                                                               NA
## Sourceonmanorama                                                                                         NA
## SourceOnrec                                                                                              NA
## `SourceOntario Argus Observer`                                                                           NA
## `SourceOnward State`                                                                                     NA
## SourceOnWindows.com                                                                                      NA
## `SourceOPB News`                                                                                         NA
## SourceOpEdNews                                                                                           NA
## `SourceOpen Democracy`                                                                                   NA
## `SourceOPEN MINDS (registration)`                                                                        NA
## `SourceOpen Minds UFO News`                                                                              NA
## SourceOpenCanada                                                                                         NA
## `SourceOpenDNS Blog (blog)`                                                                              NA
## `SourceOpinion Internationale`                                                                           NA
## `SourceOpposing Views`                                                                                   NA
## `SourceoptionMONSTER Research`                                                                           NA
## `SourceoptionMONSTER via Yahoo! Finance`                                                                 NA
## `SourceOR-Politics.com`                                                                                  NA
## `SourceOracleUnion.com (blog)`                                                                           NA
## `SourceOrange County Register`                                                                           NA
## `SourceOregon Daily Emerald`                                                                             NA
## `SourceOregon Public Broadcasting`                                                                       NA
## SourceOregonLive.com                                                                                     NA
## `SourceOrlando Business Journal`                                                                         NA
## `SourceOrlando Business Journal (blog)`                                                                  NA
## `SourceOrlando Sentinel`                                                                                 NA
## `SourceOrlando Weekly (blog)`                                                                            NA
## `SourceOroville Mercury Register`                                                                        NA
## `SourceOS News`                                                                                          NA
## SourceOSNews                                                                                             NA
## `SourceOSU - The Lantern`                                                                                NA
## `SourceOsun Defender`                                                                                    NA
## `SourceOswego Daily News`                                                                                NA
## `SourceOtago Daily Times`                                                                                NA
## `SourceOTC Outlook`                                                                                      NA
## `SourceOttawa Citizen`                                                                                   NA
## `SourceOttawa Sun`                                                                                       NA
## `SourceOumma.com: point de vue musulman sur l'actualit\\u009d\\u009d`                                    NA
## `SourceOumma.com: point de vue musulman sur l'actualité`                                                 NA
## `SourceOUPblog (blog)`                                                                                   NA
## SourceOurQuadCities                                                                                      NA
## `SourceOut-Law`                                                                                          NA
## `SourceOut-Law.com`                                                                                      NA
## `SourceOut Magazine`                                                                                     NA
## SourceOutdoorHub                                                                                         NA
## `SourceOuter Places`                                                                                     NA
## `SourceOutlook India`                                                                                    NA
## SourceOverlawyered                                                                                       NA
## `SourceOxfam America (press release) (blog)`                                                             NA
## `SourceOxford Mail`                                                                                      NA
## `SourceOxford Student`                                                                                   NA
## `SourceOye! Times`                                                                                       NA
## SourceOZY                                                                                                NA
## `SourceOzy via Yahoo Canada News`                                                                        NA
## `SourceOzy via Yahoo! News`                                                                              NA
## `SourcePA Money News via Yahoo UK & Ireland Finance`                                                     NA
## `SourcePacific Business News (Honolulu)`                                                                 NA
## `SourcePacific Daily News`                                                                               NA
## `SourcePacific Standard`                                                                                 NA
## `SourcePage Six`                                                                                         NA
## `SourcePajhwok Afghan News (subscription) (blog)`                                                        NA
## `SourcePakistan Christian Post`                                                                          NA
## `SourcePakistan Observer`                                                                                NA
## `SourcePakistan Today`                                                                                   NA
## SourcePalatinate                                                                                         NA
## `SourcePalestine Herald Press`                                                                           NA
## `SourcePalestine News Network`                                                                           NA
## `SourcePalestine Note`                                                                                   NA
## `SourcePalladium-Item`                                                                                   NA
## SourcePallonate                                                                                          NA
## `SourcePalm Beach Daily News`                                                                            NA
## `SourcePalm Beach Post`                                                                                  NA
## `SourcePalm Beach Post (blog)`                                                                           NA
## `SourcePamplin Media Group`                                                                              NA
## `SourcePanAm Post (blog)`                                                                                NA
## SourcePanARMENIAN.Net                                                                                    NA
## SourceParade                                                                                             NA
## `SourceParent Herald`                                                                                    NA
## `SourceParkersburg News`                                                                                 NA
## `SourceParksville Qualicum Beach News`                                                                   NA
## `SourceParti Anti Sioniste`                                                                              NA
## `SourcePassport Magazine`                                                                                NA
## SourcePatch.com                                                                                          NA
## `SourcePatently Apple`                                                                                   NA
## `SourcePatheos (blog)`                                                                                   NA
## `SourcePatriot Post`                                                                                     NA
## `SourcePattaya Today`                                                                                    NA
## `SourcePayment Week`                                                                                     NA
## `SourcePayScale Career News (blog)`                                                                      NA
## SourcePayvand                                                                                            NA
## `SourcePayvand Iran News`                                                                                NA
## `SourcePBS NewsHour`                                                                                     NA
## `SourcePC-Tablet`                                                                                        NA
## `SourcePc-Tablet Media`                                                                                  NA
## `SourcePC Advisor`                                                                                       NA
## `SourcePC Authority`                                                                                     NA
## `SourcePC Gamer`                                                                                         NA
## `SourcePC Magazine`                                                                                      NA
## `SourcePC Perspectives`                                                                                  NA
## `SourcePC PowerPlay`                                                                                     NA
## `SourcePC Tech Magazine`                                                                                 NA
## `SourcePC World`                                                                                  0.000e+00
## SourcePCGamesN                                                                                           NA
## `SourcePCMag India`                                                                                      NA
## `Sourcepcplus tabloid komputer`                                                                          NA
## `SourcePCR-online.biz`                                                                                   NA
## SourcePCWorld                                                                                            NA
## `SourcePE Hub (subscription) (blog)`                                                                     NA
## `SourcePeeblesshire News`                                                                                NA
## `SourcePeninsula Clarion`                                                                                NA
## `SourcePeninsula On-line`                                                                                NA
## `SourcePenn State News`                                                                                  NA
## `SourcePenn: Office of University Communications`                                                        NA
## SourcePennLive.com                                                                                       NA
## `SourcePensacola News Journal`                                                                           NA
## `SourcePensions & Investments`                                                                           NA
## `SourcePenticton Western News`                                                                           NA
## `SourcePeople's World`                                                                                   NA
## `SourcePEOPLE Great Ideas`                                                                               NA
## `SourcePeople Magazine`                                                                                  NA
## `SourcePEOPLE StyleWatch`                                                                                NA
## `SourcePeoria Journal Star`                                                                              NA
## `SourcePeoria Public Radio`                                                                              NA
## `SourcePerez Hilton`                                                                                     NA
## SourcePerezHilton.com                                                                                    NA
## `SourcePersonal Liberty Digest`                                                                          NA
## SourcePersonnelToday.com                                                                                 NA
## `SourcePerth Now`                                                                                        NA
## `SourcePeru this Week`                                                                                   NA
## `SourcePetaPixel (blog)`                                                                                 NA
## `SourcePeter Greenberg.com Travel News`                                                                  NA
## `SourcePeterborough Telegraph`                                                                           NA
## `SourcePetoskey News-Review`                                                                             NA
## `SourcePetra News Agency`                                                                                NA
## `SourcePew Research Center`                                                                              NA
## `SourcePew Research Center's Global Attitudes Project`                                                   NA
## `SourcePew Research Center's Internet and American Life Project`                                         NA
## `SourcePew Research Center for the People and the Press`                                                 NA
## SourcePhandroid.com                                                                                      NA
## `SourcePharmaceutical Executive (press release) (registration) (blog)`                                   NA
## SourcePharmaceuticalOnline                                                                               NA
## `SourcePhiladelphia Business Journal`                                                                    NA
## `SourcePhilippine Star`                                                                                  NA
## `SourcePhilippine Star via Yahoo! Philippines News`                                                      NA
## SourcePhilly.com                                                                                         NA
## `SourcePhilly.com (blog)`                                                                                NA
## SourcePhillyVoice.com                                                                                    NA
## `SourcePhnom Penh Post`                                                                                  NA
## `SourcePhoenix Business Journal (blog)`                                                                  NA
## `SourcePhone Arena`                                                                                      NA
## `SourcePhone Scoop`                                                                                      NA
## SourcePhoneDog                                                                                           NA
## `SourcePhones Review`                                                                                    NA
## `SourcePhoneWorld Magazine (press release) (blog)`                                                       NA
## `SourcePhotographyBLOG (blog)`                                                                           NA
## SourcePhotonics.com                                                                                      NA
## SourcePhys.Org                                                                                           NA
## `SourcePhysics Today`                                                                                    NA
## SourcePickupTrucks.com                                                                                   NA
## `SourcePine Bluff Commercial`                                                                            NA
## SourcePinkNews                                                                                           NA
## `SourcePioneers Post (press release) (registration) (blog)`                                              NA
## `SourcePirate FM`                                                                                        NA
## `SourcePitchfork Media`                                                                                  NA
## `SourcePittsburgh Business Times (blog)`                                                                 NA
## `SourcePittsburgh Post-Gazette`                                                                          NA
## `SourcePittsburgh Tribune-Review`                                                                        NA
## `SourcePJ Media`                                                                                         NA
## `SourcePJ Media (blog)`                                                                                  NA
## SourcePlanet                                                                                             NA
## SourcePlanetSave.com                                                                                     NA
## SourcePlantAutomation.com                                                                                NA
## `SourcePlastics & Rubber Weekly`                                                                         NA
## `SourcePlastics and Rubber Weekly`                                                                       NA
## `SourcePlastics News`                                                                                    NA
## SourcePlatts                                                                                             NA
## `SourcePlatts (blog)`                                                                                    NA
## `SourcePlay the Game`                                                                                    NA
## `SourcePlayStation LifeStyle`                                                                            NA
## `Sourceplus55 (blog)`                                                                                    NA
## `SourcePlymouth Herald`                                                                                  NA
## `SourcePMLiVE (blog)`                                                                                    NA
## `SourcePocket-lint.com`                                                                                  NA
## `SourcePoint of Sale News (tm) (press release) (blog)`                                                   NA
## `SourcePolicy Network`                                                                                   NA
## SourcePolitickerNJ                                                                                       NA
## SourcePolitico                                                                                           NA
## `SourcePolitico (blog)`                                                                                  NA
## `SourcePOLITICO Magazine`                                                                                NA
## SourcePOLITICO.eu                                                                                        NA
## SourcePoliticsHome.com                                                                                   NA
## SourcePoliticsweb                                                                                        NA
## SourcePoliticusUSA                                                                                       NA
## SourcePolitiFact                                                                                         NA
## SourcePolygon                                                                                            NA
## `SourcePolygon via Yahoo! News`                                                                          NA
## `SourcePOP Herald`                                                                                       NA
## SourcePOPSUGAR                                                                                           NA
## `SourcePopular Mechanics`                                                                                NA
## `SourcePopular Science`                                                                                  NA
## SourcePopzara                                                                                            NA
## `SourcePort Huron Times Herald`                                                                          NA
## `SourcePorterville Recorder`                                                                             NA
## `SourcePortland Business Journal (blog)`                                                                 NA
## `SourcePortland Tribune`                                                                                 NA
## `SourcePortsmouth News`                                                                                  NA
## `SourcePost-Bulletin`                                                                                    NA
## `SourcePost-Tribune`                                                                                     NA
## `SourcePost and Parcel`                                                                                  NA
## `SourcePost Online`                                                                                      NA
## `SourcePost Online (blog)`                                                                               NA
## `SourcePoughkeepsie Journal`                                                                             NA
## `SourcePowder Magazine`                                                                                  NA
## `SourcePower Line (blog)`                                                                                NA
## SourcePoynter.org                                                                                        NA
## `SourcePPcorn (blog)`                                                                                    NA
## SourcePplware                                                                                            NA
## `SourcePR Newswire`                                                                                      NA
## `SourcePR Newswire (press release)`                                                                      NA
## `SourcePR Newswire UK (press release)`                                                                   NA
## `SourcePR Newswire via Yahoo! Finance`                                                            0.000e+00
## `SourcePR Web (press release)`                                                                           NA
## `SourcePrague Daily Monitor`                                                                             NA
## `SourcePrague Post`                                                                                      NA
## SourcePrameyaNews7                                                                                       NA
## SourcePravda                                                                                             NA
## SourcePremier                                                                                            NA
## `SourcePremium Times`                                                                                    NA
## `SourcePrensa Latina`                                                                                    NA
## `SourcePress-Enterprise`                                                                                 NA
## `SourcePress & Sun-Bulletin`                                                                             NA
## `SourcePress & Sun-Bulletin (blog)`                                                                      NA
## `SourcePress and Journal`                                                                                NA
## `SourcePress Association via Yahoo UK & Ireland News`                                                    NA
## `SourcePress Herald`                                                                                     NA
## `SourcePress Insider Daily`                                                                              NA
## `SourcePress of Atlantic City`                                                                           NA
## `SourcePress Release Rocket`                                                                             NA
## `SourcePress Release Service (press release)`                                                            NA
## `SourcePress Telegraph (blog)`                                                                           NA
## `SourcePress Trust of India`                                                                             NA
## `SourcePress TV`                                                                                         NA
## `SourcePressChronicle.com (blog)`                                                                        NA
## `SourcePressenza International Press Agency`                                                             NA
## SourcePRI                                                                                                NA
## `SourcePrime Minister of Canada (press release)`                                                         NA
## `SourcePrince Albert Daily Herald`                                                                       NA
## `SourcePrince George Citizen`                                                                            NA
## `SourcePrinted Electronics World`                                                                        NA
## `SourcePrivate Eye`                                                                                      NA
## SourcePRNewser                                                                                           NA
## `SourceProactive Investors UK`                                                                           NA
## `SourceProduct Reviews`                                                                                  NA
## `SourceProfit Confidential`                                                                              NA
## SourceProgrammableWeb                                                                                    NA
## `SourceProgress Illinois`                                                                                NA
## `SourceProgress.org (blog)`                                                                              NA
## `SourceProject Syndicate`                                                                                NA
## `SourceProlific North`                                                                                   NA
## `SourceProperty Guru via Yahoo! Singapore News`                                                          NA
## `SourceProperty Magazine International`                                                                  NA
## SourcePropertyCasualty360                                                                                NA
## SourceProPublica                                                                                         NA
## `SourceProspect (blog)`                                                                                  NA
## `SourceProthom Alo (English)`                                                                            NA
## `SourceProvidence Business News`                                                                         NA
## SourcePRWeb                                                                                       0.000e+00
## SourcePRWeek                                                                                             NA
## `SourcePSFK (blog)`                                                                                      NA
## `SourcePSX Extreme`                                                                                      NA
## `SourcePublic Finance`                                                                                   NA
## `SourcePublic Finance International`                                                                     NA
## `SourcePublic Knowledge Tech News and Comment (blog)`                                                    NA
## `SourcePublishers Weekly (blog)`                                                                         NA
## `SourcePueblo Chieftain`                                                                                 NA
## `SourcePuget Sound Business Journal (Seattle)`                                                           NA
## `SourcePuget Sound Business Journal (Seattle) (blog)`                                                    NA
## `SourcePulitzer Center on Crisis Reporting`                                                              NA
## Sourcepulse                                                                                              NA
## `SourcePulse Headlines`                                                                                  NA
## `SourcePulse Nigeria`                                                                                    NA
## SourcePulse.com.gh                                                                                       NA
## `SourcePulse+IT`                                                                                         NA
## `SourcePurdue Agricultural Communications`                                                               NA
## `SourcePush Square`                                                                                      NA
## `SourcePV-Tech`                                                                                          NA
## `Sourcepv magazine`                                                                                      NA
## SourcePYMNTS.com                                                                                         NA
## `SourceQ13 FOX`                                                                                          NA
## `SourceQ13 FOX Seattle`                                                                                  NA
## SourceQantara.de                                                                                         NA
## `SourceQuad-Cities Online`                                                                               NA
## `SourceQuad City Times`                                                                                  NA
## SourceQuartz                                                                                             NA
## `SourceQuartz via Yahoo UK & Ireland Finance`                                                            NA
## `SourceQuartz via Yahoo! Finance`                                                                        NA
## `SourceQueen's Journal`                                                                                  NA
## `SourceQueensland Country Life`                                                                          NA
## `SourceQueensland Times`                                                                                 NA
## SourceQueerty                                                                                            NA
## `SourceQuincy Herald-Whig`                                                                               NA
## `SourceR & D Magazine`                                                                                   NA
## Sourcerabble.ca                                                                                          NA
## `Sourcerabble.ca (blog)`                                                                                 NA
## `SourceRacked NY`                                                                                        NA
## SourceRadarOnline                                                                                        NA
## `SourceRadio Cadena Agramonte`                                                                           NA
## `SourceRadio Canada International`                                                                       NA
## `SourceRadio Free Asia`                                                                                  NA
## `SourceRadio Iowa`                                                                                       NA
## `SourceRadio New Zealand`                                                                                NA
## `SourceRadio Pakistan (press release)`                                                                   NA
## `SourceRadio Prague`                                                                                     NA
## `SourceRadio Tamazuj`                                                                                    NA
## `SourceRadio Times`                                                                                      NA
## `SourceRadio.com Music and Entertainment News`                                                           NA
## `SourceRadioFreeEurope/RadioLiberty`                                                                     NA
## SourceRadioVop                                                                                           NA
## `SourceRand Daily Mail`                                                                                  NA
## `SourceRandolph County Herald Tribune`                                                                   NA
## SourceRapaport                                                                                           NA
## `SourceRapid City Journal`                                                                               NA
## `SourceRapid tv news`                                                                                    NA
## SourceRappler                                                                                            NA
## SourceRappler.com                                                                                        NA
## `SourceRasmussen Reports`                                                                                NA
## `SourceRaw Story`                                                                                        NA
## `SourceRCR Wireless News`                                                                                NA
## `SourceRe/code`                                                                                          NA
## `SourceReading Eagle`                                                                                    NA
## SourceReadWrite                                                                                          NA
## SourceReadWriteWeb                                                                                       NA
## SourceRealClearMarkets                                                                                   NA
## SourceRealClearPolitics                                                                                  NA
## SourceRéalités                                                                                           NA
## `SourceRealtor.com News`                                                                                 NA
## `SourceRealty Today`                                                                                     NA
## `SourceRealWire (press release)`                                                                         NA
## SourceReason                                                                                             NA
## `SourceReason (blog)`                                                                                    NA
## `SourceReboot Illinois`                                                                                  NA
## SourceRecode                                                                                             NA
## SourceRecombu                                                                                            NA
## `SourceRecorder Press (blog)`                                                                            NA
## `SourceRecorderpost.com (satire) (registration) (blog)`                                                  NA
## `SourceRecycling International`                                                                          NA
## `SourceRecycling Today`                                                                                  NA
## `SourceRed Alert Politics`                                                                               NA
## `SourceRed and Black`                                                                                    NA
## `SourceRed Deer Advocate`                                                                                NA
## `SourceRed Flag`                                                                                         NA
## `SourceRedding Record Searchlight`                                                                       NA
## `SourceRedheaded Blackbelt`                                                                              NA
## Sourcerediff.com                                                                                         NA
## `SourceRedmond Channel Partner`                                                                          NA
## `SourceRedmond Channel Partner (blog)`                                                                   NA
## `SourceRedmond Reporter`                                                                                 NA
## SourceRedmondmag.com                                                                                     NA
## `SourceRedmondmag.com (blog)`                                                                            NA
## `SourceRedress Information & Analysis`                                                                   NA
## `SourceRedwood Falls Gazette`                                                                            NA
## SourceRefinery29                                                                                         NA
## `SourceRegina Leader-Post`                                                                               NA
## `SourceReligion News Service`                                                                            NA
## `SourceRenewable Energy Focus`                                                                           NA
## SourceRenewAmerica                                                                                       NA
## SourceRenewEconomy                                                                                       NA
## SourcereNews                                                                                             NA
## `SourceReno Gazette-Journal`                                                                             NA
## `SourceReno Gazette Journal`                                                                             NA
## `SourceReporters without borders (press release)`                                                        NA
## SourceRepublica                                                                                          NA
## `SourceReseller News`                                                                                    NA
## `SourceResource Investor`                                                                                NA
## SourceReuters                                                                                            NA
## `SourceReuters - UK Focus via Yahoo UK & Ireland Finance`                                                NA
## `SourceReuters Africa`                                                                                   NA
## `SourceReuters Blogs (blog)`                                                                             NA
## `SourceReuters Canada`                                                                                   NA
## `SourceReuters India`                                                                                    NA
## `SourceReuters Middle East via Yahoo Maktoob News`                                                       NA
## `SourceReuters UK`                                                                                       NA
## `SourceReuters via Yahoo Canada Finance`                                                                 NA
## `SourceReuters via Yahoo Canada News`                                                                    NA
## `SourceReuters via Yahoo Maktoob News`                                                                   NA
## `SourceReuters via Yahoo UK & Ireland Finance`                                                           NA
## `SourceReuters via Yahoo UK & Ireland News`                                                              NA
## `SourceReuters via Yahoo UK & Ireland Sport`                                                             NA
## `SourceReuters via Yahoo! Finance`                                                                0.000e+00
## `SourceReuters via Yahoo! Finance India`                                                                 NA
## `SourceReuters via Yahoo! India News`                                                                    NA
## `SourceReuters via Yahoo! New Zealand News`                                                              NA
## `SourceReuters via Yahoo! News`                                                                          NA
## `SourceReuters via Yahoo! Philippines News`                                                              NA
## `SourceReuters via Yahoo! Philippines Sports`                                                            NA
## `SourceReuters via Yahoo! Singapore News`                                                                NA
## `SourceReuters via Yahoo! Singapore Sports`                                                              NA
## `SourceReuters via Yahoo! Sports`                                                                        NA
## `SourceReuters via Yahoo!7 Finance`                                                                      NA
## `SourceReuters via Yahoo!7 News`                                                                         NA
## `SourceReykjav\\u009d\\u009dk Grapevine`                                                                 NA
## SourceRFI                                                                                                NA
## `SourceRhode Island Public Radio`                                                                        NA
## `SourceRI Future`                                                                                        NA
## `SourceRichmond County Daily Journal`                                                                    NA
## `SourceRichmond Times-Dispatch`                                                                          NA
## SourceRichmond.com                                                                                       NA
## `SourceRick Kupchella's BringMeTheNews`                                                                  NA
## `SourceRight Side News`                                                                                  NA
## `SourceRight Wing Watch`                                                                                 NA
## SourceRigzone                                                                                            NA
## `SourceRing of Fire`                                                                                     NA
## `SourceRisers & Fallers`                                                                                 NA
## `SourceRising Kashmir (press release) (registration) (blog)`                                             NA
## `SourceRising Kashmir Daily English Newspaper`                                                           NA
## `SourceRIT University News Services`                                                                     NA
## `SourceRiverfront Times (blog)`                                                                          NA
## SourceRiversideGazette.com                                                                               NA
## `SourceRoad to Paris`                                                                                    NA
## `SourceRoad to VR`                                                                                       NA
## `SourceRoad Warrior Voices`                                                                              NA
## SourceRoadandTrack.com                                                                                   NA
## `SourceRoads and Kingdoms`                                                                               NA
## `SourceRoanoke Times`                                                                                    NA
## SourceRobdailynews                                                                                       NA
## SourceRobohub                                                                                            NA
## `SourceRochdale Online`                                                                                  NA
## `SourceRochester Democrat and Chronicle`                                                                 NA
## `SourceRochester Democrat and Chronicle (blog)`                                                          NA
## SourceRocketNews24                                                                                       NA
## `SourceRockford Register Star`                                                                           NA
## `SourceRockhampton Morning Bulletin`                                                                     NA
## `SourceRoll Call`                                                                                        NA
## `SourceRoll Call (blog)`                                                                                 NA
## `SourceRoll Call (registration)`                                                                         NA
## `SourceRoll Call (registration) (blog)`                                                                  NA
## SourceRollingStone.com                                                                                   NA
## `SourceRomania-Insider.com`                                                                              NA
## `SourceRomford Recorder`                                                                                 NA
## SourceRomper                                                                                             NA
## `SourceRoute Fifty`                                                                                      NA
## `SourceRoyal Gazette`                                                                                    NA
## `SourceRoyal Society of Chemistry`                                                                       NA
## SourceRT                                                                                                 NA
## SourceRTBF                                                                                               NA
## `SourceRTE News`                                                                                         NA
## `SourceRTÉ News`                                                                                         NA
## SourceRTE.ie                                                                                             NA
## `SourceRTT News`                                                                                  1.000e-03
## `SourceRTV Slovenija`                                                                                    NA
## `SourceRU Daily Targum`                                                                                  NA
## SourceRudaw                                                                                              NA
## `SourceRuidoso News`                                                                                     NA
## `SourceRunway Girl Network`                                                                              NA
## SourceRushLimbaugh.com                                                                                   NA
## `SourceRussia and India Report`                                                                          NA
## `SourceRussia Beyond the Headlines`                                                                      NA
## `SourceRussia Direct`                                                                                    NA
## `SourceRussian Information Agency Novosti`                                                               NA
## `SourceRutland Herald`                                                                                   NA
## SourceRwanda                                                                                             NA
## `SourceRwanda News Agency (registration)`                                                                NA
## `SourceSabah Daily Express`                                                                              NA
## `SourceSac City Express`                                                                                 NA
## `SourceSacramento Bee`                                                                                   NA
## `SourceSacramento Bee (blog)`                                                                            NA
## `SourceSacramento Business Journal`                                                                      NA
## `SourceSahara Reporters`                                                                                 NA
## SourceSaharaReporters.com                                                                                NA
## `SourceSalem-News.Com`                                                                                   NA
## `SourceSalem State Log`                                                                                  NA
## SourceSalemNews.net                                                                                      NA
## SourceSalina.com                                                                                         NA
## `SourceSalisbury Journal`                                                                                NA
## SourceSalon                                                                                              NA
## SourceSalon.com                                                                                          NA
## `SourceSalt Lake Tribune`                                                                                NA
## `SourceSAMAA TV (press release) (registration) (blog)`                                                   NA
## `SourceSan Angelo LIVE!`                                                                                 NA
## `SourceSan Angelo Standard Times`                                                                        NA
## `SourceSan Antonio Business Journal`                                                                     NA
## `SourceSan Antonio Express-News`                                                                         NA
## `SourceSan Antonio Express-News (subscription)`                                                          NA
## `SourceSan Bernardino County Sun`                                                                        NA
## `SourceSan Bernardino Sun`                                                                               NA
## `SourceSan Diego Free Press`                                                                             NA
## `SourceSan Diego Jewish World`                                                                           NA
## `SourceSan Francisco Bay View`                                                                           NA
## `SourceSan Francisco Business Times (blog)`                                                              NA
## `SourceSan Francisco Chronicle`                                                                          NA
## `SourceSan Francisco Examiner`                                                                           NA
## `SourceSan Francisco Sun Times`                                                                          NA
## `SourceSan Jose Mercury News`                                                                            NA
## `SourceSan Jose Mercury News media center`                                                               NA
## `SourceSan Mateo Daily Journal`                                                                          NA
## `SourceSandton Chronicle`                                                                                NA
## `SourceSanta Barbara Independent`                                                                        NA
## `SourceSanta Clarita Valley Signal`                                                                      NA
## `SourceSanta Cruz Sentinel`                                                                              NA
## `SourceSanta Fe New Mexican`                                                                             NA
## `SourceSanta Fe New Mexican (blog)`                                                                      NA
## `SourceSanta Fe Reporter`                                                                                NA
## `SourceSanta Maria Times (subscription)`                                                                 NA
## `SourceSanta Rosa Press Democrat`                                                                        NA
## SourceSaphirNews.com                                                                                     NA
## `SourceSarasota Herald-Tribune`                                                                          NA
## `SourceSarnia Observer`                                                                                  NA
## `SourceSaskatoon StarPhoenix`                                                                            NA
## SourceSaskatoonhomepage.ca                                                                               NA
## `SourceSaudi Gazette`                                                                                    NA
## `SourceSaudi Gazette via Yahoo Maktoob News`                                                             NA
## `SourceSauk Prairie Eagle`                                                                               NA
## `SourceSault Star`                                                                                       NA
## `SourceSault Ste. Marie Evening News`                                                                    NA
## `SourceSavannah Morning News`                                                                            NA
## `SourceSB Nation`                                                                                        NA
## SourceSBS                                                                                                NA
## `SourceSBS - The World Game`                                                                             NA
## `SourceSC Magazine`                                                                                      NA
## `SourceSC Magazine UK`                                                                                   NA
## `SourceScarborough Today`                                                                                NA
## `SourceSci-Tech Today`                                                                                   NA
## SourceSciDev.Net                                                                                         NA
## `SourceScience /AAAS`                                                                                    NA
## `SourceScience 2.0`                                                                                      NA
## `SourceScience Daily`                                                                                    NA
## `SourceScience Magazine`                                                                                 NA
## `SourceScience Recorder`                                                                                 NA
## `SourceScience Times`                                                                                    NA
## `SourceScience World Report`                                                                             NA
## SourceScienceAlert                                                                                       NA
## `SourceScienceBlog.com (blog)`                                                                           NA
## `SourceScientific American`                                                                              NA
## `SourceScientific American (blog)`                                                                       NA
## SourceSCNow                                                                                              NA
## SourceScoop.co.nz                                                                                        NA
## `SourceScoop.co.nz (press release)`                                                                      NA
## SourceScoopWhoop                                                                                         NA
## `SourceScotland on Sunday`                                                                               NA
## SourceScotsman                                                                                           NA
## `SourceScotsman (blog)`                                                                                  NA
## `SourceScottish Daily Record`                                                                            NA
## `SourceScottish Housing News`                                                                            NA
## `SourceScottsbluff Star Herald`                                                                          NA
## `SourceSCOTUSblog (blog)`                                                                                NA
## `SourceScranton Times-Tribune`                                                                           NA
## `SourceScreen International`                                                                             NA
## SourceScroll.in                                                                                          NA
## `SourceSDE Entertainment News`                                                                           NA
## `SourceSDPB Radio`                                                                                       NA
## `SourceSDSU Newscenter`                                                                                  NA
## SourceSDTimes.com                                                                                        NA
## SourceSeacoastonline.com                                                                                 NA
## `SourceSearch Engine Journal`                                                                            NA
## `SourceSearch Engine Land`                                                                               NA
## `SourceSeattle Globalist`                                                                                NA
## `SourceSeattle Sun Times`                                                                                NA
## `SourceSeattle Times`                                                                             0.000e+00
## Sourceseattlepi.com                                                                                      NA
## `Sourceseattlepi.com (blog)`                                                                             NA
## SourceSECcountry.com                                                                                     NA
## `SourceSecrecy News (blog)`                                                                              NA
## `SourceSecurity Intelligence (blog)`                                                                     NA
## `SourceSee It Market (blog)`                                                                             NA
## SourceSeeker                                                                                             NA
## `SourceSeeker (registration) (blog)`                                                                     NA
## `SourceSeeking Alpha`                                                                             0.000e+00
## `SourceSeeNews (subscription)`                                                                           NA
## `SourceSeeNews Renewables`                                                                               NA
## SourceSegmentNext                                                                                        NA
## SourceSelectButton                                                                                       NA
## `SourceSentinel & Enterprise`                                                                            NA
## `SourceServer Watch`                                                                                     NA
## `SourceSETHLUI.com via Yahoo! Singapore News`                                                            NA
## `SourceSevier News Messenger`                                                                            NA
## `SourceSeychelles News Agency`                                                                           NA
## `SourceSeymour Tribune`                                                                                  NA
## `SourceSF Weekly (blog)`                                                                                 NA
## SourceSFGate                                                                                             NA
## `SourceSFGate (blog)`                                                                                    NA
## SourceSFist                                                                                              NA
## SourceShacknews                                                                                          NA
## `SourceShanghai Daily (subscription)`                                                                    NA
## Sourceshanghaidaily                                                                                      NA
## SourceShanghaiist                                                                                        NA
## `Sourceshare market updates (press release)`                                                             NA
## `SourceShareCafe (registration)`                                                                         NA
## SourceShareCast                                                                                          NA
## `SourceSharecast via Yahoo UK & Ireland Finance`                                                         NA
## SourceShareChat                                                                                          NA
## SourceSharekhan                                                                                          NA
## SourceSheKnows.com                                                                                       NA
## `SourceSherwood Park News`                                                                               NA
## `SourceShields Gazette`                                                                                  NA
## `SourceShillong Times`                                                                                   NA
## `SourceShiny Shiny`                                                                                      NA
## `SourceShreveport Times`                                                                                 NA
## SourceSHRM                                                                                               NA
## `SourceShropshire Star`                                                                                  NA
## Sourceshropshirestar.com                                                                                 NA
## `SourceSHU Spectrum`                                                                                     NA
## `SourceSierra Leone Telegraph`                                                                           NA
## `SourceSify News`                                                                                        NA
## `SourceSilicon Valley Business Journal`                                                                  NA
## `SourceSilicon Valley Business Journal (blog)`                                                           NA
## SourceSiliconANGLE                                                                                6.711e+07
## `SourceSiliconANGLE (blog)`                                                                              NA
## SourceSiliconBeat                                                                                        NA
## SourceSiliconera                                                                                         NA
## SourceSiliconIndia                                                                                       NA
## SourceSiliconindia.com                                                                                   NA
## SourceSiliconrepublic.com                                                                                NA
## SourceSILive.com                                                                                         NA
## `SourceSilver City Sun-News`                                                                             NA
## SourceSimcoe.com                                                                                         NA
## `SourceSin Chew Jit Poh`                                                                                 NA
## `SourceSingapore Business Review`                                                                        NA
## `SourceSingapore Business Review via Yahoo! Finance`                                                     NA
## `SourceSingapore Government Online (press release)`                                                      NA
## `SourceSioux City Journal`                                                                               NA
## `SourceSioux Falls Argus Leader`                                                                         NA
## `SourceSiouxland Matters`                                                                                NA
## `SourceSiskiyou Daily News`                                                                              NA
## `SourceSITE Intelligence Group (subscription)`                                                           NA
## SourceSitePoint                                                                                          NA
## SourceSkift                                                                                              NA
## `SourceSky News`                                                                                         NA
## `SourceSky News Australia`                                                                               NA
## `SourceSky News via Yahoo Canada News`                                                                   NA
## `SourceSky News via Yahoo UK & Ireland Finance`                                                          NA
## `SourceSky News via Yahoo UK & Ireland News`                                                             NA
## SourceSkySports                                                                                          NA
## `SourceSLAM Online`                                                                                      NA
## SourceSlashdot                                                                                           NA
## SourceSlashGear                                                                                   1.000e-03
## `SourceSlate Magazine`                                                                                   NA
## `SourceSlate Magazine (blog)`                                                                            NA
## SourceSlate.fr                                                                                           NA
## `SourceSleepy Eye Herald Dispatch`                                                                       NA
## `SourceSlipped Disc`                                                                                     NA
## `SourceSlugger O'Toole`                                                                                  NA
## `SourceSmall Business Computing`                                                                         NA
## `SourceSmall Business Times`                                                                             NA
## `SourceSmall Business Trends`                                                                            NA
## SourceSmallBusiness.co.uk                                                                                NA
## `Sourcesmallwarsjournal (blog)`                                                                          NA
## SourceSmartCompany.com.au                                                                                NA
## `SourceSmarter Analyst`                                                                                  NA
## `SourceSME Insider`                                                                                      NA
## SourceSmithsonian                                                                                        NA
## `SourceSNAPPA Celebrity via Yahoo UK & Ireland News`                                                     NA
## `SourceSNAPPA Technology via Yahoo UK & Ireland News`                                                    NA
## Sourcesnopes.com                                                                                         NA
## `SourceSocial Europe`                                                                                    NA
## `SourceSocialist Alternative`                                                                            NA
## `SourceSocialist Project`                                                                                NA
## `SourceSocialist Worker`                                                                                 NA
## `SourceSocialist Worker Online`                                                                          NA
## SourceSocialTimes                                                                                        NA
## `SourceSoftonic EN (blog)`                                                                               NA
## `SourceSoftpedia News`                                                                                   NA
## `SourceSoftpedia News (blog)`                                                                            NA
## SourceSOHH                                                                                               NA
## SourceSojourners                                                                                         NA
## `SourceSolomon Star`                                                                                     NA
## `SourceSonoma State Star`                                                                                NA
## `SourceSonoran Weekly Review`                                                                            NA
## SourceSooToday.com                                                                                       NA
## `SourceSOS Children`                                                                                     NA
## `SourceSounder At Heart`                                                                                 NA
## SourceSoundersFC.com                                                                                     NA
## Sourcesourcingfocus.com                                                                                  NA
## `SourceSouth Africa.info`                                                                                NA
## `SourceSouth African Broadcasting Corporation`                                                           NA
## `SourceSouth Bend Tribune`                                                                               NA
## `SourceSouth Carolina SC (press release) (blog)`                                                         NA
## `SourceSouth China Morning Post`                                                                         NA
## `SourceSouth China Morning Post (registration)`                                                          NA
## `SourceSouth China Morning Post (subscription)`                                                          NA
## `SourceSouth Florida Business Journal`                                                                   NA
## `SourceSouth Leeds Life`                                                                                 NA
## `SourceSouth Wales Argus`                                                                                NA
## `SourceSouth Wales Evening Post`                                                                         NA
## SourceSouthCoastToday.com                                                                                NA
## `SourceSoutheast Asia GLOBE`                                                                             NA
## `SourceSoutheast Missourian`                                                                             NA
## `SourceSoutheast Texas Record`                                                                           NA
## `SourceSouthern Political Report`                                                                        NA
## SourceSouthernminn.com                                                                                   NA
## SourceSouthtownStar                                                                                      NA
## `SourceSouthwest Times`                                                                                  NA
## `SourceSowetan Live (press release) (registration) (blog)`                                               NA
## `SourceSpace Daily`                                                                                      NA
## `SourceSpace War`                                                                                        NA
## SourceSpace.com                                                                                          NA
## SourceSpaceDaily                                                                                         NA
## SourceSpaceNews                                                                                          NA
## SourceSpaceRef                                                                                           NA
## `SourceSpalding Guardian`                                                                                NA
## `SourceSPAMfighter News (press release)`                                                                 NA
## `SourceSpartanburg Herald-Journal`                                                                       NA
## SourceSpectator.co.uk                                                                                    NA
## `SourceSpectator.co.uk (blog)`                                                                           NA
## `SourceSpend Matters`                                                                                    NA
## SourceSpiked                                                                                             NA
## SourceSpin                                                                                               NA
## `SourceSplice Today`                                                                                     NA
## SourceSport24                                                                                            NA
## `SourceSporting Life`                                                                                    NA
## `SourceSporting News`                                                                                    NA
## `SourceSporting News via Yahoo UK & Ireland Sport`                                                       NA
## `SourceSporting News via Yahoo! Sports`                                                                  NA
## SourceSportingNews                                                                                       NA
## SourceSportingNews.com                                                                                   NA
## `SourceSports Illustrated`                                                                               NA
## `SourceSportsBusiness Daily (subscription)`                                                              NA
## SourceSportsGrid                                                                                         NA
## SourceSportskeeda                                                                                        NA
## `SourceSportskeeda via Yahoo! India News`                                                                NA
## SourceSportsnet.ca                                                                                       NA
## SourceSportTechie                                                                                        NA
## `SourceSpringfield News-Leader`                                                                          NA
## `SourceSputnik France`                                                                                   NA
## `SourceSputnik International`                                                                            NA
## `SourceSputnik UK`                                                                                       NA
## `SourceSputnik US`                                                                                       NA
## `SourceSQL Server Pro (blog)`                                                                            NA
## `SourceSri Lanka Guardian`                                                                               NA
## `SourceSt, Thomas Source`                                                                                NA
## `SourceSt. Albert Gazette`                                                                               NA
## `SourceSt. Augustine Record`                                                                             NA
## `SourceSt. Catharines Standard`                                                                          NA
## `SourceSt. Cloud Times`                                                                                  NA
## `SourceSt. George Daily Spectrum`                                                                        NA
## `SourceSt. Joseph News-Press`                                                                            NA
## `SourceSt. Louis Business Journal`                                                                       NA
## `SourceSt. Louis Business Journal (blog)`                                                                NA
## `SourceSt. Louis Jewish Light`                                                                           NA
## `SourceSt. Lucia News Online`                                                                            NA
## `SourceSt. Lucia Times Online News (press release)`                                                      NA
## `SourceSt. Petersburg Times Blogs`                                                                       NA
## `SourceSt. Thomas Times-Journal`                                                                         NA
## `SourceSTA - Slovenska Tiskovna Agencija (subscription)`                                                 NA
## `SourceStabroek News`                                                                                    NA
## `SourceStaff Newsletter`                                                                                 NA
## `SourceStaffing Industry Analysts`                                                                       NA
## `SourceStamford Advocate`                                                                                NA
## `SourceStanford Social Innovation Review (subscription)`                                                 NA
## `SourceStanford University News`                                                                         NA
## `SourceStanly News & Press`                                                                              NA
## SourceStar2.com                                                                                          NA
## SourceStarAfrica.com                                                                                     NA
## SourceStarpulse.com                                                                                      NA
## `SourceStarr 103.5 FM`                                                                                   NA
## `SourceStars and Stripes`                                                                                NA
## SourceStartups.co.uk                                                                                     NA
## SourceStartupSmart                                                                                       NA
## SourceSTAT                                                                                               NA
## `SourceState-Journal.com`                                                                                NA
## `SourceState Journal`                                                                                    NA
## `SourceState of the State KS (subscription)`                                                             NA
## `SourceStateImpact Oklahoma`                                                                             NA
## `SourceStatesman Journal`                                                                                NA
## `SourceSteelers Lounge (blog)`                                                                           NA
## SourceStepFeed                                                                                           NA
## SourceStevenspointjournal                                                                                NA
## SourceStevivor                                                                                           NA
## `SourceStillwater News Press`                                                                            NA
## `Sourcestiripesurse.ro (Comunicat de Pres\\u009d\\u009d)`                                                NA
## Sourcestjoechannel.com                                                                                   NA
## SourceSTLtoday.com                                                                                       NA
## `SourceStock & Land`                                                                                     NA
## `SourceStock Transcript`                                                                                 NA
## `SourceStock World`                                                                                      NA
## SourceStockhouse                                                                                         NA
## `SourceStockton Record (blog)`                                                                           NA
## SourceStorypick                                                                                          NA
## SourceStraight.com                                                                                       NA
## `SourceStraight.com (blog)`                                                                              NA
## `SourceStrategy Page`                                                                                    NA
## `Sourcestrategy+business (registration) (blog)`                                                          NA
## SourceSTRATFOR                                                                                           NA
## SourceStreamingMedia.com                                                                                 NA
## `SourceStreet Updates`                                                                                   NA
## `SourceStreetAuthority Network via Yahoo! Finance`                                                       NA
## SourceStreetInsider.com                                                                                  NA
## `SourceStreetInsider.com (blog)`                                                                         NA
## `SourceStreetsblog New York (blog)`                                                                      NA
## `SourceStreetWise Report`                                                                                NA
## `SourceStreetWise Report (press release)`                                                                NA
## SourceStuff                                                                                       1.000e-03
## SourceStuff.co.nz                                                                                        NA
## `SourceSturgis Journal`                                                                                  NA
## `SourceSTV News`                                                                                         NA
## Sourcestv.tv                                                                                             NA
## `SourceStyle News - StyleWatch - People.com`                                                             NA
## `SourceSud Ouest`                                                                                        NA
## `SourceSudan Tribune`                                                                                    NA
## SourceSudbury.com                                                                                        NA
## `SourceSun-Sentinel`                                                                                     NA
## `SourceSun Sentinel`                                                                                     NA
## `SourceSun Times National`                                                                               NA
## SourceSun.Star                                                                                           NA
## `SourceSunbury Daily Item`                                                                               NA
## `SourceSunday Business Post`                                                                             NA
## `SourceSunday Leader`                                                                                    NA
## `SourceSunday Observer`                                                                                  NA
## `SourceSunday World`                                                                                     NA
## `SourceSunderland Echo`                                                                                  NA
## SourceSunLive                                                                                            NA
## `SourceSunshine State News`                                                                              NA
## `SourceSupermarket News`                                                                                 NA
## `SourceSuperSite for Windows`                                                                            NA
## `SourceSupply Chain Management Review`                                                                   NA
## SourceSurferToday                                                                                        NA
## `SourceSustainable Brands`                                                                               NA
## `SourceSutherland Northern Times`                                                                        NA
## SourceSwampland                                                                                          NA
## SourceSwarajya                                                                                           NA
## `SourceSwarthmore College The Phoenix Online`                                                            NA
## Sourceswissinfo.ch                                                                                       NA
## `SourceSwitzer Financial News`                                                                           NA
## `SourceSydney Morning Herald`                                                                            NA
## `SourceSyracuse University News`                                                                         NA
## SourceSyracuse.com                                                                                       NA
## `SourceSyria Deeply`                                                                                     NA
## `Sourcet-online.de`                                                                                      NA
## `SourceT.H.E. Journal`                                                                                   NA
## SourceT3                                                                                                 NA
## `SourceTablet Magazine`                                                                                  NA
## `SourceTablet PC Review`                                                                                 NA
## `SourceTaipei Times`                                                                                     NA
## `SourceTaiwan Today`                                                                                     NA
## SourceTakePart                                                                                           NA
## `SourceTakePart.com via Yahoo! News`                                                                     NA
## `SourceTalkin' Cloud`                                                                                    NA
## SourceTallahassee.com                                                                                    NA
## SourceTameBay                                                                                            NA
## `SourceTampa Bay Business Journal`                                                                       NA
## `SourceTampa Bay Review`                                                                                 NA
## `SourceTampa Bay Times`                                                                                  NA
## SourceTampabay.com                                                                                       NA
## `SourceTampabay.com (blog)`                                                                              NA
## `SourceTaranaki Daily News`                                                                              NA
## `SourceTasmania Examiner`                                                                                NA
## `SourceTasnim News Agency (press release)`                                                               NA
## SourceTASS                                                                                               NA
## `SourceTax-News.com`                                                                                     NA
## SourceTBO.com                                                                                            NA
## SourceTCC                                                                                                NA
## SourceTCPalm                                                                                             NA
## SourceTDM.com                                                                                            NA
## `SourceTeague Chronicle`                                                                                 NA
## `SourceTech Cocktail`                                                                                    NA
## `SourceTech in Asia`                                                                                     NA
## `SourceTech Insider`                                                                                     NA
## `SourceTech Insider (blog)`                                                                              NA
## `SourceTech Insider via Yahoo UK & Ireland News`                                                         NA
## `SourceTech Media Network (Laptop) via Yahoo! News`                                                      NA
## `SourceTech Media Network (Tom&#39;s Guide) via Yahoo! News`                                             NA
## `SourceTech News Today`                                                                                  NA
## `SourceTech Page One`                                                                                    NA
## `SourceTech Pinas`                                                                                       NA
## `SourceTech Pro Research via Yahoo! News`                                                                NA
## `SourceTech Times`                                                                                       NA
## SourceTech.Co                                                                                            NA
## SourceTech2                                                                                              NA
## SourceTechCentral                                                                                        NA
## SourceTechcrunch                                                                                         NA
## SourceTechCrunch                                                                                  0.000e+00
## SourceTechdirt                                                                                           NA
## SourceTechEye                                                                                            NA
## SourceTechFrag                                                                                           NA
## SourceTechGadgetCentral                                                                                  NA
## SourceTechHive                                                                                           NA
## `SourceTechJuice (press release) (blog)`                                                                 NA
## SourceTechland                                                                                           NA
## SourceTechly                                                                                             NA
## `SourceTechnabob (blog)`                                                                                 NA
## SourceTechNewsWorld                                                                                      NA
## SourceTechNewsWorld.com                                                                                  NA
## SourceTechnical.ly                                                                                       NA
## `SourceTechnical.ly Brooklyn`                                                                            NA
## `SourceTechnical.ly Philly`                                                                              NA
## SourceTechnoBuffalo                                                                                      NA
## `SourceTechnology Personalized`                                                                          NA
## `SourceTechnology Review`                                                                                NA
## `SourceTechnology Zimbabwe`                                                                              NA
## `SourceTechpoint.ng (blog)`                                                                              NA
## SourceTechRadar                                                                                   0.000e+00
## `SourceTechradar India`                                                                                  NA
## SourceTechRepublic                                                                                       NA
## `SourceTechRepublic (blog)`                                                                              NA
## `SourceTechRepublic via Yahoo! Finance`                                                                  NA
## `SourceTechRepublic via Yahoo! News`                                                                     NA
## SourceTechRez                                                                                            NA
## SourceTechRitual                                                                                         NA
## SourceTechSpot                                                                                           NA
## SourceTechTarget                                                                                         NA
## `SourceTechTarget (blog)`                                                                                NA
## `SourceTechvibes (blog)`                                                                                 NA
## `SourceTechWeekEurope UK`                                                                                NA
## SourceTechwire.net                                                                                       NA
## SourceTechWorld                                                                                          NA
## SourceTechworm                                                                                           NA
## SourceTeenVogue.com                                                                                      NA
## `SourceTehran Times`                                                                                     NA
## `SourceTelecom Asia`                                                                                     NA
## `SourceTelecom Reseller (press release)`                                                                 NA
## Sourcetelecomasia.net                                                                                    NA
## `SourceTelecompaper (subscription)`                                                                      NA
## SourceTeleGeography                                                                                      NA
## `SourceTelegraph via Yahoo UK & Ireland Finance`                                                         NA
## SourceTelegraph.co.uk                                                                                    NA
## `SourceTelegraphStandard.com (blog)`                                                                     NA
## `SourceteleSUR English`                                                                                  NA
## SourceTempo                                                                                              NA
## SourceTempo.co                                                                                           NA
## `SourceTen Eyewitness News`                                                                              NA
## `SourceTerre Haute Tribune Star`                                                                         NA
## `SourceTES News`                                                                                         NA
## `SourceTest Tube`                                                                                        NA
## `SourceTewkesbury ADMAG`                                                                                 NA
## `SourceTexarkana Gazette`                                                                                NA
## `SourceTexas A&M The Battalion`                                                                          NA
## `SourceTexas Tribune`                                                                                    NA
## `SourceTG Daily`                                                                                         NA
## `SourceThaiVisa News`                                                                                    NA
## `SourceThanh Ni\\u009d\\u009dn`                                                                          NA
## `SourceThanh Nien Daily`                                                                                 NA
## `SourceThe-review`                                                                                       NA
## `SourceThe `                                                                                             NA
## `SourceThe Abbotsford News`                                                                              NA
## `SourceThe Actuary`                                                                                      NA
## `SourceThe Adam Smith Institute (blog)`                                                                  NA
## `SourceThe Advertiser`                                                                                   NA
## `SourceThe Advocate`                                                                                     NA
## `SourceThe Aero-News Network`                                                                            NA
## `SourceThe Africa Report`                                                                                NA
## `SourceThe Age`                                                                                          NA
## `SourceThe Albany Herald`                                                                                NA
## `SourceThe American Bazaar`                                                                              NA
## `SourceThe American Conservative`                                                                        NA
## `SourceThe American Genius`                                                                              NA
## `SourceThe American Lawyer`                                                                              NA
## `SourceThe American Prospect`                                                                            NA
## `SourceThe Ames Tribune`                                                                                 NA
## `SourceThe Arab Daily News`                                                                              NA
## `SourceThe Architect's Newspaper`                                                                        NA
## `SourceThe Arctic Journal`                                                                               NA
## `SourceThe Argentina Independent`                                                                        NA
## `SourceThe Argus-Press`                                                                                  NA
## `SourceThe Art Newspaper`                                                                                NA
## `SourceThe Art of Gears`                                                                                 NA
## `SourceThe Asia Foundation - In Asia`                                                                    NA
## `SourceThe Asia Sentinel`                                                                                NA
## `SourceThe Asian Age`                                                                                    NA
## `SourceThe Associated Press via Yahoo Canada Sports`                                                     NA
## `SourceThe Associated Press via Yahoo! Sports`                                                           NA
## `SourceThe Atlantic`                                                                                     NA
## `SourceThe Atlantic via Yahoo Canada News`                                                               NA
## `SourceThe Atlantic via Yahoo UK & Ireland News`                                                         NA
## `SourceThe Atlantic via Yahoo! News`                                                                     NA
## `SourceThe Augusta Chronicle`                                                                            NA
## `SourceThe Australian`                                                                                   NA
## `SourceThe Australian (blog)`                                                                            NA
## `SourceThe Australian (subscription)`                                                                    NA
## `SourceThe Australian (subscription) (blog)`                                                             NA
## `SourceThe Australian Financial Review`                                                                  NA
## `SourceThe Auto Channel`                                                                                 NA
## `SourceThe Bakersfield Californian`                                                                      NA
## `SourceThe Baltic Course`                                                                                NA
## `SourceThe Barrie Examiner`                                                                              NA
## `SourceThe Beacon`                                                                                       NA
## `SourceThe Bellingham Herald`                                                                            NA
## `SourceThe Big Lead`                                                                                     NA
## `SourceThe Biloxi Sun Herald`                                                                            NA
## `SourceThe Bitbag`                                                                                       NA
## `SourceThe Boar`                                                                                         NA
## `SourceThe Bolton News`                                                                                  NA
## `SourceThe Bookseller`                                                                                   NA
## `SourceThe Bookseller (blog)`                                                                            NA
## `SourceThe Border Mail`                                                                                  NA
## `SourceThe Borneo Post`                                                                                  NA
## `SourceThe Boston Globe`                                                                                 NA
## `SourceThe Bottom Line`                                                                                  NA
## `SourceThe Bournemouth Daily Echo`                                                                       NA
## `SourceThe Bozeman Daily Chronicle`                                                                      NA
## `SourceThe Bradford Era`                                                                                 NA
## `SourceThe Brantford Expositor`                                                                          NA
## `SourceThe BRICS Post`                                                                                   NA
## `SourceThe Brown Daily Herald`                                                                           NA
## `SourceThe Brussels Times`                                                                               NA
## `SourceThe Bubble`                                                                                       NA
## `SourceThe Buffalo News`                                                                                 NA
## `SourceThe Bulletin`                                                                                     NA
## `SourceThe Business of Fashion`                                                                          NA
## `SourceTHE BUSINESS TIMES`                                                                               NA
## `SourceThe Business Times Singapore`                                                                     NA
## `SourceThe Cairo Review of Global Affairs (blog)`                                                        NA
## `SourceThe California Aggie`                                                                             NA
## `SourceThe Cambodia Daily`                                                                               NA
## `SourceThe Cameron Herald`                                                                               NA
## `SourceThe Canadian Press via Yahoo Canada Finance`                                               0.000e+00
## `SourceThe Canadian Press via Yahoo Canada News`                                                         NA
## `SourceThe Canadian Press via Yahoo Canada Sports`                                                       NA
## `SourceThe Canberra Times`                                                                               NA
## `SourceThe Canton Repository`                                                                            NA
## `SourceThe Capital Journal`                                                                              NA
## `SourceThe Capitol Fax Blog (blog)`                                                                      NA
## `SourceThe Car Connection`                                                                               NA
## `SourceThe Cerbat Gem`                                                                                   NA
## `SourceThe Charleston Gazette`                                                                           NA
## `SourceThe Charlotte Post`                                                                               NA
## `SourceThe Chattanoogan`                                                                                 NA
## `SourceThe Cheat Sheet`                                                                                  NA
## `SourceThe Cherokeean Herald`                                                                            NA
## `SourceThe Chicago Maroon`                                                                               NA
## `SourceThe Chicago Monitor`                                                                              NA
## `SourceThe Christian Post`                                                                               NA
## `SourceThe Christian Science Monitor`                                                                    NA
## `SourceThe Christian Times`                                                                              NA
## `SourceThe Chronicle-Journal`                                                                            NA
## `SourceThe Chronicle-Telegram`                                                                           NA
## `SourceThe Chronicle Herald`                                                                             NA
## `SourceThe Chronicle Journal`                                                                            NA
## `SourceThe Citizen`                                                                                      NA
## `SourceThe Citizens&#39; Voice`                                                                          NA
## `SourceThe Climate Group`                                                                                NA
## `SourceThe Climate Group (blog)`                                                                         NA
## `SourceThe Coast`                                                                                        NA
## `SourceThe Coast Halifax`                                                                                NA
## `SourceThe Coldwater Daily Reporter`                                                                     NA
## `SourceThe College Fix`                                                                                  NA
## `SourceThe Colorado Independent`                                                                         NA
## `SourceThe Coloradoan`                                                                                   NA
## `SourceThe Columbian`                                                                                    NA
## `SourceThe Commercial Dispatch`                                                                          NA
## `SourceThe Compass`                                                                                      NA
## `SourceThe Concordian (subscription)`                                                                    NA
## `SourceThe Connecticut College Voice`                                                                    NA
## `SourceThe Connexion`                                                                                    NA
## `SourceThe Conroe Courier`                                                                               NA
## `SourceThe Consumerist`                                                                                  NA
## `SourceThe Conversation AU`                                                                              NA
## `SourceThe Conversation UK`                                                                              NA
## `SourceThe Conversation US`                                                                              NA
## `SourceThe Conversation via Yahoo!7 Finance`                                                             NA
## `SourceThe Copenhagen Post - Danish news in english`                                                     NA
## `SourceThe Corner Economic`                                                                              NA
## `SourceThe Cornishman`                                                                                   NA
## `SourceThe Courier`                                                                                      NA
## `SourceThe Courier-Journal`                                                                              NA
## `SourceThe Courier Life News`                                                                            NA
## `SourceThe Courier Mail`                                                                                 NA
## `SourceThe CT Mirror`                                                                                    NA
## `SourceThe Cubic Lane`                                                                                   NA
## `SourceThe Daily Advertiser`                                                                             NA
## `SourceThe Daily Banter`                                                                                 NA
## `SourceThe Daily Breeze`                                                                                 NA
## `SourceThe Daily Buzz via Yahoo Canada News`                                                             NA
## `SourceThe Daily Collegian Online`                                                                       NA
## `SourceThe Daily Comet`                                                                                  NA
## `SourceThe Daily Cougar`                                                                                 NA
## `SourceThe Daily Courier`                                                                                NA
## `SourceThe Daily Dot`                                                                                    NA
## `SourceThe Daily Free Press`                                                                             NA
## `SourceThe Daily Freeman`                                                                                NA
## `SourceThe Daily Gazette`                                                                                NA
## `SourceThe Daily Herald (press release)`                                                                 NA
## `SourceThe Daily Mercury`                                                                                NA
## `SourceThe Daily Mining Gazette`                                                                         NA
## `SourceThe Daily News Journal`                                                                           NA
## `SourceThe Daily News of Newburyport`                                                                    NA
## `SourceThe Daily Pennsylvanian`                                                                          NA
## `SourceThe Daily Progress`                                                                               NA
## `SourceThe Daily Reckoning`                                                                              NA
## `SourceThe Daily Record`                                                                                 NA
## `SourceThe Daily Reflector`                                                                              NA
## `SourceThe Daily Star`                                                                                   NA
## `SourceThe Daily Voice`                                                                                  NA
## `SourceThe Daily Vox (blog)`                                                                             NA
## `SourceThe Daily World`                                                                                  NA
## `SourceThe Day`                                                                                          NA
## `SourceThe Denver Channel`                                                                               NA
## `SourceThe Denver Post`                                                                                  NA
## `SourceThe Denver Post (blog)`                                                                           NA
## `SourceThe Desert Sun`                                                                                   NA
## `SourceThe Detroit News`                                                                                 NA
## `SourceThe Diane Rehm Show`                                                                              NA
## `SourceThe Dickinson Press`                                                                              NA
## `SourceThe Diplomat`                                                                                     NA
## `SourceThe Dismal Scientist (subscription)`                                                              NA
## `SourceThe Dominion Post`                                                                                NA
## `SourceThe Dorset Echo`                                                                                  NA
## `SourceThe Drive`                                                                                        NA
## `SourceThe Drum`                                                                                         NA
## `SourceThe Durango Herald`                                                                               NA
## `SourceThe Eagle Online`                                                                                 NA
## `SourceThe Echo`                                                                                         NA
## `SourceThe Ecologist`                                                                                    NA
## `SourceThe Economic Times`                                                                               NA
## `SourceThe Economist`                                                                                    NA
## `SourceThe Economist (blog)`                                                                             NA
## `SourceThe Edge`                                                                                         NA
## `SourceThe Edge Markets`                                                                                 NA
## `SourceThe Edge Markets MY`                                                                              NA
## `SourceThe Electronic Intifada`                                                                          NA
## `SourceThe Electronic Intifada (blog)`                                                                   NA
## `SourceThe Elkhart Truth`                                                                                NA
## `SourceThe Elkhart Truth (blog)`                                                                         NA
## `SourceThe Emory Wheel`                                                                                  NA
## `SourceThe Epoch Times`                                                                                  NA
## `SourceThe Escapist`                                                                                     NA
## `SourceThe Evening Sun`                                                                                  NA
## `SourceThe Examiner`                                                                                     NA
## `SourceThe Exponent Telegram (press release) (registration)`                                             NA
## `SourceThe Express Tribune`                                                                              NA
## `SourceThe Express Tribune (blog)`                                                                       NA
## `SourceThe FADER`                                                                                        NA
## `SourceThe Fayetteville Observer`                                                                        NA
## `SourceThe Federalist`                                                                                   NA
## `SourceThe FINANCIAL`                                                                                    NA
## `SourceThe Financial Express via Yahoo! Finance India`                                                   NA
## `SourceThe Fiscal Times`                                                                                 NA
## `SourceThe Fiscal Times via Yahoo UK & Ireland Finance`                                                  NA
## `SourceThe Fiscal Times via Yahoo! Finance`                                                              NA
## `SourceThe Fiscal Times via Yahoo! New Zealand Finance`                                                  NA
## `SourceThe Fiscal Times via Yahoo! News`                                                                 NA
## `SourceThe Fiscal Times via Yahoo!7 Finance`                                                             NA
## `SourceThe Flagship`                                                                                     NA
## `SourceThe Flamborough Review (press release) (registration)`                                            NA
## `SourceThe Flinders News`                                                                                NA
## `SourceThe Fort Campbell Courier`                                                                        NA
## `SourceThe Forward`                                                                                      NA
## `SourceThe Fresno Bee`                                                                                   NA
## `SourceThe Gadgeteer`                                                                                    NA
## `SourceThe Gadsden Times`                                                                                NA
## `SourceThe Gainesville Times`                                                                            NA
## `SourceThe Garden City Telegram`                                                                         NA
## `SourceThe GATE`                                                                                         NA
## `SourceThe Gateway Online`                                                                               NA
## `SourceThe Gazette`                                                                                      NA
## `SourceThe Gazette  Western University's Student Newspaper`                                              NA
## `SourceThe Gazette: Eastern Iowa Breaking News and Headlines`                                            NA
## `SourceThe Gilmer Mirror`                                                                                NA
## `SourceThe Gleaner`                                                                                      NA
## `SourceThe Global Herald`                                                                                NA
## `SourceThe Globalist`                                                                                    NA
## `SourceThe Globe and Mail`                                                                               NA
## `SourceThe Globe and Mail (subscription)`                                                                NA
## `SourceThe Grio`                                                                                         NA
## `SourceThe Guardian`                                                                                     NA
## `SourceThe Guardian (Australia)`                                                                         NA
## `SourceThe Guardian (blog)`                                                                              NA
## `SourceThe Guardian Charlottetown`                                                                       NA
## `SourceThe Guardian Nigeria (satire) (press release) (blog)`                                             NA
## `SourceThe Guru Investor`                                                                                NA
## `SourceThe Hacked News`                                                                                  NA
## `SourceThe Hamilton Journal News`                                                                        NA
## `SourceThe Hankyoreh`                                                                                    NA
## `SourceThe Hans India`                                                                                   NA
## `SourceThe Harvard Crimson`                                                                              NA
## `SourceThe Hazleton Standard-Speaker`                                                                    NA
## `SourceThe Heartland Institute`                                                                          NA
## `SourceThe Hechinger Report`                                                                             NA
## `SourceThe Heights`                                                                                      NA
## `SourceThe Henderson Daily News`                                                                         NA
## `SourceThe Hendersonville Times-News`                                                                    NA
## `SourceThe Herald`                                                                                       NA
## `SourceThe Herald-News`                                                                                  NA
## `SourceThe Herald-Times (subscription)`                                                                  NA
## `SourceThe Herald Bulletin`                                                                              NA
## `SourceThe Herald News`                                                                                  NA
## `SourceThe Hereford Times`                                                                               NA
## `SourceThe Hill`                                                                                         NA
## `SourceThe Hill (blog)`                                                                                  NA
## `SourceThe Hillsdale Daily News`                                                                         NA
## `SourceThe Hilltop News`                                                                                 NA
## `SourceThe Hindu`                                                                                        NA
## `SourceThe Hollywood Reporter`                                                                           NA
## `SourceThe Hollywood Reporter via Yahoo! News`                                                           NA
## `SourceThe Hollywood Source`                                                                             NA
## `SourceThe Holmes Report`                                                                                NA
## `SourceThe Houma Courier`                                                                                NA
## `SourceThe Hub at Johns Hopkins`                                                                         NA
## `SourceThe Huffington Post`                                                                              NA
## `SourceThe Huffington Post UK`                                                                           NA
## `SourceThe Huntington News`                                                                              NA
## `SourceThe Independent`                                                                                  NA
## `SourceThe Independent Florida Alligator`                                                                NA
## `SourceThe Indian Express`                                                                               NA
## `SourceThe Indian Express (blog)`                                                                        NA
## `SourceThe Indian Express via Yahoo! India News`                                                         NA
## `SourceThe Indian Panorama`                                                                              NA
## `SourceThe Indianapolis Star`                                                                            NA
## `SourceThe indy100`                                                                                      NA
## `SourceThe Inquirer`                                                                                     NA
## `SourceThe Inquisitr`                                                                                    NA
## `SourceThe Intelligencer / Wheeling News-Register`                                                       NA
## `SourceThe Intercept`                                                                                    NA
## `SourceThe Interpreter`                                                                                  NA
## `SourceThe Irish Catholic`                                                                               NA
## `Sourcethe Irish News`                                                                                   NA
## `SourceThe Irish Times`                                                                                  NA
## `SourceThe Irrawaddy News Magazine`                                                                      NA
## `SourceThe Ithaca Voice`                                                                                 NA
## `SourceThe Jacksonville Daily News`                                                                      NA
## `SourceThe Japan News`                                                                                   NA
## `SourceThe Japan Times`                                                                                  NA
## `SourceThe Jewish Journal of Greater Los Angeles`                                                        NA
## `SourceThe Jewish Press`                                                                                 NA
## `SourceThe Jewish Press (blog)`                                                                          NA
## `SourceThe Jewish Standard`                                                                              NA
## `SourceThe Jewish Star`                                                                                  NA
## `SourceThe Jewish Voice`                                                                                 NA
## `SourceThe Jewish Week`                                                                                  NA
## `SourceThe Journal`                                                                                      NA
## `SourceThe Journal News | LoHud.com`                                                                     NA
## `SourceThe Justice`                                                                                      NA
## `SourceThe Kansas City Star`                                                                             NA
## `SourceThe Keene Sentinel`                                                                               NA
## `SourceThe Killeen Daily Herald`                                                                         NA
## `SourceThe Kingston Whig-Standard`                                                                       NA
## `SourceThe Korea Herald`                                                                                 NA
## `SourceThe Korea Observer`                                                                               NA
## `SourceThe Lakeland Ledger`                                                                              NA
## `SourceThe Lawton Constitution`                                                                          NA
## `SourceThe Lawyer`                                                                                       NA
## `SourceThe Lawyer (registration)`                                                                        NA
## `SourceThe Ledger`                                                                                       NA
## `SourceThe Lens`                                                                                         NA
## `SourceThe Libertarian Republic`                                                                         NA
## `SourceThe Link`                                                                                         NA
## `SourceThe Local`                                                                                        NA
## `SourceThe Local Denmark`                                                                                NA
## `SourceThe Local.ch`                                                                                     NA
## `SourceThe Local.de`                                                                                     NA
## `SourceThe Local.es`                                                                                     NA
## `SourceThe Local.fr`                                                                                     NA
## `SourceThe Local.it`                                                                                     NA
## `SourceThe Local.se`                                                                                     NA
## `SourceThe London News Review`                                                                           NA
## `SourceThe Longview News-Journal`                                                                        NA
## `SourceThe Louisville Cardinal`                                                                          NA
## `SourceThe Mac Observer`                                                                                 NA
## `SourceThe Maitland Mercury`                                                                             NA
## `SourceThe Malay Mail Online via Yahoo! Singapore News`                                                  NA
## `SourceThe Malaysian Insider`                                                                            NA
## `SourceThe Malaysian Insider via Yahoo! Singapore News`                                                  NA
## `SourceThe Mancunion`                                                                                    NA
## `SourceThe Manila Times`                                                                                 NA
## `SourceThe Marijuana Times`                                                                              NA
## `SourceThe Market Mogul`                                                                                 NA
## `SourceThe Market Oracle`                                                                                NA
## `SourceThe Marshalltown`                                                                                 NA
## `SourceThe Mary Sue`                                                                                     NA
## `SourceThe Mass Media`                                                                                   NA
## `SourceThe Massachusetts Daily Collegian`                                                                NA
## `SourceThe McDowell News`                                                                                NA
## `SourceThe McGill International Review`                                                                  NA
## `SourceThe Mckeesport Daily News`                                                                        NA
## `SourceThe Media Line`                                                                                   NA
## `SourceThe Medina County Gazette`                                                                        NA
## `SourceThe Memo`                                                                                         NA
## `SourceThe Memphis Daily News`                                                                           NA
## `SourceThe Mercury`                                                                                      NA
## `SourceThe Mercury News`                                                                                 NA
## `SourceThe Merkle (blog)`                                                                                NA
## `SourceThe MetroWest Daily News`                                                                         NA
## `SourceThe Michigan Daily`                                                                               NA
## `SourceThe Milpitas Post`                                                                                NA
## `SourceThe Minnesota Daily`                                                                              NA
## `SourceThe Mission City Record`                                                                          NA
## `SourceThe Missoulian`                                                                                   NA
## `SourceThe MIT Tech`                                                                                     NA
## `SourceThe Moderate Voice`                                                                               NA
## `SourceThe Moose Jaw Times Herald`                                                                       NA
## `SourceThe Morganton News Herald`                                                                        NA
## `SourceThe Morning Call`                                                                                 NA
## `SourceThe Moscow Times`                                                                                 NA
## `SourceThe Moscow Times (registration)`                                                                  NA
## `SourceThe Motley Fool`                                                                                  NA
## `SourceThe Motley Fool Canada`                                                                           NA
## `SourceThe Muslim News`                                                                                  NA
## `SourceThe Narco News Bulletin`                                                                          NA
## `SourceThe Nashua Telegraph`                                                                             NA
## `SourceThe Nation`                                                                                       NA
## `SourceThe Nation - Thailand&#39;s English news`                                                  0.000e+00
## `SourceThe Nation (blog)`                                                                                NA
## `SourceThe Nation Newspaper`                                                                             NA
## `SourceThe Nation.`                                                                                      NA
## `SourceThe Nation. (blog)`                                                                               NA
## `SourceThe National`                                                                                     NA
## `SourceThe National Business Review`                                                                     NA
## `SourceThe National Enquirer`                                                                            NA
## `SourceThe National Interest Online`                                                                     NA
## `SourceThe National Interest Online (blog)`                                                              NA
## `SourceThe National Law Review`                                                                          NA
## `SourceThe National Memo (blog)`                                                                         NA
## `SourceThe Native American Times`                                                                        NA
## `SourceThe Nelson Mail`                                                                                  NA
## `SourceThe Neosho Daily News`                                                                            NA
## `SourceThe New American`                                                                                 NA
## `SourceThe New Canaan News`                                                                              NA
## `SourceThe New Civil Rights Movement`                                                                    NA
## `SourceThe New Daily`                                                                                    NA
## `SourceThe New Indian Express`                                                                           NA
## `SourceThe New Mexico Daily Lobo`                                                                        NA
## `SourceThe New Orleans Advocate`                                                                         NA
## `SourceThe New School News (blog)`                                                                       NA
## `SourceThe New Statesman`                                                                                NA
## `SourceThe New Times`                                                                                    NA
## `SourceThe New York Observer`                                                                            NA
## `SourceThe New York Review of Books`                                                                     NA
## `SourceThe New Yorker`                                                                                   NA
## `SourceThe New Yorker (satire)`                                                                          NA
## `SourceThe New Zealand Herald`                                                                           NA
## `SourceThe News`                                                                                         NA
## `SourceThe News-Press`                                                                                   NA
## `SourceThe News-Times`                                                                                   NA
## `SourceThe News & Observer`                                                                              NA
## `SourceThe News Center`                                                                                  NA
## `SourceThe News Herald`                                                                                  NA
## `SourceThe News Hub`                                                                                     NA
## `SourceThe News International`                                                                           NA
## `SourceThe News Journal`                                                                                 NA
## `SourceThe News Minute`                                                                                  NA
## `SourceThe News Tribune`                                                                                 NA
## `SourceThe News Tribune (blog)`                                                                          NA
## `SourceThe Next Digit`                                                                                   NA
## `SourceThe Next Silicon Valley`                                                                          NA
## `SourceThe Next Web`                                                                                     NA
## `SourceThe Nonprofit Quarterly (blog)`                                                                   NA
## `SourceThe Nordic Page`                                                                                  NA
## `SourceThe North Bay Nugget`                                                                             NA
## `SourceThe Northern Echo (registration)`                                                                 NA
## `SourceThe Northwest Florida Daily News`                                                                 NA
## `SourceThe Oakland Press`                                                                                NA
## `SourceThe Oberlin Review`                                                                               NA
## `SourceThe Observer-Dispatch`                                                                            NA
## `SourceThe Oceanside Post`                                                                               NA
## `SourceThe Oklahoma Daily`                                                                               NA
## `SourceThe Olympian`                                                                                     NA
## `SourceThe Onion (satire)`                                                                               NA
## `SourceThe Orator`                                                                                       NA
## `SourceThe Oshkosh Northwestern`                                                                         NA
## `SourceThe Ottawa Times`                                                                                 NA
## `SourceThe Oxford Times`                                                                                 NA
## `SourceThe Palm Beach Post`                                                                              NA
## `SourceThe Panther`                                                                                      NA
## `SourceThe Pappas Post`                                                                                  NA
## `SourceThe Pasadena Star-News`                                                                           NA
## `SourceThe Peak`                                                                                         NA
## `SourceThe People's Voice`                                                                               NA
## `SourceThe Philadelphia Inquirer`                                                                        NA
## `SourceThe Players Tribune`                                                                              NA
## `SourceThe Point Review`                                                                                 NA
## `SourceThe Portugal News`                                                                                NA
## `SourceThe Post`                                                                                         NA
## `SourceThe Post and Courier`                                                                             NA
## `SourceThe Predictive Analytics Times`                                                                   NA
## `SourceThe Press`                                                                                        NA
## `SourceThe Press-Enterprise`                                                                             NA
## `SourceThe Prince Albert Daily Herald`                                                                   NA
## `SourceThe Progressive Pulse`                                                                            NA
## `SourceThe Providence Journal`                                                                           NA
## `SourceThe Province`                                                                                     NA
## `SourceThe Province - BC - Victoria`                                                                     NA
## `SourceThe Punch`                                                                                        NA
## `SourceThe Queensland Times`                                                                             NA
## `SourceThe Rancher`                                                                                      NA
## `SourceThe Randolph County Herald-Tribune`                                                               NA
## `SourceThe Real News Network`                                                                            NA
## `SourceThe Real News Network (blog)`                                                                     NA
## `SourceThe Rebel`                                                                                        NA
## `SourceThe Record`                                                                                       NA
## `SourceThe Record (New Westminster)`                                                                     NA
## `SourceThe Recorder`                                                                                     NA
## `SourceThe Register`                                                                              0.000e+00
## `SourceThe Register-Guard`                                                                               NA
## `SourceThe Republic`                                                                                     NA
## `SourceThe Review`                                                                                       NA
## `SourceThe Ridgefield Press`                                                                             NA
## `SourceThe Ringer (blog)`                                                                                NA
## `SourceThe Rio Times`                                                                                    NA
## `SourceThe Robesonian`                                                                                   NA
## `SourceThe Rock Hill Herald`                                                                             NA
## `SourceThe Root`                                                                                         NA
## `SourceThe Root (blog)`                                                                                  NA
## `SourceThe Rude Baguette`                                                                                NA
## `SourceThe Rushville Republican`                                                                         NA
## `SourceThe Russellville Courier`                                                                         NA
## `SourceThe Sacramento Bee`                                                                               NA
## `SourceThe Salem News`                                                                                   NA
## `SourceThe Salinas Californian`                                                                          NA
## `SourceThe Salt Lake Tribune`                                                                            NA
## `SourceThe San Diego Union-Tribune`                                                                      NA
## `SourceThe San Gabriel Valley Tribune`                                                                   NA
## `SourceThe San Luis Obispo Tribune`                                                                      NA
## `SourceThe Sarasota Herald-Tribune`                                                                      NA
## `SourceThe Saratogian`                                                                                   NA
## `SourceThe Scotsman`                                                                                     NA
## `SourceThe Scranton Times-Tribune`                                                                       NA
## `SourceThe Seattle Times`                                                                                NA
## `SourceThe Sheboygan Press`                                                                              NA
## `SourceThe Shillong Times`                                                                               NA
## `SourceThe Siasat Daily`                                                                                 NA
## `SourceThe Simcoe Reformer`                                                                              NA
## `SourceThe Siver Times`                                                                                  NA
## `SourceThe Skanner`                                                                                      NA
## `SourceThe Slovak Spectator`                                                                             NA
## `SourceThe Sofia Globe`                                                                                  NA
## `SourceThe Source`                                                                                       NA
## `SourceThe Southern`                                                                                     NA
## `SourceThe Southland Times`                                                                              NA
## `SourceThe Spinoff`                                                                                      NA
## `SourceThe Spokesman-Review`                                                                             NA
## `SourceThe Spokesman Review (registration)`                                                              NA
## `SourceThe Stack`                                                                                        NA
## `SourceThe Standard`                                                                                     NA
## `SourceThe Standard Digital News (press release) (blog)`                                                 NA
## `SourceThe Standard Digital News (satire) (press release) (registration) (blog)`                         NA
## `Sourcethe star`                                                                                         NA
## `SourceThe Star`                                                                                         NA
## `SourceThe Star-Ledger`                                                                                  NA
## `SourceThe Star Online`                                                                                  NA
## `SourceThe Star, Kenya`                                                                                  NA
## `SourceThe State`                                                                                        NA
## `SourceThe State (blog)`                                                                                 NA
## `SourceThe State Journal-Register`                                                                       NA
## `SourceThe State News`                                                                                   NA
## `SourceThe Statesman`                                                                                    NA
## `SourceThe Straits Times`                                                                                NA
## `SourceThe Sudbury Star`                                                                                 NA
## `SourceThe Sun`                                                                                          NA
## `SourceThe Sun Daily`                                                                                    NA
## `SourceThe Sun Herald`                                                                                   NA
## `SourceThe Sunday Business Post`                                                                         NA
## `SourceThe Sunday Post`                                                                                  NA
## `SourceThe Sunday Times`                                                                                 NA
## `SourceThe Sunday Times Sri Lanka`                                                                       NA
## `SourceThe Sunshine Coast Daily`                                                                         NA
## `SourceThe Swedish Wire`                                                                                 NA
## `SourceThe Sydney Morning Herald`                                                                        NA
## `SourceThe Tablet`                                                                                       NA
## `SourceThe Takeaway (blog)`                                                                              NA
## `SourceThe Tampa  Tribune`                                                                               NA
## `SourceThe Tand D.com`                                                                                   NA
## `SourceThe Tech Portal`                                                                                  NA
## `SourceThe Tech Report, LLC`                                                                             NA
## `SourceThe Tech Report, LLC (blog)`                                                                      NA
## `SourceThe TechNews`                                                                                     NA
## `SourceThe Telegram`                                                                                     NA
## `SourceThe Telegraph`                                                                                    NA
## `SourceThe Temple News`                                                                                  NA
## `SourceThe Tennessean`                                                                                   NA
## `SourceThe Tico Times`                                                                                   NA
## `SourceThe Tidings`                                                                                      NA
## `SourceThe Times (subscription)`                                                                         NA
## `SourceThe Times and Democrat`                                                                           NA
## `SourceThe Times of India`                                                                               NA
## `SourceThe Times of Isra\\u009d\\u009dl`                                                                 NA
## `SourceThe Times of Israel`                                                                              NA
## `SourceThe Times of Israël`                                                                              NA
## `SourceThe Times of Israel (blog)`                                                                       NA
## `SourceThe Toledo Blade`                                                                                 NA
## `SourceThe Trace`                                                                                        NA
## `SourceThe Tribune`                                                                                      NA
## `SourceThe Trinidad Guardian`                                                                            NA
## `SourceThe Truro Daily News`                                                                             NA
## `SourceThe Tuscaloosa News`                                                                              NA
## `SourceThe Tyee`                                                                                         NA
## `SourceThe UCSD Guardian Online`                                                                         NA
## `SourceThe Ulster Herald`                                                                                NA
## `SourceThe Undefeated`                                                                                   NA
## `SourceThe Union Leader`                                                                                 NA
## `SourceThe Union of Grass Valley`                                                                        NA
## `SourceThe Uniontown Herald Standard`                                                                    NA
## `SourceThe University of Hawaii Kaleo`                                                                   NA
## `SourceThe Unofficial Apple Weblog`                                                                      NA
## `SourceThe VAR Guy`                                                                                      NA
## `SourceThe Verge`                                                                                        NA
## `SourceThe Verge via Yahoo Canada News`                                                                  NA
## `SourceThe Verge via Yahoo! News`                                                                 0.000e+00
## `SourceThe Vermilion`                                                                                    NA
## `SourceThe Vermont Standard`                                                                             NA
## `SourceThe Victoria Advocate`                                                                            NA
## `SourceThe Vista Voice`                                                                                  NA
## `SourceThe Voice Herald (blog)`                                                                          NA
## `SourceThe Voice Observer (blog)`                                                                        NA
## `SourceThe Voice of Millions`                                                                            NA
## `SourceThe Wahpeton Daily News`                                                                          NA
## `SourceThe Wall Street Journal`                                                                   9.491e+07
## `SourceThe Wall Street Journal via Yahoo Canada Finance`                                                 NA
## `SourceThe Wall Street Journal via Yahoo UK & Ireland Finance`                                           NA
## `SourceThe Wall Street Journal via Yahoo! Finance`                                                       NA
## `SourceThe Wall Street Journal via Yahoo! Finance India`                                                 NA
## `SourceThe Wall Street Journal via Yahoo! New Zealand Finance`                                           NA
## `SourceThe Wall Street Journal via Yahoo! News`                                                          NA
## `SourceThe Wall Street Journal via Yahoo!7 Finance`                                                      NA
## `SourceThe Washington Times`                                                                             NA
## `SourceThe Wayne Independent`                                                                            NA
## `SourceThe Weather Channel`                                                                              NA
## `SourceThe Weather Network`                                                                              NA
## `SourceThe Weed Blog (blog)`                                                                             NA
## `SourceThe Week Magazine`                                                                                NA
## `SourceThe Week UK`                                                                                      NA
## `SourceThe Weekly Standard`                                                                              NA
## `SourceThe Weekly Standard (blog)`                                                                       NA
## `SourceThe Wesleyan Argus`                                                                               NA
## `SourceThe West Australian`                                                                              NA
## `SourceThe West Australian via Yahoo!7 News`                                                             NA
## `SourceThe Westerly Sun`                                                                                 NA
## `SourceThe Whistler`                                                                                     NA
## `SourceThe White House`                                                                                  NA
## `SourceThe White House (blog)`                                                                           NA
## `SourceThe Wire`                                                                                         NA
## `SourceThe Worldfolio`                                                                                   NA
## `SourceThe Wrap via Yahoo Celebrity`                                                                     NA
## `SourceThe Youngstown Vindicator`                                                                        NA
## `SourceThe Yucatan Times`                                                                                NA
## `SourceThe Zimbabwe Standard`                                                                            NA
## `SourceThe Zimbabwean`                                                                                   NA
## SourceTheBlaze.com                                                                                       NA
## SourceTheCable                                                                                           NA
## SourceTheChronicleHerald.ca                                                                              NA
## SourceTheCork.ie                                                                                         NA
## SourceThefairfieldrecorder                                                                               NA
## SourceThegardenisland.com                                                                                NA
## SourceTheHorse.com                                                                                       NA
## `SourceTheHostingNews.com (press release) (blog)`                                                        NA
## SourceThehour.com                                                                                        NA
## Sourcetheifp.ca                                                                                          NA
## Sourcethejournal.ie                                                                                      NA
## `SourceTheJournal.ie via Yahoo UK & Ireland Finance`                                                     NA
## `SourceTheJournal.ie via Yahoo UK & Ireland News`                                                        NA
## SourceThelakeandeswave                                                                                   NA
## Sourcethenews.pl                                                                                         NA
## SourceTheParliamentMagazine.eu                                                                           NA
## SourceThePoultrySite.com                                                                                 NA
## Sourcethepridela.com                                                                                     NA
## SourceTheSouthAfrican                                                                                    NA
## SourceTheSportsCampus.com                                                                                NA
## SourceTheStranger.com                                                                                    NA
## `SourceTheStranger.com (blog)`                                                                           NA
## SourceTheStreet.com                                                                               0.000e+00
## SourceTheTower.org                                                                                       NA
## SourcetheTrumpet.com                                                                                     NA
## SourceTheTyee.ca                                                                                         NA
## SourceThevillagessuntimes                                                                                NA
## SourceTheWrap                                                                                            NA
## SourceThinkAdvisor                                                                                       NA
## SourceThinkProgress                                                                                      NA
## `SourceThird Sector`                                                                                     NA
## `SourceThis is Bristol`                                                                                  NA
## `SourceThis is Money`                                                                                    NA
## `SourceThis Is Money`                                                                                    NA
## `SourceThis is Oxfordshire`                                                                              NA
## `SourceTHISDAY Live`                                                                                     NA
## `SourceThomas Reuters Fondation`                                                                         NA
## SourceThomasNet                                                                                   6.711e+07
## `SourceThomson Reuters Foundation`                                                                       NA
## `SourceThomson Reuters StreetEvents via Yahoo! Finance`                                                  NA
## SourceThreatpost                                                                                         NA
## `SourceThurrott.com (blog)`                                                                              NA
## SourceTHV11.com                                                                                          NA
## `SourceTickerTV News (press release)`                                                                    NA
## SourceTidBITS                                                                                            NA
## `SourceTimaru Herald`                                                                                    NA
## SourceTIME                                                                                               NA
## `SourceTime Magazine`                                                                             0.000e+00
## `SourceTimes Colonist`                                                                                   NA
## `SourceTimes Daily`                                                                                      NA
## `SourceTimes Higher Education (THE)`                                                                     NA
## `SourceTimes Leader`                                                                                     NA
## `SourceTimes LIVE`                                                                                       NA
## `SourceTimes News`                                                                                       NA
## `SourceTimes Now.tv`                                                                                     NA
## `SourceTimes of India`                                                                                   NA
## `SourceTimes of India (blog)`                                                                            NA
## `SourceTimes of Malta`                                                                                   NA
## `SourceTimes of Malta (blog)`                                                                            NA
## `SourceTimes of Oman`                                                                                    NA
## `SourceTimes Record`                                                                                     NA
## `SourceTimes Record (subscription)`                                                                      NA
## `SourceTimes Record News`                                                                                NA
## SourceTimesonline.com                                                                                    NA
## `SourceTimmins Press`                                                                                    NA
## SourceTMZ.com                                                                                            NA
## SourceTnooz                                                                                              NA
## `SourceToday's Zaman`                                                                                    NA
## `SourceToday in Bermuda`                                                                                 NA
## SourceToday.com                                                                                          NA
## SourceTODAY.ng                                                                                           NA
## SourceTODAYonline                                                                                        NA
## `SourceToledo Blade`                                                                                     NA
## `SourceToledo News Now`                                                                                  NA
## `SourceTom's Guide`                                                                                      NA
## `SourceTom's Hardware`                                                                                   NA
## `SourceToowoomba Chronicle`                                                                              NA
## `SourceTop Tech News`                                                                                    NA
## `SourceTopeka Capital Journal`                                                                           NA
## `SourceTopsail Voice`                                                                                    NA
## `SourceToronto Star`                                                                                     NA
## `SourceToronto Sun`                                                                                      NA
## `SourceTorque News`                                                                                      NA
## SourceTorrentFreak                                                                                       NA
## `SourceTouch Arcade`                                                                                     NA
## `SourceToward Freedom`                                                                                   NA
## SourceTowleroad                                                                                          NA
## `SourceTown Hall`                                                                                        NA
## `SourceTownsville Bulletin`                                                                              NA
## SourceTPM                                                                                                NA
## `SourceTPM (blog)`                                                                                       NA
## `SourceTrade Arabia`                                                                                     NA
## `SourceTrade Calls`                                                                                      NA
## `SourceTrades Union Congress`                                                                            NA
## SourceTradingFloor.com                                                                                   NA
## `SourceTrak.in (blog)`                                                                                   NA
## `SourceTransport Topics Online`                                                                          NA
## `SourceTravel Daily News International`                                                                  NA
## `SourceTravel Weekly`                                                                                    NA
## `SourceTravel+Leisure`                                                                                   NA
## SourceTravelersToday                                                                                     NA
## `SourceTravelGBI (press release) (blog)`                                                                 NA
## SourceTraveller                                                                                          NA
## `SourceTraverse City Record Eagle`                                                                       NA
## SourceTravolution                                                                                        NA
## SourceTreehugger                                                                                         NA
## SourceTrefis                                                                                             NA
## `SourceTrend News Agency`                                                                                NA
## `SourceTri-City Herald`                                                                                  NA
## `SourceTri County Leader`                                                                                NA
## `SourceTriad Business Journal (blog)`                                                                    NA
## `SourceTriangle Business Journal`                                                                        NA
## `SourceTribune-Review`                                                                                   NA
## SourceTrinicenter.com                                                                                    NA
## `SourceTrinidad & Tobago Express`                                                                        NA
## `SourceTrinidad Guardian`                                                                                NA
## `SourceTriple Pundit (registration) (blog)`                                                              NA
## SourceTristatehomepage.com                                                                               NA
## `SourceTriValley Central`                                                                                NA
## `SourceTRT World`                                                                                        NA
## SourceTruckingInfo.com                                                                                   NA
## SourceTrueAchievements                                                                                   NA
## SourceTRUNEWS                                                                                            NA
## SourceTrustedReviews                                                                                     NA
## `SourceTruth-Out`                                                                                        NA
## `SourceTruth In Media`                                                                                   NA
## SourceTruthdig                                                                                           NA
## `SourceTSA - Tout Sur l'Alg\\u009d\\u009drie`                                                            NA
## `SourceTucson News Now`                                                                                  NA
## `SourceTucson Weekly`                                                                                    NA
## SourceTudocelular.com                                                                                    NA
## `SourceTufts Daily`                                                                                      NA
## `SourceTulsa World`                                                                                      NA
## `SourceTunisia Live`                                                                                     NA
## `SourceTuoitrenews (press release)`                                                                      NA
## `SourceTurkish Review`                                                                                   NA
## `SourceTuscaloosa News (subscription)`                                                                   NA
## `SourceTV Guide (blog)`                                                                                  NA
## `SourceTV Newsroom`                                                                                      NA
## `SourceTV Technology`                                                                                    NA
## SourceTVbytheNumbers                                                                                     NA
## SourceTVLine                                                                                             NA
## SourceTVNewser                                                                                           NA
## SourceTVNZ                                                                                               NA
## SourceTVPredictions.com                                                                                  NA
## `SourceTWC News`                                                                                         NA
## `SourceTWCN Tech News (blog)`                                                                            NA
## SourceTweakTown                                                                                          NA
## SourceTwice                                                                                              NA
## `SourceTwin Falls Times-News`                                                                            NA
## `SourceTwinCities.com-Pioneer Press`                                                                     NA
## SourceTwinfinite                                                                                         NA
## `SourceTwitchFilm (blog)`                                                                                NA
## SourceTwitchy                                                                                            NA
## SourceTwoCircles.net                                                                                     NA
## `SourceTyler Morning Telegraph`                                                                          NA
## `SourceU-T San Diego`                                                                                    NA
## `SourceU of M News Service`                                                                              NA
## `SourceU.S. Department of Education (press release)`                                                     NA
## `SourceU.S. Department of Education (press release) (blog)`                                              NA
## `SourceU.S. EPA.gov (press release)`                                                                     NA
## `SourceU.S. News & World Report`                                                                         NA
## `SourceU.S. News & World Report (blog)`                                                                  NA
## `SourceU.S.News & World Report via Yahoo! News`                                                          NA
## SourceU.TV                                                                                               NA
## SourceUbergizmo                                                                                          NA
## `SourceUC Davis`                                                                                         NA
## `SourceUC Los Angeles`                                                                                   NA
## `SourceUC Merced University News`                                                                        NA
## `SourceUCalgary News`                                                                                    NA
## `SourceUChicago News`                                                                                    NA
## `SourceUD Daily`                                                                                         NA
## `SourceUGA Today`                                                                                        NA
## `SourceUK Fundraising`                                                                                   NA
## `SourceUKNow (press release)`                                                                            NA
## `SourceUkraine Today`                                                                                    NA
## `SourceUloop News`                                                                                       NA
## `SourceUltimate-Guitar.Com`                                                                              NA
## Sourceummid.com                                                                                          NA
## `SourceUN Dispatch`                                                                                      NA
## `SourceUN News Centre`                                                                                   NA
## `SourceUncover California`                                                                               NA
## SourceUNCTAD                                                                                             NA
## `SourceUND The Dakota Student`                                                                           NA
## `SourceUndercurrent News`                                                                                NA
## `SourceUnion of Concerned Scientists`                                                                    NA
## `SourceUnionOracle.com (blog)`                                                                           NA
## `SourceUniontown Herald Standard`                                                                        NA
## `SourceUnited Nations`                                                                                   NA
## `SourceUniverse Today`                                                                                   NA
## `SourceUniversity Herald`                                                                                NA
## `SourceUniversity of Delaware`                                                                           NA
## `SourceUniversity of Delaware Review`                                                                    NA
## `SourceUniversity of St. Thomas Newsroom`                                                                NA
## `SourceUniversity of Virginia`                                                                           NA
## `SourceUniversity of Virginia The Cavalier Daily`                                                        NA
## `SourceUniversity World News`                                                                            NA
## `SourceUNM Newsroom`                                                                                     NA
## SourceUPI                                                                                                NA
## SourceUPI.com                                                                                            NA
## SourceUpperMichigansSource.com                                                                           NA
## SourceUPROXX                                                                                             NA
## `SourceUPROXX via Yahoo! News`                                                                           NA
## `SourceUPROXX via Yahoo! Sports`                                                                         NA
## SourceUpstart                                                                                            NA
## `SourceUpstate Business Journal`                                                                         NA
## `SourceUpstream Online`                                                                                  NA
## SourceUpvoted                                                                                            NA
## SourceUpworthy                                                                                           NA
## `SourceUQ News`                                                                                          NA
## `SourceUrban Land`                                                                                       NA
## `SourceUrgent Communications`                                                                            NA
## `SourceUS 99.5`                                                                                          NA
## `SourceUS News & World Report`                                                                           NA
## `SourceUs Weekly`                                                                                        NA
## `SourceUS Weekly`                                                                                        NA
## `SourceUSA Today`                                                                                        NA
## `SourceUSA TODAY`                                                                                -9.491e+07
## `SourceUSA TODAY College`                                                                                NA
## `SourceUSA TODAY High School Sports`                                                                     NA
## `SourceUSAPP American Politics and Policy (blog)`                                                        NA
## `SourceUSDA.gov (press release)`                                                                         NA
## `SourceUSDA.gov (press release) (blog)`                                                                  NA
## `SourceUSgamer (satire) (registration) (blog)`                                                           NA
## `SourceUSNI News`                                                                                        NA
## `SourceuSwitch.com (Tech)`                                                                               NA
## `SourceUT The Daily Texan`                                                                               NA
## `SourceUTA The Shorthorn`                                                                                NA
## `SourceUtah Business`                                                                                    NA
## SourceUTDailyBeacon.com                                                                                  NA
## `SourceUtility Dive`                                                                                     NA
## `SourceUtne Reader Online`                                                                               NA
## `SourceUTV Ireland`                                                                                      NA
## `SourceUTV Ireland (blog)`                                                                               NA
## Sourceuuworld.org                                                                                        NA
## `SourceUW Badger Herald`                                                                                 NA
## `SourceUW Today`                                                                                         NA
## SourceV3.co.uk                                                                                           NA
## `SourceValdosta Daily Times`                                                                             NA
## `SourceValley Advocate`                                                                                  NA
## `SourceValley morning Star`                                                                              NA
## `SourceValley News`                                                                                      NA
## `SourceValley News Live`                                                                                 NA
## SourceValueWalk                                                                                          NA
## `SourceVancity Buzz`                                                                                     NA
## `SourceVancouver Sun`                                                                                    NA
## `SourceVancouver Sun (blog)`                                                                             NA
## SourceVanguard                                                                                           NA
## `SourceVanity Fair`                                                                                      NA
## SourceVariety                                                                                            NA
## `SourceVariety via Yahoo! Finance`                                                                0.000e+00
## `SourceVatican Radio`                                                                                    NA
## SourceVatorNews                                                                                          NA
## SourceVEJA.com                                                                                           NA
## SourceVenezuelanalysis.com                                                                               NA
## `SourceVentura County Star`                                                                              NA
## `SourceVenture Capital Post`                                                                             NA
## SourceVentureBeat                                                                                        NA
## `SourceVentures Africa`                                                                                  NA
## SourceVentureVillage                                                                                     NA
## `SourceVenues Today`                                                                                     NA
## `SourceVera Files`                                                                                       NA
## `SourceVermont Public Radio`                                                                             NA
## SourceVG247                                                                                              NA
## SourceVibe                                                                                               NA
## `SourceVibe Magazine`                                                                                    NA
## SourceVICE                                                                                               NA
## `SourceVICE (blog)`                                                                                      NA
## `SourceVICE News`                                                                                        NA
## `SourceVictor Post`                                                                                      NA
## SourceVideogamer.com                                                                                     NA
## SourceVideoNewsUs                                                                                        NA
## `SourceViet Nam News`                                                                                    NA
## `SourceVietnam Plus`                                                                                     NA
## `SourceVietNamNet Bridge`                                                                                NA
## `SourceVillage Voice`                                                                                    NA
## `SourceVine Report`                                                                                      NA
## `SourceVineland Daily Journal`                                                                           NA
## `SourceVineyard Gazette`                                                                                 NA
## `SourceVirgin Islands Daily News`                                                                        NA
## `SourceVirginia Gazette`                                                                                 NA
## `SourceVirginian-Pilot`                                                                                  NA
## `SourceVirtualization Review`                                                                            NA
## `SourceVirtualization Review (blog)`                                                                     NA
## `SourceVisionMobile (blog)`                                                                              NA
## SourceVnExpress                                                                                          NA
## `SourceVOA Khmer (English)`                                                                              NA
## `SourceVOA Learning English`                                                                             NA
## `SourceVOA News`                                                                                         NA
## `SourceVOA Ting Vit`                                                                                     NA
## `SourceVOA Zimbabwe`                                                                                     NA
## SourceVocativ                                                                                            NA
## SourceVOCM                                                                                               NA
## SourceVogue.co.uk                                                                                        NA
## SourceVogue.com                                                                                          NA
## `SourceVoice & Data Online`                                                                              NA
## `SourceVoice Chronicle`                                                                                  NA
## `SourceVoice of America`                                                                                 NA
## `SourceVoice of America (blog)`                                                                          NA
## `SourceVoice of San Diego`                                                                               NA
## Sourcevoiceofdetroit                                                                                     NA
## `SourceVoltaire Network`                                                                                 NA
## SourceVox                                                                                                NA
## `SourceVR-Zone`                                                                                          NA
## `SourceVR World`                                                                                         NA
## SourceVRFocus                                                                                            NA
## Sourcevtdigger.org                                                                                       NA
## `SourceVulcan Post (press release)`                                                                      NA
## SourceVulture                                                                                            NA
## `SourceW*USA 9`                                                                                          NA
## `SourceWA today`                                                                                         NA
## `SourceWABC-TV`                                                                                          NA
## `SourceWABC-TV New York`                                                                                 NA
## `SourceWABE 90.1 FM`                                                                                     NA
## SourceWACH.com                                                                                           NA
## `SourceWaco Tribune-Herald`                                                                              NA
## `SourceWAFA - Palestine News Agency`                                                                     NA
## SourceWAFF                                                                                               NA
## `SourceWAFF 48 News Huntsville`                                                                          NA
## `SourceWaging Nonviolence`                                                                               NA
## SourceWAGM                                                                                               NA
## `SourceWaikato Times`                                                                                    NA
## Sourcewajr                                                                                               NA
## `SourceWakefield Express`                                                                                NA
## `SourceWakey Wakey News`                                                                                 NA
## `SourceWALB Albany`                                                                                      NA
## SourceWalesOnline                                                                                        NA
## `SourceWall Street 24`                                                                                   NA
## `SourceWall Street Daily`                                                                                NA
## `SourceWall Street Journal`                                                                              NA
## `SourceWall Street Journal (blog)`                                                                       NA
## `SourceWall Street Journal (subscription)`                                                               NA
## `SourceWall Street Journal (subscription) (blog)`                                                        NA
## `SourceWall Street Journal Blogs`                                                                        NA
## `SourceWall Street Pit`                                                                                  NA
## `SourceWalla Walla Union-Bulletin`                                                                       NA
## SourceWaltonian                                                                                          NA
## SourceWAMC                                                                                               NA
## SourceWamda                                                                                              NA
## SourceWAND                                                                                               NA
## `SourceWandsworth Guardian`                                                                              NA
## SourceWANE                                                                                               NA
## SourceWAOW                                                                                               NA
## `SourceWAPT Jackson`                                                                                     NA
## SourceWarc                                                                                               NA
## `SourceWard's Auto`                                                                                      NA
## SourceWareable                                                                                           NA
## `SourceWarsaw Business Journal`                                                                          NA
## `SourceWashington Blade`                                                                                 NA
## `SourceWashington Business Journal`                                                                      NA
## `SourceWashington City Paper`                                                                            NA
## `SourceWashington City Paper (blog)`                                                                     NA
## `SourceWashington Examiner`                                                                              NA
## `SourceWashington Free Beacon`                                                                           NA
## `SourceWashington Free Beacon (blog)`                                                                    NA
## `SourceWashington News Wire`                                                                             NA
## `SourceWashington Post`                                                                           0.000e+00
## `SourceWashington Post (blog)`                                                                           NA
## `SourceWashington Times`                                                                                 NA
## SourceWashingtonian.com                                                                                  NA
## `SourceWaste Management World`                                                                           NA
## Sourcewaste360                                                                                           NA
## SourceWatchdog.org                                                                                       NA
## `SourceWATE 6 On Your Side`                                                                              NA
## `SourceWaterbury Republican American`                                                                    NA
## `SourceWaterloo Cedar Falls Courier`                                                                     NA
## `SourceWaterloo Record`                                                                                  NA
## `SourceWatertown Daily Times`                                                                            NA
## SourceWatertownDailyTimes.com                                                                            NA
## `SourceWausau Daily Herald`                                                                              NA
## `SourceWAVE 3`                                                                                           NA
## `SourceWAVE 3 Louisville`                                                                                NA
## `SourceWAVY-TV`                                                                                          NA
## `SourceWaxahachie Daily Light`                                                                           NA
## `SourceWaynesville Daily Guide`                                                                          NA
## `SourceWBAL-TV Baltimore`                                                                                NA
## `SourceWBAL Baltimore`                                                                                   NA
## `SourceWBAL Radio`                                                                                       NA
## SourceWBAY                                                                                               NA
## SourceWBEZ                                                                                               NA
## `SourceWBEZ 91.5 Chicago`                                                                                NA
## SourceWBFO                                                                                               NA
## `SourceWBIR-TV`                                                                                          NA
## SourceWBIR.com                                                                                           NA
## `SourceWBNS-10TV Columbus`                                                                               NA
## `SourceWBOC TV 16`                                                                                       NA
## `SourceWBOY-TV`                                                                                          NA
## `SourceWBRC FOX6 News - WBRC.com`                                                                        NA
## SourceWBT                                                                                                NA
## SourceWBTV                                                                                               NA
## `SourceWBTV Charlotte`                                                                                   NA
## SourceWBUR                                                                                               NA
## `SourceWBUR Boston`                                                                                      NA
## SourceWBXH                                                                                               NA
## `SourceWCAV Charlottesville`                                                                             NA
## SourceWCAX                                                                                               NA
## `SourceWCAX-TV Vermont`                                                                                  NA
## `SourceWCBD News 2`                                                                                      NA
## SourceWCCFtech                                                                                           NA
## `SourceWCCFtech (blog)`                                                                                  NA
## SourceWCPO                                                                                               NA
## `SourceWCSH-TV`                                                                                          NA
## SourceWCSH6.com                                                                                          NA
## `SourceWCSM Radio`                                                                                       NA
## SourceWCTV                                                                                               NA
## `SourceWCVB Boston`                                                                              -6.711e+07
## SourceWCYB                                                                                               NA
## `SourceWDAM-TV`                                                                                          NA
## SourceWDAY                                                                                               NA
## SourceWDBJ7                                                                                              NA
## `SourceWDIV Detroit`                                                                                     NA
## SourceWDRB                                                                                               NA
## `SourceWDSU New Orleans`                                                                                 NA
## SourceWDTN                                                                                               NA
## SourceWDTV                                                                                               NA
## `SourceWe Got This Covered`                                                                              NA
## `SourceWe Live Security (blog)`                                                                          NA
## `SourceWe Up It`                                                                                         NA
## SourceWeAreGreenBay.com                                                                                  NA
## `SourceWeAreTheCity (press release) (blog)`                                                              NA
## SourceWeatherWatch.co.nz                                                                                 NA
## SourceWEAU                                                                                               NA
## `SourceWEAU Eau Claire`                                                                                  NA
## `SourceWeb Host Industry Review`                                                                         NA
## `SourceWeb India`                                                                                        NA
## SourceWebMD                                                                                              NA
## SourceWebProNews                                                                                         NA
## `SourceWebster Journal`                                                                                  NA
## `SourceWECT-TV6`                                                                                         NA
## `SourceWECT 6 Wilmington`                                                                                NA
## `SourceWeekly Times Now`                                                                                 NA
## `SourceWESH 2 Orlando`                                                                                   NA
## `SourceWESH Orlando`                                                                                     NA
## `SourceWest Central Tribune`                                                                             NA
## `SourceWest Virginia MetroNews`                                                                          NA
## `SourceWestern Advocate`                                                                                 NA
## `SourceWestern Journalism`                                                                               NA
## `SourceWestern Morning News`                                                                             NA
## `SourceWestern Producer (subscription)`                                                                  NA
## `SourceWestern Star`                                                                                     NA
## `SourceWestern Telegraph`                                                                                NA
## SourceWesternSlopeNow                                                                                    NA
## `SourceWestfair Online`                                                                                  NA
## `SourceWestlaw Insider (blog)`                                                                           NA
## `SourceWestside Gazette`                                                                                 NA
## `SourceWestside Today`                                                                                   NA
## `SourceWeyburn Review`                                                                                   NA
## SourceWFAA                                                                                               NA
## SourceWFAA.com                                                                                           NA
## SourceWFDD                                                                                               NA
## `SourceWFLX FOX 29`                                                                                      NA
## SourceWFMJ                                                                                               NA
## `SourceWFMJ Youngstown`                                                                                  NA
## SourceWFMYNews2.com                                                                                      NA
## `SourceWFMZ Allentown`                                                                                   NA
## `SourceWFMZ Eastern Pennsylvania and Western New Jersey`                                                 NA
## SourceWFSB                                                                                               NA
## `SourceWFTV Orlando`                                                                                     NA
## SourceWFXG.com                                                                                           NA
## `SourceWGAL 8 Susquehanna Valley`                                                                        NA
## `SourceWGBA-TV`                                                                                          NA
## SourceWGEM                                                                                               NA
## `SourceWGEM Quincy`                                                                                      NA
## SourceWGME                                                                                               NA
## `SourceWGN-TV`                                                                                           NA
## `SourceWGN Radio`                                                                                        NA
## `SourceWGN TV Chicago`                                                                                   NA
## SourceWGNO                                                                                               NA
## SourceWGRZ.com                                                                                           NA
## `SourceWHAS 11.com (subscription)`                                                                       NA
## SourceWHAS11.com                                                                                         NA
## SourceWhatCulture                                                                                        NA
## SourceWhaTech                                                                                            NA
## `SourceWHDH-TV`                                                                                          NA
## SourceWheels.ca                                                                                          NA
## `SourceWhich-50 (blog)`                                                                                  NA
## `SourceWHIO-TV 7 Dayton`                                                                                 NA
## `SourceWhite House Dossier`                                                                              NA
## `SourceWhitehorse Star (subscription)`                                                                   NA
## `SourceWhitehouse.gov (press release)`                                                                   NA
## `SourceWHNT-TV Huntsville`                                                                               NA
## Sourcewhnt.com                                                                                           NA
## `SourceWHO-TV 13 Des Moines`                                                                             NA
## Sourcewhotv.com                                                                                          NA
## `SourceWhoWhatWhy / RealNewsProject (blog)`                                                              NA
## SourceWHSV                                                                                               NA
## `SourceWhyalla News`                                                                                     NA
## `SourceWIAT 42`                                                                                          NA
## SourceWIBW                                                                                               NA
## `SourceWichita Eagle`                                                                                    NA
## `SourceWicked Local`                                                                                     NA
## `SourceWicked Local Natick`                                                                              NA
## `SourceWicked Local Wellesley`                                                                           NA
## SourceWIFR                                                                                               NA
## `SourceWIFR Rockford`                                                                                    NA
## Sourcewigantoday.net                                                                                     NA
## `SourceWii U Daily`                                                                                      NA
## SourceWikinews                                                                                           NA
## `SourceWillamette Week`                                                                                  NA
## `SourceWilts and Gloucestershire Standard`                                                               NA
## `SourceWILX-TV`                                                                                          NA
## `SourceWILX 10 Lansing`                                                                                  NA
## `SourceWINA AM 1070 (press release)`                                                                     NA
## SourceWinBeta                                                                                            NA
## `SourceWindows Central`                                                                                  NA
## `SourceWindows IT Pro`                                                                                   NA
## `SourceWindows IT Pro (blog)`                                                                            NA
## `SourceWindows Report`                                                                                   NA
## `SourceWindowsItPro (subscription)`                                                                      NA
## `SourceWindowsItPro (subscription) (blog)`                                                               NA
## `SourceWindpower Engineering (press release)`                                                            NA
## `SourceWindsor Star`                                                                                     NA
## `SourceWink News`                                                                                        NA
## `SourceWinnipeg Free Press`                                                                              NA
## `SourceWinnipeg Sun`                                                                                     NA
## `SourceWinona Daily News`                                                                                NA
## `SourceWinston-Salem Chronicle`                                                                          NA
## `SourceWinston-Salem Journal`                                                                            NA
## SourceWIRED                                                                                              NA
## `SourceWired News`                                                                                0.000e+00
## `SourceWired UK`                                                                                         NA
## SourceWired.co.uk                                                                                        NA
## `SourceWireless Week`                                                                                    NA
## SourceWirtschaftsWoche                                                                                   NA
## `SourceWIS News 10 Columbia`                                                                             NA
## `SourceWISC-TV Madison`                                                                                  NA
## `SourceWisconsin Gazette`                                                                                NA
## `SourceWisconsin Public Radio News`                                                                      NA
## `SourceWISH-TV`                                                                                          NA
## `SourceWISH-TV Indianapolis`                                                                             NA
## `SourceWISN 12 Milwaukee`                                                                                NA
## `SourceWISN Milwaukee`                                                                                   NA
## SourceWITN                                                                                               NA
## Sourcewivb.com                                                                                           NA
## `SourceWJBF-TV`                                                                                          NA
## SourceWJLA                                                                                               NA
## SourceWJTV                                                                                               NA
## `SourceWJXT Jacksonville`                                                                        -6.711e+07
## SourceWKBN.com                                                                                           NA
## `SourceWKBW-TV`                                                                                          NA
## SourceWKOW                                                                                               NA
## SourceWKRG                                                                                               NA
## `SourceWKRG News 5 Mobile`                                                                               NA
## `SourceWKSU News`                                                                                        NA
## `SourceWKYC-TV`                                                                                          NA
## SourceWKYT                                                                                               NA
## `SourceWLBT 3 Jackson`                                                                                   NA
## SourceWLBZ2.com                                                                                          NA
## Sourcewlfi.com                                                                                           NA
## `SourceWLKY Louisville`                                                                                  NA
## SourceWLNS                                                                                               NA
## `SourceWLOX-TV Biloxi`                                                                                   NA
## SourceWLRN                                                                                               NA
## `SourceWLS-TV`                                                                                           NA
## `SourceWLWT-TV Cincinnati`                                                                               NA
## `SourceWLWT Cincinnati`                                                                                  NA
## `SourceWMBD - FOX 43 Peoria`                                                                             NA
## `SourceWMBF News Myrtle Beach`                                                                           NA
## `SourceWMC Action News 5`                                                                                NA
## `SourceWMCTV Memphis`                                                                                    NA
## SourceWMPoweruser.com                                                                                    NA
## SourceWMTV                                                                                               NA
## `SourceWMTW Portland`                                                                                    NA
## `SourceWMUR Manchester`                                                                                  NA
## `SourceWN Philippines`                                                                                   NA
## SourceWNAX                                                                                               NA
## SourceWNBA.com                                                                                           NA
## SourceWNCN                                                                                               NA
## SourceWNCT                                                                                               NA
## SourceWND.com                                                                                            NA
## `SourceWNDU-TV`                                                                                          NA
## `SourceWNEP 16 Pennsylvania`                                                                             NA
## Sourcewnep.com                                                                                           NA
## `SourceWNIJ and WNIU`                                                                                    NA
## SourceWNYC                                                                                               NA
## `SourceWNYC New York Public Radio`                                                                       NA
## SourceWNYT                                                                                               NA
## SourceWOAI                                                                                               NA
## SourceWOAI.com                                                                                           NA
## `SourceWonkette (satire) (blog)`                                                                         NA
## `SourceWoodstock Sentinel-Review`                                                                        NA
## SourceWOODTV.com                                                                                         NA
## `SourceWorcester Telegram`                                                                               NA
## `SourceWorkers World`                                                                                    NA
## SourceWorkpermit.com                                                                                     NA
## `SourceWorld Affairs (blog)`                                                                             NA
## `SourceWorld Bank Group`                                                                                 NA
## `SourceWorld Bank Group (blog)`                                                                          NA
## `SourceWorld Fishing`                                                                                    NA
## `SourceWorld Highways`                                                                                   NA
## `SourceWorld Intellectual Property Review (subscription)`                                                NA
## `SourceWorld Nuclear News`                                                                               NA
## `SourceWorld Policy Institute (blog)`                                                                    NA
## `SourceWorld Politics Review`                                                                            NA
## `SourceWorld Socialist Web Site`                                                                         NA
## `SourceWorld Tribune`                                                                                    NA
## SourceWorldcrunch                                                                                        NA
## `SourceWorthing Herald`                                                                                  NA
## `SourceWorthington Daily Globe`                                                                          NA
## `SourceWOWK-TV West Virginia`                                                                            NA
## SourceWOWT                                                                                               NA
## `SourceWPBF West Palm Beach`                                                                             NA
## SourceWPEC                                                                                               NA
## `SourceWPIX 11 New York`                                                                                 NA
## `SourceWPRI 12 Eyewitness News`                                                                          NA
## SourceWPRO                                                                                               NA
## SourceWPTV.com                                                                                           NA
## SourceWPTZ                                                                                               NA
## `SourceWPTZ Burlington`                                                                                  NA
## `SourceWPTZ The Champlain Valley`                                                                        NA
## `SourceWPVI-TV`                                                                                          NA
## `SourceWPVI – Philadelphia via Yahoo! News`                                                              NA
## `SourceWPVI 6abc Philadelphia`                                                                           NA
## `SourceWPXI Pittsburgh`                                                                                  NA
## `SourceWQAD Moline`                                                                                      NA
## SourceWQAD.com                                                                                           NA
## `SourceWQOW Eau Claire`                                                                                  NA
## `SourceWRAL Tech Wire`                                                                                   NA
## SourceWRAL.com                                                                                           NA
## SourceWRBL                                                                                               NA
## `SourceWRCB-TV`                                                                                          NA
## `SourceWRDW-TV`                                                                                          NA
## `SourceWREG-TV Memphis`                                                                                  NA
## Sourcewreg.com                                                                                           NA
## SourceWrestlezone                                                                                        NA
## `SourceWREX-TV`                                                                                          NA
## SourceWRGB                                                                                               NA
## SourceWRIC                                                                                               NA
## `SourceWRTV Indianapolis`                                                                                NA
## `SourceWSAZ-TV`                                                                                          NA
## `SourceWSB Atlanta`                                                                                      NA
## `SourceWSBT-TV`                                                                                          NA
## SourceWSET                                                                                               NA
## `SourceWSFA 12 Montgomery`                                                                               NA
## SourceWSLS                                                                                               NA
## `SourceWSOC Charlotte`                                                                                   NA
## `SourceWSYM-TV`                                                                                          NA
## SourceWSYR                                                                                               NA
## `SourceWT VOX`                                                                                           NA
## `SourceWTAE-TV Pittsburgh`                                                                               NA
## `SourceWTAE Pittsburgh`                                                                                  NA
## SourceWTAJ                                                                                               NA
## SourceWTAW                                                                                               NA
## SourceWTHR                                                                                               NA
## `SourceWTHR Indianapolis`                                                                         0.000e+00
## `SourceWTKR Norfolk`                                                                                     NA
## Sourcewtkr.com                                                                                           NA
## SourceWTMA                                                                                               NA
## `SourceWTMJ-TV (press release) (registration) (blog)`                                                    NA
## `SourceWTMJ (press release) (subscription) (blog)`                                                       NA
## `SourceWTNH Connecticut News (press release)`                                                            NA
## SourceWTOC                                                                                               NA
## `SourceWTOC 11 Savannah`                                                                                 NA
## SourceWTOK                                                                                               NA
## SourceWTOL.com                                                                                           NA
## SourceWTOP                                                                                               NA
## `SourceWTOV Steubenville`                                                                                NA
## `SourceWTSP 10 News`                                                                                     NA
## SourceWTSP.com                                                                                           NA
## `SourceWTTV CBS4Indy`                                                                                    NA
## SourceWTVA                                                                                               NA
## SourceWTVC                                                                                               NA
## `SourceWTVD-TV`                                                                                          NA
## SourceWTVM                                                                                               NA
## `SourceWTXL ABC 27`                                                                                      NA
## `SourceWUIS 91.9`                                                                                        NA
## SourceWUSA9.com                                                                                          NA
## SourceWVLT                                                                                               NA
## SourceWVTM13                                                                                             NA
## `SourceWVVA Bluefield`                                                                                   NA
## `SourceWVVA TV (registration)`                                                                           NA
## `SourceWWAY NewsChannel 3`                                                                               NA
## `SourceWWBT NBC12 News`                                                                                  NA
## SourceWWD                                                                                                NA
## SourceWWL                                                                                                NA
## Sourcewwlp.com                                                                                           NA
## `SourceWWMT-TV`                                                                                          NA
## `SourceWWNY TV 7`                                                                                        NA
## `SourceWWSB ABC 7`                                                                                       NA
## Sourcewww.breakbulk.com                                                                                  NA
## `Sourcewww.kingstonregion.com/`                                                                          NA
## Sourcewww.worldbulletin.net                                                                              NA
## `SourceWXIA-TV`                                                                                          NA
## `SourceWXII-TV Winston-Salem`                                                                            NA
## SourceWXIX                                                                                               NA
## `SourceWXOW 19 La Crosse`                                                                                NA
## `SourceWXXI News`                                                                                        NA
## SourceWXYZ                                                                                               NA
## `SourceWXYZ-TV Detroit`                                                                                  NA
## `SourceWYFF 4 Greenville`                                                                                NA
## `SourceWyoming Business Report`                                                                          NA
## `SourceWyoming Tribune`                                                                                  NA
## SourceWYTV                                                                                               NA
## `SourceWZZM 13 Grand Rapids`                                                                             NA
## SourceWZZM13.com                                                                                         NA
## `SourceXãLun.com tin tc vit nam 24h cp nht`                                                              NA
## SourceXconomy                                                                                            NA
## `SourceXDA Developers (blog)`                                                                            NA
## SourceXinhua                                                                                             NA
## SourceXXLMAG.COM                                                                                         NA
## `SourceYa Libnan`                                                                                        NA
## `SourceYahoo Autos`                                                                                      NA
## `SourceYahoo Canada Finance - Insight (blog)`                                                            NA
## `SourceYahoo Canada Sports (blog)`                                                                       NA
## `SourceYahoo Celebrity UK`                                                                               NA
## `SourceYahoo Finance`                                                                                    NA
## `SourceYahoo Finance UK`                                                                                 NA
## `SourceYahoo Finance via Yahoo! Finance`                                                                 NA
## `SourceYahoo Finance via Yahoo! News`                                                                    NA
## `SourceYahoo Food`                                                                                       NA
## `SourceYahoo Health`                                                                                     NA
## `SourceYahoo Katie Couric`                                                                               NA
## `SourceYahoo Movies (blog)`                                                                              NA
## `SourceYahoo Music`                                                                                      NA
## `SourceYahoo New Zealand via Yahoo! New Zealand News`                                                    NA
## `SourceYahoo New Zealand via Yahoo!7 News`                                                               NA
## `SourceYahoo News`                                                                                       NA
## `SourceYahoo News Canada (blog)`                                                                         NA
## `SourceYahoo News Digest`                                                                                NA
## `SourceYahoo News UK`                                                                                    NA
## `SourceYahoo News via Yahoo Canada News`                                                                 NA
## `SourceYahoo News via Yahoo UK & Ireland News`                                                           NA
## `SourceYahoo News via Yahoo! News`                                                                       NA
## `SourceYahoo Parenting`                                                                                  NA
## `SourceYahoo Politics`                                                                                   NA
## `SourceYahoo Singapore News`                                                                             NA
## `SourceYahoo Singapore on Tumblr via Yahoo! Singapore News`                                              NA
## `SourceYahoo Sports`                                                                                     NA
## `SourceYahoo Sports (blog)`                                                                              NA
## `SourceYahoo Tech`                                                                                       NA
## `SourceYahoo Tech via Yahoo! News`                                                                       NA
## `SourceYahoo Travel`                                                                                     NA
## `SourceYahoo TV (blog)`                                                                                  NA
## `SourceYahoo! Maktoob News`                                                                              NA
## `SourceYahoo7 and Agencies via Yahoo! New Zealand News`                                                  NA
## `SourceYahoo7 and Agencies via Yahoo!7 News`                                                             NA
## `SourceYahoo7 Finance via Yahoo!7 Finance`                                                               NA
## `SourceYahoo7 News`                                                                                      NA
## `SourceYakima Herald-Republic`                                                                           NA
## `SourceYale Environment 360`                                                                             NA
## `SourceYaleGlobal Online`                                                                                NA
## `SourceYarmouth County Vanguard`                                                                         NA
## `SourceYellowhammer News`                                                                                NA
## `SourceYeni \\u009d\\u009dafak English (press release)`                                                  NA
## `SourceYES! Magazine`                                                                                    NA
## `SourceYeshiva World News`                                                                               NA
## `SourceYibada (English Edition)`                                                                         NA
## `SourceYIBADA English`                                                                                   NA
## `SourceYLE News`                                                                                         NA
## SourceYNaija                                                                                             NA
## SourceYnetnews                                                                                           NA
## `SourceYonhap News`                                                                                      NA
## `SourceYork Daily Record/Sunday News`                                                                    NA
## `SourceYork Dispatch`                                                                                    NA
## `SourceYork Press`                                                                                       NA
## SourceYorkRegion.com                                                                                     NA
## `SourceYorkshire Evening Post`                                                                           NA
## `SourceYorkshire Post`                                                                                   NA
## `SourceYorkton News Review`                                                                              NA
## `SourceYorkton This Week`                                                                                NA
## `SourceYorkton This Week (press release)`                                                                NA
## `SourceYouGov US`                                                                                        NA
## `SourceYoungstown Vindicator`                                                                            NA
## `SourceYour EDM`                                                                                         NA
## `SourceYour Hometown Lima Stations`                                                                      NA
## `SourceYour Houston News`                                                                                NA
## `SourceYour Houston News (blog)`                                                                         NA
## `SourceYour Middle East`                                                                                 NA
## `SourceYour News Now`                                                                                    NA
## Sourceyourcentralvalley.com                                                                              NA
## SourceYourErie                                                                                           NA
## SourceYourStory.com                                                                                      NA
## SourceYourWestValley.com                                                                                 NA
## `SourceYouth Health Magzine`                                                                             NA
## `SourceYouth Ki Awaaz`                                                                                   NA
## SourceYubaNet                                                                                            NA
## SourceYugaTech                                                                                           NA
## `SourceYuma Sun`                                                                                         NA
## `SourceZacks via Yahoo Canada Finance`                                                                   NA
## `SourceZacks via Yahoo UK & Ireland Finance`                                                             NA
## `SourceZacks via Yahoo! Finance`                                                                         NA
## `SourceZacks via Yahoo! Finance India`                                                                   NA
## `SourceZacks via Yahoo! New Zealand Finance`                                                             NA
## `SourceZacks via Yahoo!7 Finance`                                                                        NA
## SourceZacks.com                                                                                          NA
## SourceZap2It                                                                                             NA
## `SourceZawya (registration)`                                                                             NA
## SourceZDNet                                                                                              NA
## `SourceZDNet (blog)`                                                                                     NA
## `SourceZDNet UK`                                                                                         NA
## `SourceZee News`                                                                                         NA
## SourceZergwatch                                                                                          NA
## `SourceZero Hedge`                                                                                       NA
## SourceZIK                                                                                                NA
## `SourceZimbabwe Independent`                                                                             NA
## `SourceZimEye - Zimbabwe News`                                                                           NA
## `SourceZME Science`                                                                                      NA
## SourceZNBC                                                                                               NA
## SourceZolmax                                                                                             NA
##                                                                                                  Pr(>|z|)
## (Intercept)                                                                                         1.000
## Topiceconomy                                                                                        1.000
## Topicmicrosoft                                                                                      1.000
## Topicobama                                                                                         <2e-16
## Topicpalestine                                                                                         NA
## `Source `                                                                                              NA
## `Source/FILM`                                                                                          NA
## `Source+972 Magazine`                                                                                  NA
## `Source\\u009d\\u009d \\u009d\\u009d`                                                                  NA
## Source10News                                                                                           NA
## Source10TV                                                                                             NA
## Source11alive.com                                                                                      NA
## `Source12 News Phoenix`                                                                                NA
## Source12news.com                                                                                       NA
## Source12NewsNow.Com                                                                                    NA
## `Source1340 WJOL`                                                                                      NA
## `Source13abc Action News`                                                                              NA
## Source13newsnow.com                                                                                    NA
## Source13WMAZ                                                                                           NA
## Source13WMAZ.com                                                                                       NA
## `Source14 News WFIE Evansville`                                                                        NA
## `Source14 WFIE Evansville`                                                                             NA
## `Source19 Action News Cleveland`                                                                       NA
## Source20minutes.fr                                                                                     NA
## Source21Alive                                                                                          NA
## `Source24/7 Wall St.`                                                                                  NA
## `Source24/7 Wall St. via Yahoo! Finance`                                                               NA
## Source247Sports                                                                                        NA
## Source2paragraphs.com                                                                                  NA
## `Source3ders.org (blog)`                                                                               NA
## Source3DPrint.com                                                                                      NA
## Source3news                                                                                            NA
## `Source3News NZ`                                                                                       NA
## `Source41 NBC News`                                                                                    NA
## Source4k                                                                                               NA
## Source4NI                                                                                              NA
## `Source5 Eyewitness News St. Paul`                                                                     NA
## `Source550 KTSA`                                                                                       NA
## `Source570 News`                                                                                       NA
## `Source580 CFRA Radio`                                                                                 NA
## Source5newsonline.com                                                                                  NA
## `Source6 On Your Side`                                                                                 NA
## Source630ched.com                                                                                      NA
## `Source660 News`                                                                                       NA
## `Source680 News`                                                                                       NA
## Source6abc.com                                                                                         NA
## `Source7Online WSVN-TV`                                                                                NA
## Source7sur7                                                                                            NA
## `Source88Nine Radio Milwaukee (blog)`                                                                  NA
## `Source89.3 KPCC`                                                                                      NA
## `Source89.3 WFPL`                                                                                      NA
## `Source9 News Denver`                                                                                  NA
## `Source9 to 5 Google`                                                                                  NA
## `Source9 to 5 Mac`                                                                                     NA
## `Source9 to 5 Mac (press release)`                                                                     NA
## `Source9&10 News`                                                                                      NA
## `Source93.1 WIBC Indianapolis`                                                                         NA
## Source9NEWS.com                                                                                        NA
## Source9news.com.au                                                                                     NA
## `SourceA.V. Club`                                                                                      NA
## `SourceA.V. Club (blog)`                                                                               NA
## `SourceA.V. Club Denver/Boulder`                                                                       NA
## `SourceAaj Tv (press release) (blog)`                                                                  NA
## `SourceAAP via Yahoo! New Zealand Finance`                                                             NA
## `SourceAAP via Yahoo! New Zealand News`                                                                NA
## `SourceAAP via Yahoo!7 Finance`                                                                        NA
## `SourceAAP via Yahoo!7 News`                                                                           NA
## `SourceAbbotsford News (registration) (blog)`                                                          NA
## `SourceABC 13 Houston`                                                                                 NA
## `SourceABC 15 Phoenix`                                                                                 NA
## `SourceABC 26 New Orleans`                                                                             NA
## `SourceABC 6 Providence`                                                                               NA
## `SourceABC 7 Chicago`                                                                                  NA
## `SourceABC 7 Gulfshore News`                                                                           NA
## `SourceABC Action News Tampa Bay`                                                                      NA
## `SourceABC FOX Montana News`                                                                           NA
## `SourceABC Local`                                                                                      NA
## `SourceABC Montana`                                                                                    NA
## `SourceABC News`                                                                                       NA
## `SourceABC NEWS 4`                                                                                     NA
## `SourceABC News via Yahoo! News`                                                                       NA
## `SourceABC Online`                                                                                     NA
## `SourceABC Online (blog)`                                                                              NA
## SourceABC10.com                                                                                        NA
## `SourceABC11 Raleigh-Durham-Fayetteville`                                                              NA
## `SourceABC12 Mid-Michigan`                                                                             NA
## `SourceABC15 Arizona`                                                                                  NA
## SourceABC17News.com                                                                                    NA
## `SourceABC2 News`                                                                                      NA
## Sourceabc27                                                                                            NA
## SourceABC6OnYourSide.com                                                                               NA
## Sourceabc7news.com                                                                                     NA
## `SourceAberdeen Press and Journal`                                                                     NA
## `SourceABI Research (press release) (subscription) (blog)`                                             NA
## `SourceAbove the Law`                                                                                  NA
## `SourceABP Live`                                                                                       NA
## `SourceABS-CBNNEWS.com`                                                                                NA
## `SourceABS CBN News`                                                                                   NA
## `SourceAccess Hollywood`                                                                               NA
## `SourceAccess Washington`                                                                              NA
## `SourceAccesswire via Yahoo! Finance`                                                                  NA
## `SourceAccounting Today`                                                                               NA
## `SourceAccuracy in Academia`                                                                           NA
## `SourceAccuracy In Media`                                                                              NA
## `SourceAccuracy In Media (blog)`                                                                       NA
## `SourceACN Newswire via Yahoo! New Zealand Finance`                                                    NA
## `SourceACN Newswire via Yahoo!7 Finance`                                                               NA
## `SourceAction Forex`                                                                                   NA
## SourceActionNewsJax.com                                                                                NA
## SourceACTmedia                                                                                         NA
## `SourceActon Institute (blog)`                                                                         NA
## SourceAdAge.com                                                                                        NA
## `SourceAdAge.com (blog)`                                                                               NA
## SourceAdExchanger                                                                                      NA
## SourceAdNews                                                                                           NA
## `SourceADT Magazine`                                                                                   NA
## `SourceAdvanced Television`                                                                            NA
## SourceAdvisor.ca                                                                                       NA
## SourceAdvocate.com                                                                                     NA
## SourceAdweek                                                                                           NA
## SourceAdWeek                                                                                           NA
## Sourceafaqs                                                                                            NA
## SourceAFKInsider                                                                                       NA
## `SourceAFL-CIO (blog)`                                                                                 NA
## `SourceAFP News via Yahoo! Philippines News`                                                           NA
## `SourceAFP News via Yahoo! Singapore News`                                                             NA
## `SourceAFP Relax News via Yahoo! News`                                                              1.000
## `SourceAFP Relax via Yahoo! Philippines News`                                                       1.000
## `SourceAFP Relax via Yahoo! Singapore News`                                                            NA
## `SourceAFP via Yahoo Maktoob News`                                                                     NA
## `SourceAFP via Yahoo UK & Ireland Finance`                                                             NA
## `SourceAFP via Yahoo UK & Ireland News`                                                                NA
## `SourceAFP via Yahoo! Finance`                                                                         NA
## `SourceAFP via Yahoo! India News`                                                                   1.000
## `SourceAFP via Yahoo! New Zealand News`                                                                NA
## `SourceAFP via Yahoo! News`                                                                         1.000
## `SourceAFP via Yahoo! Sports`                                                                          NA
## `SourceAFP via Yahoo!7 Finance`                                                                        NA
## `SourceAFP via Yahoo!7 News`                                                                           NA
## `SourceAfrica Middle East`                                                                             NA
## `SourceAfrican Arguments (registration)`                                                               NA
## `SourceAfrican Manager (press release) (registration) (blog)`                                          NA
## SourceAfricanews                                                                                       NA
## SourceAfricaNews                                                                                       NA
## `SourceAfricanews (press release)`                                                                     NA
## SourceAfrik.com                                                                                        NA
## SourceAfterDawn                                                                                        NA
## `SourceAG Week`                                                                                        NA
## `SourceAgence France-Presse via Yahoo Canada News`                                                     NA
## SourceAgencySpy                                                                                        NA
## SourceAgenda.ge                                                                                        NA
## SourceAGERPRES                                                                                         NA
## SourceAgoraVox                                                                                         NA
## SourceAgriculture.com                                                                                  NA
## SourceAgriland                                                                                         NA
## SourceAgWeb                                                                                            NA
## `SourceAhlul Bayt News Agency (press release)`                                                         NA
## `SourceAhram Online`                                                                                   NA
## `SourceAir Force Link`                                                                                 NA
## `SourceAir Transport World`                                                                            NA
## `SourceAircraft Maintenance Technology`                                                                NA
## SourceAirForceTimes.com                                                                                NA
## `SourceAirline Reporter`                                                                               NA
## `SourceAJIB.fr L'actualit\\u009d\\u009d de l'Islam et des musulmans en France`                         NA
## `SourceAkron Beacon Journal`                                                                           NA
## `SourceAl-Ahram Weekly`                                                                                NA
## `SourceAl-Arabiya`                                                                                     NA
## `SourceAl-Arabiya (blog)`                                                                              NA
## `SourceAl-Bawaba`                                                                                      NA
## `SourceAl-Fanar Media`                                                                                 NA
## `SourceAl-Jazeerah.info`                                                                               NA
## `SourceAl-Manar TV`                                                                                    NA
## `SourceAl-Monitor`                                                                                     NA
## `SourceAl-Resalah`                                                                                     NA
## `SourceAl Bawaba`                                                                                      NA
## `SourceAl Huffington Post`                                                                             NA
## `SourceAl Jazeera America`                                                                             NA
## `SourceAl Jazeera via Yahoo Maktoob News`                                                              NA
## `SourceAl Jazeera via Yahoo UK & Ireland News`                                                         NA
## SourceAL.com                                                                                           NA
## `SourceAlabama's News Leader`                                                                          NA
## `SourceAlabama NewsCenter`                                                                             NA
## `SourceAlaska Dispatch News`                                                                           NA
## `SourceAlaska Public Radio Network`                                                                    NA
## `SourceAlbanian Daily News`                                                                            NA
## `SourceAlbany Business Review`                                                                         NA
## `SourceAlbany Democrat Herald`                                                                         NA
## `SourceAlbany Times Union`                                                                             NA
## `SourceAlbany Times Union (blog)`                                                                      NA
## `SourceAlberni Valley News`                                                                            NA
## `SourceAlberta Daily Herald Tribune`                                                                   NA
## `SourceAlbuquerque Business First (blog)`                                                              NA
## `SourceAlbuquerque Journal`                                                                            NA
## `SourceAlex News (blog)`                                                                               NA
## `SourceAlexandria Town Talk`                                                                           NA
## `SourceAlg\\u009d\\u009drie Presse Service`                                                            NA
## SourceAlgemeiner                                                                                       NA
## `Sourcealgerie-focus.com`                                                                              NA
## `SourceAlgérie Presse Service`                                                                         NA
## `SourceAliran Monthly`                                                                                 NA
## `SourceAliran Online`                                                                                  NA
## SourceAljazeera.com                                                                                    NA
## `SourceAljazeera.com (blog)`                                                                           NA
## `SourceAll About Hawke's Bay`                                                                          NA
## SourceAllAfrica.com                                                                                    NA
## `SourceAllCoinsNews.com (blog)`                                                                        NA
## `SourceAllentown Morning Call`                                                                         NA
## SourceAllGov                                                                                           NA
## `SourceAllure Magazine (blog)`                                                                         NA
## SourceAlphr                                                                                            NA
## `SourceAltEnergyMag (press release)`                                                                   NA
## `SourceAlternative Information Center (AIC)`                                                           NA
## `SourceAlternative Information Center (AIC) (blog)`                                                    NA
## SourceAlterNet                                                                                         NA
## `SourceAlton Telegraph`                                                                                NA
## `SourceAlyaexpress-News`                                                                               NA
## `SourceAmarillo Globe-News`                                                                            NA
## SourceAmarillo.com                                                                                     NA
## `SourceAmazinessNet (blog)`                                                                            NA
## SourceAMEinfo                                                                                          NA
## `SourceAmerica Magazine`                                                                               NA
## `SourceAmerican Action Forum (blog)`                                                                   NA
## `SourceAmerican Banker`                                                                                NA
## `SourceAmerican Center for Law and Justice (blog)`                                                     NA
## `SourceAmerican Enterprise Institute`                                                                  NA
## `SourceAmerican Free Press`                                                                            NA
## `SourceAmerican Journal of Transportation`                                                             NA
## `SourceAmerican Kennel Club (blog)`                                                                    NA
## `SourceAmerican Libraries (blog)`                                                                      NA
## `SourceAmerican Spectator`                                                                             NA
## `SourceAmerican Spectator (blog)`                                                                      NA
## `SourceAmerican Thinker`                                                                               NA
## `SourceAmerican Thinker (blog)`                                                                        NA
## `SourceAmerican Trade Journal`                                                                         NA
## `SourceAmericans for Tax Reform (blog)`                                                                NA
## `SourceAmericas Quarterly`                                                                             NA
## `SourceAmericas Quarterly (blog)`                                                                      NA
## SourceAmeriPublications                                                                                NA
## `SourceAmes Tribune`                                                                                   NA
## SourceAmigobulls                                                                                       NA
## `SourceAmmoLand Shooting Sports News`                                                                  NA
## SourceamNewYork                                                                                        NA
## SourceamNY                                                                                             NA
## `SourceAn Phoblacht`                                                                                   NA
## `SourceAnadolu Agency`                                                                                 NA
## SourceAnandTech                                                                                        NA
## SourceAnarkismo.net                                                                                    NA
## `SourceAnchorage Daily News`                                                                           NA
## `SourceAndean Airmail & PERUVIAN TIMES`                                                                NA
## `SourceAnderson Independent Mail`                                                                      NA
## `SourceAndroid Authority (blog)`                                                                       NA
## `SourceAndroid Central`                                                                                NA
## `SourceAndroid Community`                                                                              NA
## `SourceAndroid Headlines - Android News`                                                               NA
## `SourceAndroid Police`                                                                                 NA
## SourceAndroidOrigin                                                                                    NA
## `SourceAndroidPIT US (blog)`                                                                           NA
## SourceAngolaPress                                                                                      NA
## `SourceANI via Yahoo! India News`                                                                      NA
## `SourceAnimation World Network`                                                                        NA
## `SourceAnime News Network`                                                                             NA
## SourceANINEWS                                                                                          NA
## SourceAnorak                                                                                           NA
## `SourceANSA (registration)`                                                                            NA
## SourceANSAmed                                                                                          NA
## SourceANTARA                                                                                           NA
## `SourceAntigua Observer`                                                                               NA
## SourceAntiwar.com                                                                                      NA
## `SourceAntiwar.com (blog)`                                                                             NA
## `SourceAOL Money UK`                                                                                   NA
## `SourceAOL News`                                                                                       NA
## `SourceAP S\\u009d\\u009dn\\u009d\\u009dgalaise`                                                       NA
## `SourceAP via Yahoo! New Zealand News`                                                                 NA
## `SourceAP via Yahoo!7 News`                                                                            NA
## SourceAPA                                                                                              NA
## `SourceAPEX Media`                                                                                     NA
## SourceAppAdvice                                                                                        NA
## `SourceAppeal-Democrat`                                                                                NA
## `SourceApple Insider`                                                                                  NA
## `SourceAppleInsider (press release) (blog)`                                                            NA
## `SourceAppleton Post Crescent`                                                                         NA
## `SourceArab American News`                                                                             NA
## `SourceArab News`                                                                                      NA
## `SourceArab News via Yahoo Maktoob News`                                                               NA
## `SourceArab Times Kuwait English Daily`                                                                NA
## SourceArabianBusiness.com                                                                              NA
## SourceARC                                                                                              NA
## SourceArchinect                                                                                        NA
## `SourceArchitectural Digest`                                                                           NA
## SourceArcticStartup                                                                                    NA
## `SourceArizona Capitol Times`                                                                          NA
## `SourceArizona Daily Star`                                                                             NA
## `SourceArizona Daily Sun`                                                                              NA
## `SourceArkansas Business`                                                                              NA
## `SourceArkansas Democrat-Gazette`                                                                      NA
## `SourceArkansas News`                                                                                  NA
## `SourceArkansas Online`                                                                                NA
## SourceArmeniaNow.com                                                                                   NA
## SourceArmenpress.am                                                                                    NA
## SourceArmyTimes.com                                                                                    NA
## SourceARNnet                                                                                           NA
## `SourceAround the Rings (subscription)`                                                                NA
## `SourceArs Technica`                                                                                1.000
## `SourceArs Technica UK`                                                                                NA
## `SourceArt Newspaper`                                                                                  NA
## `SourceArtesia Daily Press`                                                                            NA
## SourceArtforum                                                                                         NA
## SourceArtLyst                                                                                          NA
## `Sourceartnet News`                                                                                    NA
## `SourceArtslink.co.za News (press release)`                                                            NA
## `SourceArutz Sheva`                                                                                    NA
## `SourceAS/COA Online`                                                                                  NA
## `SourceAsahi Shimbun`                                                                                  NA
## SourceAsahi.com                                                                                        NA
## `SourceAsbarez Armenian News`                                                                          NA
## `SourceAsbury Park Press`                                                                              NA
## `SourceAsharq Al-awsat (blog)`                                                                         NA
## `SourceAsharq Al-awsat English`                                                                        NA
## `SourceAsharq Alawsat`                                                                                 NA
## `SourceAsheboro Courier Tribune`                                                                       NA
## `SourceAsheville Citizen-Times`                                                                        NA
## `SourceAsia Pacific Report`                                                                            NA
## `SourceAsia Society`                                                                                   NA
## `SourceAsia Society (blog)`                                                                            NA
## `SourceAsia Times`                                                                                     NA
## `SourceAsian Correspondent`                                                                            NA
## `SourceAsian Image`                                                                                    NA
## `SourceAsian Tribune`                                                                                  NA
## SourceAsiaNews.it                                                                                      NA
## SourceAsiaOne                                                                                          NA
## `SourceAspen Times`                                                                                    NA
## `SourceAssociated Press of Pakistan`                                                                   NA
## `SourceAssociated Press via Yahoo Maktoob News`                                                        NA
## `SourceAssociated Press via Yahoo UK & Ireland Finance`                                                NA
## `SourceAssociated Press via Yahoo UK & Ireland News`                                                   NA
## `SourceAssociated Press via Yahoo! Finance`                                                         0.999
## `SourceAssociated Press via Yahoo! Finance India`                                                      NA
## `SourceAssociated Press via Yahoo! India News`                                                         NA
## `SourceAssociated Press via Yahoo! New Zealand Finance`                                                NA
## `SourceAssociated Press via Yahoo! News`                                                            1.000
## `SourceAssociated Press via Yahoo! Philippines News`                                                   NA
## `SourceAssociated Press via Yahoo! Philippines Sports`                                                 NA
## `SourceAssociated Press via Yahoo! Singapore News`                                                     NA
## `SourceAssociated Press via Yahoo! Singapore Sports`                                                   NA
## `SourceAssociated Press via Yahoo!7 Finance`                                                           NA
## `SourceAssociation France Palestine Solidarit\\u009d\\u009d`                                           NA
## `SourceAssociation France Palestine Solidarité`                                                        NA
## `SourceAstana Times`                                                                                   NA
## `SourceAstro Awani`                                                                                    NA
## `SourceAthens Banner-Herald`                                                                           NA
## `SourceAthens Daily Review`                                                                            NA
## `SourceAtlanta Black Star`                                                                             NA
## `SourceAtlanta Business Chronicle`                                                                     NA
## `SourceAtlanta Intown`                                                                                 NA
## `SourceAtlanta Journal-Constitution`                                                                   NA
## `SourceAtlanta Journal Constitution`                                                                   NA
## `SourceAtlanta Journal Constitution (blog)`                                                            NA
## `SourceAtlas Obscura`                                                                                  NA
## `SourceAttack of the Fanboy`                                                                           NA
## SourceATTN                                                                                             NA
## SourceATWOnline                                                                                        NA
## `SourceAuburn Citizen`                                                                                 NA
## `SourceAuburn Citizen (blog)`                                                                          NA
## `SourceAuckland stuff.co.nz`                                                                           NA
## `SourceAugusta Free Press`                                                                             NA
## SourceAusdroid                                                                                         NA
## `SourceAustin American-Statesman`                                                                      NA
## `SourceAustin Business Journal`                                                                        NA
## `SourceAustin Chronicle`                                                                               NA
## `SourceAustin Inno`                                                                                    NA
## `SourceAustralia-Israel Jewish Affairs Council`                                                        NA
## `SourceAustralia Network News`                                                                         NA
## `SourceAustralian Aviation`                                                                            NA
## `SourceAustralian Broadcasting Corporation`                                                            NA
## `SourceAustralian Business Traveller`                                                                  NA
## `SourceAustralian FourFourTwo`                                                                         NA
## `SourceAustralian Jewish News`                                                                         NA
## `SourceAustralian Policy Online`                                                                       NA
## `SourceAutoblog (blog)`                                                                                NA
## SourceAutocar                                                                                          NA
## `SourceAutocar India`                                                                                  NA
## Sourceautoevolution                                                                                    NA
## SourceAutoExpress                                                                                      NA
## SourceAutoGuide.com                                                                                    NA
## `SourceAutomation World`                                                                               NA
## `SourceAutomotive News`                                                                                NA
## `SourceAutomotive News Europe (registration)`                                                          NA
## `SourceAutomotiveIT International`                                                                     NA
## SourceAutooMobile.com                                                                                  NA
## SourceAutoweek                                                                                         NA
## `SourceAviation Week`                                                                                  NA
## SourceAviationPros.com                                                                                 NA
## `SourceAwful Announcing`                                                                               NA
## `SourceAxis of Logic`                                                                                  NA
## Sourceazcentral.com                                                                                    NA
## SourceAzerNews                                                                                         NA
## SourceAZFamily                                                                                         NA
## `SourceB\\u009d\\u009do D\\u009d\\u009dn Vit`                                                          NA
## `SourceB2B Marketing Online`                                                                           NA
## SourceB92                                                                                              NA
## `SourceBABW News`                                                                                      NA
## `SourceBahamas Tribune`                                                                                NA
## `SourceBahrain News Agency`                                                                            NA
## `SourceBalitang America`                                                                               NA
## `SourceBalkan Insight`                                                                                 NA
## `SourceBalkans.com Business News`                                                                      NA
## `SourceBaltic Times`                                                                                   NA
## `SourceBaltimore Business Journal (blog)`                                                              NA
## `SourceBaltimore Sun`                                                                                  NA
## `SourceBaltimore Sun (blog)`                                                                           NA
## SourceBaltimoreRavens.com                                                                              NA
## `SourceBangalore Mirror`                                                                               NA
## `SourceBangkok Post`                                                                                   NA
## `SourceBangladesh News 24 hours`                                                                       NA
## `SourceBangor Daily News`                                                                              NA
## `SourceBank of Canada`                                                                                 NA
## `SourceBanking Technology`                                                                             NA
## SourceBankrate.com                                                                                     NA
## `SourceBankrate.com via Yahoo Canada Finance`                                                          NA
## `SourceBankrate.com via Yahoo! Finance`                                                                NA
## `SourceBarbados Advocate`                                                                              NA
## `SourceBarca Blaugranes (blog)`                                                                        NA
## `SourceBarre Montpelier Times Argus`                                                                   NA
## `SourceBarron's`                                                                                       NA
## `SourceBarron's (blog)`                                                                                NA
## `SourceBarron&#39;s Online`                                                                            NA
## SourceBaseline                                                                                         NA
## `SourceBaseline (blog)`                                                                                NA
## `SourceBasic Income News`                                                                              NA
## `SourceBasingstoke Gazette`                                                                            NA
## `SourceBasta !`                                                                                        NA
## `SourceBath Chronicle`                                                                                 NA
## `SourceBattle Creek Enquirer`                                                                          NA
## `SourceBaxter Bulletin`                                                                                NA
## `SourceBay Area Indymedia`                                                                             NA
## `SourceBay News 9`                                                                                     NA
## `SourceBay Today`                                                                                      NA
## `SourceBaytown Sun`                                                                                    NA
## `SourceBBC News`                                                                                    1.000
## `SourceBBC NI`                                                                                         NA
## `SourceBBC Sport`                                                                                      NA
## `SourceBBC world`                                                                                      NA
## SourceBCBusiness                                                                                       NA
## SourceBDlive                                                                                           NA
## `SourceBeacon Examiner`                                                                                NA
## SourceBeanstockd                                                                                       NA
## `SourceBearing Arms`                                                                                   NA
## `SourceBeatrice Daily Sun`                                                                             NA
## `SourceBeaumont Enterprise`                                                                            NA
## `SourceBecker's Hospital Review`                                                                       NA
## `SourceBecker's Orthopedic & Spine`                                                                    NA
## `SourceBeckley Register-Herald`                                                                        NA
## `SourceBedford Today`                                                                                  NA
## `SourceBeef Magazine (blog)`                                                                           NA
## `SourceBelarus Digest`                                                                                 NA
## `SourceBelarus News (BelTA)`                                                                           NA
## `SourceBelfast Newsletter`                                                                             NA
## `SourceBelfast Telegraph`                                                                              NA
## `SourceBella Naija`                                                                                    NA
## SourceBellaciao                                                                                        NA
## `SourceBelleville News-Democrat`                                                                       NA
## `SourceBellevue Reporter`                                                                              NA
## `SourceBeloit Daily News`                                                                              NA
## `SourceBenchmark Monitor`                                                                              NA
## `SourceBend Bulletin`                                                                                  NA
## `SourceBenefits Canada`                                                                                NA
## `SourceBenton Evening News`                                                                            NA
## SourceBenzinga                                                                                         NA
## `SourceBenzinga via Yahoo! Finance`                                                                    NA
## `SourceBerkshire Eagle (subscription)`                                                                 NA
## SourceBernama                                                                                          NA
## SourceBernews                                                                                          NA
## `SourceBerwick Advertiser`                                                                             NA
## `SourceBerwick Today`                                                                                  NA
## SourceBET                                                                                              NA
## `SourceBET (blog)`                                                                                     NA
## SourceBetaBoston                                                                                       NA
## SourceBetaKit                                                                                          NA
## SourceBetaNews                                                                                      1.000
## SourceBGR                                                                                              NA
## `SourceBGR India`                                                                                      NA
## `SourceBGR News via Yahoo! News`                                                                    0.999
## `SourceBharat Press`                                                                                   NA
## `SourceBharat Times`                                                                                   NA
## `SourceBi-College News`                                                                                NA
## `SourceBidness ETC`                                                                                    NA
## `SourceBig Island Now`                                                                                 NA
## `SourceBig Issue`                                                                                      NA
## `SourceBig News Network.com`                                                                           NA
## `SourceBig Think`                                                                                      NA
## `SourceBig Think (blog)`                                                                               NA
## `SourceBigPond News`                                                                                   NA
## `SourceBigPond Sport`                                                                                  NA
## SourceBILD                                                                                             NA
## SourceBillboard                                                                                        NA
## `SourceBillings Gazette`                                                                               NA
## SourceBillMoyers.com                                                                                   NA
## SourceBiography                                                                                        NA
## `SourceBiomass Magazine`                                                                               NA
## `SourceBiometric Update`                                                                               NA
## `SourceBirmingham Business Journal`                                                                    NA
## `SourceBirmingham Mail`                                                                                NA
## `SourceBirmingham Post`                                                                                NA
## `SourceBismarck Tribune`                                                                               NA
## SourceBisnow                                                                                           NA
## `Sourcebit-tech.net`                                                                                   NA
## SourceBitbag                                                                                           NA
## `SourceBitcoin Magazine`                                                                               NA
## SourceBitcoinist.net                                                                                   NA
## `SourcebizEDGE NZ`                                                                                     NA
## SourceBizNews                                                                                          NA
## `SourceBizPac Review`                                                                                  NA
## SourceBizReport                                                                                        NA
## `SourceBizTech Magazine`                                                                               NA
## `SourceBizTimes.com (Milwaukee)`                                                                       NA
## SourceBLABBERMOUTH.NET                                                                                 NA
## `SourceBlack Agenda Report`                                                                            NA
## `SourceBlack Enterprise`                                                                               NA
## `SourceBlack Mountain News`                                                                            NA
## SourceBlackburnNews.com                                                                                NA
## `SourceBlackmore Vale Magazine`                                                                        NA
## SourceBlackNews.com                                                                                    NA
## `SourceBlackNews.com (press release)`                                                                  NA
## `SourceBlasting News`                                                                                  NA
## SourceBlastr                                                                                           NA
## `SourceBleacher Report`                                                                                NA
## `SourceBleeding Cool News`                                                                             NA
## SourceBlic                                                                                             NA
## `SourceBlockchain News`                                                                                NA
## `SourceBlogging Censorship`                                                                            NA
## `SourceBloody Disgusting`                                                                              NA
## SourceBloomberg                                                                                     0.999
## `SourceBloomberg Big Law Business`                                                                     NA
## `SourceBloomberg BNA`                                                                                  NA
## `SourceBloomberg Government (blog)`                                                                    NA
## `SourceBloomberg via Yahoo UK & Ireland Finance`                                                       NA
## `SourceBloomberg via Yahoo! Finance`                                                                   NA
## `SourceBloomberg via Yahoo! Finance India`                                                             NA
## `SourceBloomberg via Yahoo! New Zealand Finance`                                                       NA
## `SourceBloomberg via Yahoo!7 Finance`                                                                  NA
## `SourceBloomberg View`                                                                                 NA
## `SourceBloomer Advance (subscription)`                                                                 NA
## `SourceBloomington Pantagraph`                                                                         NA
## SourceBlorge                                                                                           NA
## `SourceBlue Nation Review`                                                                             NA
## `SourceBluefield Daily Telegraph`                                                                      NA
## `SourceBluffton Today`                                                                                 NA
## `SourceBMWBLOG (blog)`                                                                                 NA
## SourceBnet.com.au                                                                                      NA
## Sourcebnn.ca                                                                                           NA
## `SourceBNO News`                                                                                       NA
## `SourceBob Sullivan.net`                                                                               NA
## `SourceBobsguide (press release)`                                                                      NA
## `SourceBoing Boing`                                                                                    NA
## `SourceBonham Journal`                                                                                 NA
## `SourceBonner County Daily Bee`                                                                        NA
## `SourceBooks LIVE (blog)`                                                                              NA
## SourceBorderstan                                                                                       NA
## SourceBostInno                                                                                         NA
## `SourceBoston Business Journal`                                                                        NA
## `SourceBoston Business Journal (blog)`                                                                 NA
## `SourceBoston Herald`                                                                                  NA
## `SourceBoston Review`                                                                                  NA
## SourceBoston.com                                                                                       NA
## `SourceBoulder Daily Camera`                                                                           NA
## `SourceBoulder Weekly`                                                                                 NA
## `SourceBournemouth Echo`                                                                               NA
## `SourceBowling Green Daily News`                                                                       NA
## SourceBoxscore                                                                                         NA
## `SourceBrad Jones, Digital Trends via Yahoo! News`                                                     NA
## `SourceBradenton Herald`                                                                               NA
## `SourceBradford Telegraph`                                                                             NA
## `SourceBradford Telegraph and Argus`                                                                   NA
## `SourceBrampton Guardian`                                                                              NA
## `SourceBrandon Sun`                                                                                    NA
## `SourceBrattleboro Reformer`                                                                           NA
## `SourceBrave New Coin`                                                                                 NA
## `SourceBrazil-Arab News Agency (ANBA)`                                                                 NA
## `SourceBreaking Belize News (blog)`                                                                    NA
## `SourceBreaking Israel News`                                                                           NA
## SourceBreakingNews.com                                                                                 NA
## SourceBreakingNews.ie                                                                                  NA
## SourceBreakingviews                                                                                    NA
## SourceBREATHEcast                                                                                      NA
## `SourceBreitbart News`                                                                                 NA
## `SourceBretton Woods Observer`                                                                         NA
## `SourceBrian Madden (blog)`                                                                            NA
## `SourceBrides.com (blog)`                                                                              NA
## `SourceBriefing.com via Yahoo! Finance`                                                                NA
## SourceBright                                                                                           NA
## `SourceBright Green`                                                                                   NA
## `SourceBrisbane Times`                                                                                 NA
## `SourceBristol Herald Courier`                                                                         NA
## `SourceBristol Herald Courier (press release) (blog)`                                                  NA
## `SourceBristol Post`                                                                                   NA
## `SourceBristol Press`                                                                                  NA
## `SourceBritish Journal of Photography`                                                                 NA
## `SourceBroadband TV News`                                                                              NA
## SourceBroadcaster                                                                                      NA
## `SourceBroadcasting & Cable`                                                                           NA
## SourceBroadly                                                                                          NA
## `SourceBrookings Institution`                                                                          NA
## `SourceBrookings Institution (blog)`                                                                   NA
## `SourceBrookson (press release) (blog)`                                                                NA
## `SourceBrown County Democrat`                                                                          NA
## `SourceBrownwood Bulletin`                                                                             NA
## SourceBruDirect.com                                                                                    NA
## `SourceBryan-College Station Eagle`                                                                    NA
## SourceBT.com                                                                                           NA
## `SourceBU Today`                                                                                       NA
## `SourceBuckingham Advertiser`                                                                          NA
## SourceBucks.com                                                                                        NA
## `SourceBudapest Business Journal`                                                                      NA
## `SourceBudapest Times`                                                                                 NA
## `SourceBuenos Aires Herald`                                                                            NA
## `SourceBuffalo Business First`                                                                         NA
## `SourceBuffalo News`                                                                                   NA
## `SourceBuilder Magazine`                                                                               NA
## `SourceBullard Banner News`                                                                            NA
## `SourceBulletin of the Atomic Scientists`                                                              NA
## `SourceBunbury Mail`                                                                                   NA
## `SourceBundaberg News Mail`                                                                            NA
## `SourceBurlington County Times (subscription)`                                                         NA
## `SourceBurlington Times News`                                                                          NA
## SourceBurlingtonFreePress.com                                                                          NA
## `SourceBusiness 2 Community`                                                                           NA
## `SourceBusiness Cloud News`                                                                            NA
## `SourceBusiness Cornwall Magazine`                                                                     NA
## `SourceBusiness Finance News`                                                                          NA
## `SourceBusiness Green`                                                                                 NA
## `SourceBusiness Green (blog)`                                                                          NA
## `SourceBusiness In Savannah`                                                                           NA
## `SourceBusiness in Vancouver`                                                                          NA
## `SourceBusiness Insider`                                                                            0.999
## `SourceBusiness Insider Australia`                                                                     NA
## `SourceBusiness Insider Nordic`                                                                        NA
## `SourceBusiness Insider UK`                                                                            NA
## `SourceBusiness Insider UK Finance via Yahoo Canada Finance`                                        1.000
## `SourceBusiness Insider UK Finance via Yahoo UK & Ireland Finance`                                  1.000
## `SourceBusiness Insider UK Finance via Yahoo! Finance India`                                           NA
## `SourceBusiness Insider via Yahoo Canada Finance`                                                      NA
## `SourceBusiness Insider via Yahoo Maktoob News`                                                        NA
## `SourceBusiness Insider via Yahoo UK & Ireland Finance`                                                NA
## `SourceBusiness Insider via Yahoo! Finance`                                                        <2e-16
## `SourceBusiness Insider via Yahoo! Finance India`                                                      NA
## `SourceBusiness Insider via Yahoo! India News`                                                         NA
## `SourceBusiness Insurance`                                                                             NA
## `SourceBusiness Management Daily`                                                                      NA
## `SourceBusiness MattersBusiness Matters`                                                               NA
## `SourceBusiness Mirror`                                                                                NA
## `SourceBusiness News`                                                                                  NA
## `SourceBusiness News Americas`                                                                         NA
## `SourceBusiness News Americas (subscription)`                                                          NA
## `SourceBusiness News Daily`                                                                            NA
## `SourceBusiness News Wales (press release)`                                                            NA
## `SourceBusiness Recorder`                                                                              NA
## `SourceBusiness Recorder (press release) (registration) (blog)`                                        NA
## `SourceBusiness Reporter`                                                                              NA
## `SourceBusiness Review`                                                                                NA
## `SourceBusiness Solutions Magazine`                                                                    NA
## `SourceBusiness Spectator`                                                                             NA
## `SourceBusiness Standard`                                                                              NA
## `SourceBusiness Standard (press release) (registration) (blog)`                                        NA
## `SourceBusiness Standard India`                                                                        NA
## `SourceBusiness Times of Western Colorado`                                                             NA
## `SourceBusiness Today`                                                                                 NA
## `SourceBusiness Travel News`                                                                           NA
## `SourceBusiness Traveller`                                                                             NA
## `SourceBusiness Weekly`                                                                                NA
## `SourceBusiness Wire`                                                                                  NA
## `SourceBusiness Wire (press release)`                                                                  NA
## `SourceBusiness Wire via Yahoo Canada Finance`                                                         NA
## `SourceBusiness Wire via Yahoo UK & Ireland Finance`                                                   NA
## `SourceBusiness Wire via Yahoo! Finance`                                                               NA
## `SourceBusiness Wire via Yahoo! Finance India`                                                         NA
## `SourceBusiness Wire via Yahoo! New Zealand Finance`                                                   NA
## SourceBusiness.com                                                                                     NA
## SourceBusinessBecause                                                                                  NA
## SourceBusinessDay                                                                                      NA
## `SourceBusinessDesk via Yahoo! New Zealand Finance`                                                    NA
## `SourceBusinessinsider India`                                                                          NA
## SourceBusinessKorea                                                                                    NA
## SourceBusinessNorth.com                                                                                NA
## SourceBusinessTech                                                                                     NA
## `SourceBusinessWorld Online`                                                                           NA
## `SourceBusinessWorld Online Edition`                                                                   NA
## SourceBustle                                                                                           NA
## `SourceBuying Business Travel`                                                                         NA
## `SourceBuzzFeed News`                                                                                  NA
## SourceBwog                                                                                             NA
## `SourceByron Shire News`                                                                               NA
## SourceCainTV                                                                                           NA
## `SourceCaixin Media`                                                                                   NA
## `SourceCalcutta News`                                                                                  NA
## `SourceCalcutta Telegraph`                                                                             NA
## `SourceCalgary Herald`                                                                                 NA
## `SourceCalgary Sun`                                                                                    NA
## `SourceCalifornia Economy Reporting`                                                                   NA
## `SourceCambridge Community Television`                                                                 NA
## `SourceCambridge Evening News`                                                                         NA
## `SourceCambridge News`                                                                                 NA
## `SourceCampaign Asia-Pacific`                                                                          NA
## SourceCampaignLive                                                                                     NA
## `SourceCampus Reform`                                                                                  NA
## `SourceCampus Technology`                                                                              NA
## `SourceCampus Watch`                                                                                   NA
## `SourceCanada Free Press`                                                                              NA
## `SourceCanada NewsWire (press release)`                                                                NA
## `SourceCanada Politics via Yahoo Canada News`                                                          NA
## SourceCanada.com                                                                                       NA
## `SourceCanadian HR Reporter`                                                                           NA
## `SourceCanadian Jewish News`                                                                           NA
## `SourceCanadian Jewish News (blog)`                                                                    NA
## `SourceCanadian Mining Journal`                                                                        NA
## `SourceCanadian Mortgage Broker News`                                                                  NA
## `SourceCanadian Reviewer`                                                                              NA
## SourceCanadianBusiness.com                                                                             NA
## `SourceCanadianBusiness.com (blog)`                                                                    NA
## `SourceCanberra Times`                                                                                 NA
## SourceCanoe                                                                                         0.999
## `SourceCAPA - Centre for Aviation`                                                                     NA
## `SourceCape Breton Post`                                                                               NA
## `SourceCape Business News`                                                                             NA
## `SourceCape Business News South Africa Business`                                                       NA
## SourceCapeTalk                                                                                         NA
## `SourceCapital City Weekly`                                                                            NA
## `SourceCapital FM Kenya (press release) (blog)`                                                        NA
## `SourceCapital Public Radio News`                                                                      NA
## `SourceCapital.gr (press release)`                                                                     NA
## SourceCapitalGazette.com                                                                               NA
## `SourceCar and Driver (blog)`                                                                          NA
## SourceCarAdvice                                                                                        NA
## `SourceCarbon Brief`                                                                                   NA
## `SourceCarbonated.tv (blog)`                                                                           NA
## SourceCarBuzz                                                                                          NA
## SourceCardPlayer.com                                                                                   NA
## SourceCare2.com                                                                                        NA
## `SourceCaribbean360.com (subscription)`                                                                NA
## `SourceCarlisle Sentinel`                                                                              NA
## `SourceCarlsbad Current-Argus`                                                                         NA
## `SourceCarnegie Endowment for International Peace`                                                     NA
## `SourceCarnegie Europe`                                                                                NA
## SourceCarolinacoastonline                                                                              NA
## `SourceCarroll County Times`                                                                           NA
## `SourceCarscoops (blog)`                                                                               NA
## `SourceCarteret County News-Times`                                                                     NA
## `SourceCasper Star-Tribune Online`                                                                     NA
## SourceCastanet.net                                                                                     NA
## `SourceCatch News`                                                                                     NA
## `SourceCatholic Culture`                                                                               NA
## `SourceCatholic Herald`                                                                                NA
## `SourceCatholic Herald Online`                                                                         NA
## `SourceCatholic New York`                                                                              NA
## `SourceCatholic News Agency`                                                                           NA
## `SourceCatholic News Service`                                                                          NA
## `SourceCatholic Online`                                                                                NA
## `SourceCatholic University of America The Tower`                                                       NA
## `SourceCato Institute`                                                                                 NA
## `SourceCato Institute (blog)`                                                                          NA
## `SourceCayman Compass (press release) (registration)`                                                  NA
## `SourceCayman News Service`                                                                            NA
## `SourceCBBC Newsround`                                                                                 NA
## `SourceCBC Edmonton`                                                                                   NA
## `SourceCBC Montreal`                                                                                   NA
## `SourceCBC Newfoundland and Labrador`                                                                  NA
## `SourceCBC via Yahoo Canada News`                                                                      NA
## SourceCBC.ca                                                                                           NA
## `SourceCBS 19 Tyler`                                                                                   NA
## `SourceCBS 2 Los Angeles`                                                                              NA
## `SourceCBS 46 News Atlanta`                                                                            NA
## `SourceCBS 5 Phoenix`                                                                                  NA
## `SourceCBS 6 Richmond`                                                                                 NA
## `SourceCBS 8 San Diego`                                                                                NA
## `SourceCBS Baltimore`                                                                                  NA
## `SourceCBS Chicago`                                                                                    NA
## `SourceCBS Dallas - Fort Worth`                                                                        NA
## `SourceCBS Denver`                                                                                     NA
## `SourceCBS Detroit`                                                                                    NA
## `SourceCBS Local`                                                                                      NA
## `SourceCBS Miami`                                                                                      NA
## `SourceCBS Minnesota`                                                                                  NA
## `SourceCBS MoneyWatch`                                                                                 NA
## `SourceCBS MoneyWatch via Yahoo! Finance`                                                              NA
## `SourceCBS New York`                                                                                   NA
## `SourceCBS News`                                                                                       NA
## `SourceCBS Philadelphia`                                                                               NA
## `SourceCBS Pittsburgh`                                                                                 NA
## `SourceCBS San Francisco`                                                                              NA
## `SourceCBS Sports`                                                                                     NA
## `SourceCBS sports.com (blog)`                                                                          NA
## SourceCBSSports.com                                                                                    NA
## SourceCCM                                                                                              NA
## SourceCCTV                                                                                             NA
## `SourceCCTV-America`                                                                                   NA
## `SourceCDA News`                                                                                       NA
## `SourceCebu Daily News`                                                                                NA
## `SourceCebu Tech Blogger`                                                                              NA
## `SourceCecil Whig`                                                                                     NA
## SourceCedarCreekLake.com                                                                               NA
## `SourceCelebrating Progress Africa`                                                                    NA
## `SourceCellular News`                                                                                  NA
## `SourceCentenary News`                                                                                 NA
## `SourceCenter For American Progress`                                                                   NA
## `SourceCenter for Research on Globalization`                                                           NA
## `SourceCenter for Strategic and International Studies`                                                 NA
## `SourceCentral Chronicle`                                                                              NA
## `SourceCentral Florida Future`                                                                         NA
## `SourceCentral Penn Business Journal`                                                                  NA
## `SourceCentral Washington University`                                                                  NA
## `SourceCentre Daily Times`                                                                             NA
## `SourceCeylon Daily News`                                                                              NA
## `SourceCFA Institute Enterprising Investor (blog)`                                                     NA
## `SourceCFJC Today Kamloops`                                                                            NA
## SourceCFO                                                                                              NA
## `SourceCGMA Magazine`                                                                                  NA
## `SourceChampaign/Urbana News-Gazette`                                                                  NA
## SourceChampion                                                                                         NA
## `SourceChandigarh Tribune`                                                                             NA
## `SourceChannel 24`                                                                                     NA
## `SourceChannel 4 News`                                                                                 NA
## `SourceChannel 4 News (blog)`                                                                          NA
## `SourceChannel 8 San Diego`                                                                            NA
## `SourceChannel Insider`                                                                                NA
## `SourceChannel News Asia`                                                                              NA
## `SourceChannel NewsAsia`                                                                               NA
## `SourceChannel Partners`                                                                               NA
## `SourceChannel Partners (blog)`                                                                        NA
## `SourceChannel Pro`                                                                                    NA
## `SourceChannel3000.com - WISC-TV3`                                                                     NA
## SourceChannel4000.com                                                                                  NA
## SourceChannelBiz                                                                                       NA
## SourceChannelBuzz.ca                                                                                   NA
## `SourceChannelLife Australia`                                                                          NA
## `SourceChannelLife NZ`                                                                                 NA
## SourceChannelnomics                                                                                    NA
## `SourceChannelnomics EU (registration)`                                                                NA
## `SourceCHANNELS TELEVISION`                                                                            NA
## `SourceCharisma News`                                                                                  NA
## `SourceCharleston Gazette-Mail (subscription)`                                                         NA
## `SourceCharleston Post Courier`                                                                        NA
## `SourceCharleston Post Courier (press release)`                                                        NA
## `SourceCharlotte Business Journal`                                                                     NA
## `SourceCharlotte Business Journal (blog)`                                                              NA
## `SourceCharlotte Observer`                                                                             NA
## SourceChartAttack                                                                                      NA
## `SourceCharter 97`                                                                                     NA
## `SourceChase News & Stories`                                                                           NA
## `SourceChattanooga Times Free Press`                                                                   NA
## SourceChemicalOnline                                                                                   NA
## `SourceCherry Hill Courier Post`                                                                       NA
## `SourceCherwell Online`                                                                                NA
## `SourceChicago Business Journal`                                                                       NA
## `SourceChicago Daily Herald`                                                                           NA
## `SourceChicago Inno`                                                                                   NA
## `SourceChicago Reader`                                                                                 NA
## `SourceChicago Sun-Times`                                                                              NA
## `SourceChicago Tonight | WTTW`                                                                         NA
## `SourceChicago Tribune`                                                                             1.000
## SourceChicagoist                                                                                       NA
## `SourceChicagoNow (blog)`                                                                              NA
## `SourceChichester Observer`                                                                            NA
## `SourceChillicothe Gazette`                                                                            NA
## `SourceChilliwack Progress`                                                                            NA
## `SourceChina Daily`                                                                                    NA
## `SourceChina Daily HK Edition`                                                                         NA
## `SourceChina Digital Times`                                                                            NA
## `SourceChina Economic Net`                                                                             NA
## `SourceChina Economic Review`                                                                          NA
## `SourceChina Post`                                                                                     NA
## SourceChina.org.cn                                                                                     NA
## `SourceChinadaily USA`                                                                                 NA
## SourceChinaFile                                                                                        NA
## SourceChinapost                                                                                        NA
## SourceChinatopix                                                                                       NA
## SourceChinaTopix                                                                                       NA
## `SourceChip Chick`                                                                                     NA
## SourceCHOICE                                                                                           NA
## `SourceChristian Broadcasting Network`                                                                 NA
## `SourceChristian Daily`                                                                                NA
## `SourceChristian News Network`                                                                         NA
## `SourceChristian Post`                                                                                 NA
## `SourceChristian Science Monitor`                                                                      NA
## `SourceChristian Science Monitor via Yahoo Canada News`                                                NA
## `SourceChristian Science Monitor via Yahoo UK & Ireland News`                                          NA
## `SourceChristian Science Monitor via Yahoo! News`                                                      NA
## `SourceChristian Today`                                                                                NA
## SourceChristianityToday.com                                                                            NA
## SourceChristianToday                                                                                   NA
## SourceChron.com                                                                                        NA
## `SourceChron.com (blog)`                                                                               NA
## SourceChronicle                                                                                        NA
## `SourceChronicle of Higher Education (subscription)`                                                   NA
## `SourceChronicle of Higher Education (subscription) (blog)`                                            NA
## `SourceChronicle of Philanthropy (subscription)`                                                       NA
## SourceChronicleLive                                                                                    NA
## `SourceChurch Militant`                                                                                NA
## `SourceChurch Times`                                                                                   NA
## `SourceCihan News Agency`                                                                              NA
## SourceCILISOS.MY                                                                                       NA
## `SourceCincinnati Business Courier`                                                                    NA
## `SourceCincinnati Business Courier (blog)`                                                             NA
## SourceCincinnati.com                                                                                   NA
## `SourceCincinnati.com (blog)`                                                                          NA
## `SourceCinema Blend`                                                                                   NA
## SourceCInewsNow                                                                                        NA
## SourceCIO                                                                                              NA
## `SourceCIO Australia`                                                                                  NA
## `SourceCIO Dive`                                                                                       NA
## `SourceCIO Insight`                                                                                    NA
## `SourceCIO New Zealand`                                                                                NA
## `SourceCIO Today`                                                                                      NA
## `SourceCIO UK`                                                                                         NA
## `SourceCIOReview (press release)`                                                                      NA
## SourceCirculate                                                                                        NA
## `SourceCities Today`                                                                                   NA
## SourceCitifmonline                                                                                     NA
## SourceCitizen                                                                                          NA
## `SourceCitizen TV (press release)`                                                                     NA
## `SourceCitizens Voice`                                                                                 NA
## `SourceCitrus County Chronicle`                                                                        NA
## `SourceCity & County of San Francisco (press release)`                                                 NA
## `SourceCity A.M.`                                                                                      NA
## `SourceCity Limits`                                                                                    NA
## `SourceCity Pages`                                                                                     NA
## SourceCityLab                                                                                          NA
## SourceCityMetric                                                                                       NA
## SourceCityNews                                                                                         NA
## SourceCitywire.co.uk                                                                                   NA
## `SourceCivil Society Media`                                                                            NA
## `SourceCIWM Journal Online`                                                                            NA
## SourceCJOB                                                                                             NA
## `SourceCKGSB Knowledge`                                                                                NA
## `SourceCKNW News Talk 980`                                                                             NA
## SourceClaimsJournal.com                                                                                NA
## SourceClapway                                                                                          NA
## `SourceClaremore Daily Progress`                                                                       NA
## `SourceClarence Valley Daily Examiner`                                                                 NA
## `SourceClarksville Leaf Chronicle`                                                                     NA
## `SourceClay County Times-Democrat`                                                                     NA
## SourceCleanTechnica                                                                                    NA
## `SourceCleveland 19 News`                                                                              NA
## Sourcecleveland.com                                                                                    NA
## `SourceClick Green`                                                                                    NA
## SourceClickOnDetroit                                                                                   NA
## `SourceClimate Central`                                                                                NA
## `SourceClimate Home`                                                                                   NA
## `SourceClinton Herald`                                                                                 NA
## `SourceCloud Computing Intelligence (registration)`                                                    NA
## `SourceCloud Pro`                                                                                      NA
## `SourceCloud Tech`                                                                                     NA
## SourceCloudTech                                                                                        NA
## SourceCloudWedge                                                                                       NA
## `SourceCLTV Chicago`                                                                                   NA
## SourceCMSWire                                                                                          NA
## SourceCNBC                                                                                          1.000
## `SourceCNBC (subscription)`                                                                            NA
## `SourceCNBC via Yahoo Canada Finance`                                                                  NA
## `SourceCNBC via Yahoo! Finance`                                                                     1.000
## `SourceCNBC via Yahoo! Finance India`                                                                  NA
## `SourceCNBC via Yahoo! New Zealand Finance`                                                            NA
## `SourceCNBC via Yahoo!7 Finance`                                                                       NA
## SourceCNBCAfrica.com                                                                                   NA
## SourceCNET                                                                                             NA
## `SourceCNET en español via Yahoo! News`                                                                NA
## `SourceCNET UK`                                                                                     1.000
## `SourceCNET via Yahoo! Finance`                                                                        NA
## `SourceCNET via Yahoo! News`                                                                           NA
## SourceCNN                                                                                              NA
## `SourceCNN International`                                                                              NA
## `SourceCNN Money`                                                                                      NA
## `SourceCNN Philippines`                                                                                NA
## SourceCNN.com                                                                                          NA
## SourceCNNMoney                                                                                         NA
## SourceCNSNews.com                                                                                      NA
## `SourceCNSNews.com (blog)`                                                                             NA
## `SourceCNW Group via Yahoo Canada Finance`                                                             NA
## `SourceCNW Group via Yahoo! Finance`                                                                   NA
## `SourceCo-operative News`                                                                              NA
## SourceCo.Create                                                                                        NA
## SourceCo.Design                                                                                        NA
## `SourceCo.Design (blog)`                                                                               NA
## SourceCo.Exist                                                                                         NA
## `SourceCoAssets via Yahoo! Singapore News`                                                             NA
## `SourceCoast Reporter`                                                                             <2e-16
## `SourceCochrane Times`                                                                                 NA
## `SourceCoconuts Bangkok`                                                                               NA
## `SourceCoconuts Hong Kong`                                                                             NA
## `SourceCoffs Coast Advocate`                                                                           NA
## SourceCoinDesk                                                                                         NA
## SourceCoinReport                                                                                       NA
## SourceCoinTelegraph                                                                                    NA
## `SourceColombia Reports`                                                                               NA
## `SourceColombo Gazette`                                                                                NA
## `SourceColorado Springs Gazette`                                                                       NA
## `SourceColorLines magazine`                                                                            NA
## `SourceColumbia Daily Herald`                                                                          NA
## `SourceColumbia Daily Tribune`                                                                         NA
## `SourceColumbia Journalism Review`                                                                     NA
## `SourceColumbia Missourian`                                                                            NA
## `SourceColumbus Business First`                                                                        NA
## `SourceColumbus Dispatch`                                                                              NA
## `SourceColumbus Dispatch (blog)`                                                                       NA
## `SourceColumbus Ledger-Enquirer`                                                                       NA
## `SourceComcast SportsNet Philadelphia`                                                                 NA
## `SourceComet 24`                                                                                       NA
## SourceComicbook.com                                                                                    NA
## `SourceCommBank MyWealth`                                                                              NA
## `SourceCommentary Magazine`                                                                            NA
## `SourceCommercial Property Executive`                                                                  NA
## `SourceCommittee for Accuracy in Middle East Reporting in America`                                     NA
## `SourceCommittee for Accuracy in Middle East Reporting in America (blog)`                              NA
## `SourceCommon Dreams (press release)`                                                                  NA
## SourceCommonDreams.org                                                                                 NA
## SourceCommonSpace                                                                                      NA
## `SourceCommonweal (blog)`                                                                              NA
## `SourceCommonWealth magazine`                                                                          NA
## `SourceCommunist Party USA`                                                                            NA
## `SourceCommunity Financial News`                                                                       NA
## `SourceComox Valley Record`                                                                            NA
## `SourceComplete Music Update`                                                                          NA
## SourceComplex                                                                                          NA
## `SourceComputer Business Review`                                                                       NA
## `SourceComputer Dealer News`                                                                           NA
## `SourceComputer Weekly`                                                                                NA
## `SourceComputer World Australia`                                                                       NA
## SourceComputerWeekly.com                                                                               NA
## `SourceComputerWeekly.com (blog)`                                                                      NA
## SourceComputerworld                                                                                    NA
## `SourceComputerworld Australia`                                                                        NA
## `SourceComputerworld New Zealand`                                                                      NA
## SourceComputerworldUK                                                                                  NA
## SourceComputing                                                                                        NA
## SourceComputing.co.uk                                                                                  NA
## `SourceConcord Monitor`                                                                                NA
## `SourceConcord Transcript`                                                                             NA
## `SourceCond\\u009d\\u009d Nast Traveler`                                                               NA
## `SourceCondé Nast Traveller`                                                                           NA
## `SourceConnecticut Jewish Ledger`                                                                      NA
## `SourceConnecticut Post`                                                                               NA
## `SourceConsequence of Sound (blog)`                                                                    NA
## `SourceConservative Home`                                                                              NA
## `SourceConsortium News`                                                                                NA
## Sourceconsortiumnews.com                                                                               NA
## `SourceConstitution Daily (blog)`                                                                      NA
## `SourceConstruction Week Online`                                                                       NA
## SourceConsultancy.uk                                                                                   NA
## `SourceConsumer Reports via Yahoo Canada Finance`                                                      NA
## `SourceConsumer Reports via Yahoo! Finance`                                                            NA
## `SourceContra Costa Times`                                                                             NA
## `SourceContractor UK`                                                                                  NA
## `SourceCoos Bay World`                                                                                 NA
## `SourceCops 2.0`                                                                                       NA
## `SourceCordele Dispatch`                                                                               NA
## `SourceCorn and Soybean Digest (blog)`                                                                 NA
## `SourceCornell Chronicle`                                                                              NA
## `SourceCornell University The Cornell Daily Sun`                                                       NA
## `SourceCornish Guardian`                                                                               NA
## `SourceCorpus Christi Caller-Times`                                                                    NA
## `SourceCorsicana Daily Sun`                                                                            NA
## `SourceCorvallis Gazette Times`                                                                        NA
## `SourceCorvus Business Newswire`                                                                       NA
## SourceCosmopolitan.com                                                                                 NA
## `SourceCoStar Group`                                                                                   NA
## `SourceCotswold Journal`                                                                               NA
## `SourceCouncil on Foreign Relations`                                                                   NA
## `SourceCouncil on Foreign Relations (blog)`                                                            NA
## `SourceCounsel & Heal`                                                                                 NA
## SourceCounterCurrents.org                                                                              NA
## SourceCounterPunch                                                                                     NA
## `SourceCourier Mail`                                                                                   NA
## `SourceCoventry City FC`                                                                               NA
## `SourceCoventry Telegraph`                                                                             NA
## `SourceCP24 Toronto's Breaking News`                                                                   NA
## `SourceCPI Financial`                                                                                  NA
## `SourceCQ Politics`                                                                                    NA
## SourceCrackBerry.com                                                                                   NA
## `SourceCrain's Chicago Business`                                                                       NA
## `SourceCrain's Chicago Business (blog)`                                                                NA
## `SourceCrain's Cleveland Business`                                                                     NA
## `SourceCrain's Detroit Business`                                                                       NA
## `SourceCrain's Detroit Business (blog)`                                                                NA
## `SourceCrain's New York Business`                                                                      NA
## `SourceCrain's New York Business (blog)`                                                               NA
## `SourceCrain&#39;s New York Business`                                                                  NA
## `SourceCrave Online`                                                                                   NA
## `SourceCreamer Media's Engineering News`                                                               NA
## `SourceCreamer Media's Mining Weekly`                                                                  NA
## SourceCreativity                                                                                       NA
## `SourceCredit.com via Yahoo! Finance`                                                                  NA
## SourceCRIENGLISH.com                                                                                   NA
## SourceCrikey                                                                                           NA
## `SourceCrikey (registration)`                                                                          NA
## SourceCRN                                                                                              NA
## `SourceCRN - UK`                                                                                       NA
## `SourceCRN Australia`                                                                                  NA
## `SourceCrookston Daily Times`                                                                          NA
## `SourceCross Rhythms`                                                                                  NA
## `SourceCrowdfund Insider`                                                                              NA
## SourceCrowdsourcing.org                                                                                NA
## `SourceCrux: Covering all things Catholic`                                                             NA
## SourceCryptoCoinsNews                                                                                  NA
## `SourceCSO Australia`                                                                                  NA
## `SourceCSO Online`                                                                                     NA
## SourceCSPnet.com                                                                                       NA
## `SourceCSRwire.com (press release)`                                                                    NA
## `SourceCT Post`                                                                                        NA
## SourceCTR                                                                                              NA
## `SourceCTV British Columbia News`                                                                      NA
## `SourceCTV Calgary News`                                                                               NA
## `SourceCTV Montreal News`                                                                              NA
## `SourceCTV News`                                                                                       NA
## `SourceCTV Ottawa News`                                                                                NA
## `SourceCTV Toronto`                                                                                    NA
## SourceCTV.ca                                                                                           NA
## `SourceCU Boulder News & Events`                                                                       NA
## `SourceCU Columbia Spectator`                                                                          NA
## `SourceCult of Mac`                                                                                    NA
## SourceCurbed                                                                                           NA
## `SourceCurbed Chicago`                                                                                 NA
## `SourceCurbed DC`                                                                                      NA
## `SourceCustomer Think`                                                                                 NA
## `SourceCW39 NewsFix`                                                                                   NA
## SourceCXOToday.com                                                                                     NA
## `SourceCycling Weekly`                                                                                 NA
## `SourceCyprus Mail`                                                                                    NA
## `SourceCzech Happenings`                                                                               NA
## `SourceD Magazine`                                                                                     NA
## `SourceDaiji World`                                                                                    NA
## SourceDaijiworld.com                                                                                   NA
## `SourceDaily American Online`                                                                          NA
## `SourceDaily Astorian`                                                                                 NA
## `SourceDaily Aztec`                                                                                    NA
## `SourceDaily Beast`                                                                                    NA
## `SourceDaily Bruin`                                                                                    NA
## `SourceDaily Californian`                                                                              NA
## `SourceDaily Caller`                                                                                   NA
## `SourceDaily Capital (Capital TV)`                                                                     NA
## `SourceDaily Commercial`                                                                               NA
## `SourceDaily Courier`                                                                                  NA
## `SourceDaily Democrat`                                                                                 NA
## `SourceDaily Echo`                                                                                     NA
## `SourceDaily Excelsior`                                                                                NA
## `SourceDaily Express`                                                                                  NA
## `SourceDaily Free Press (subscription)`                                                                NA
## `SourceDaily Herald`                                                                                   NA
## `SourceDaily Journal`                                                                                  NA
## `SourceDaily Kos`                                                                                      NA
## `SourceDaily Life`                                                                                     NA
## `SourceDaily Local News`                                                                               NA
## `SourceDaily Mail`                                                                                  1.000
## `SourceDaily Maverick`                                                                                 NA
## `SourceDaily Mirror`                                                                                   NA
## `SourceDaily News`                                                                                     NA
## `SourceDaily News & Analysis`                                                                          NA
## `SourceDaily News | The National Newspaper (press release) (blog)`                                     NA
## `SourceDaily News Egypt`                                                                               NA
## `SourceDaily Nexus`                                                                                    NA
## `SourceDaily NK`                                                                                       NA
## `SourceDaily Northwestern`                                                                             NA
## `SourceDaily Pakistan`                                                                                 NA
## `SourceDaily Pioneer`                                                                                  NA
## `Sourcedaily post`                                                                                     NA
## `SourceDaily Post Nigeria`                                                                             NA
## `SourceDaily Post North Wales`                                                                         NA
## `SourceDaily Press`                                                                                    NA
## `SourceDaily Reckoning - Australian Edition`                                                           NA
## `SourceDaily Record`                                                                                   NA
## `SourceDaily Sabah`                                                                                    NA
## `SourceDaily Signal`                                                                                   NA
## `SourceDaily Star`                                                                                     NA
## `SourceDaily Star Gazette`                                                                             NA
## `SourceDaily Sun`                                                                                      NA
## `SourceDaily Telegraph`                                                                                NA
## `SourceDaily Times`                                                                                    NA
## `SourceDaily Times Nigeria`                                                                            NA
## `SourceDaily Trojan Online`                                                                            NA
## `SourceDaily Trust`                                                                                    NA
## `SourceDaily Yonder`                                                                                   NA
## SourceDailyFinance                                                                                     NA
## SourceDailyForex.com                                                                                   NA
## SourceDailyFX                                                                                          NA
## `SourceDailyFX via Yahoo! Finance`                                                                     NA
## `SourceDailyFX via Yahoo! New Zealand Finance`                                                         NA
## `SourceDailyFX via Yahoo!7 Finance`                                                                    NA
## SourceDailyNews                                                                                        NA
## SourceDailyO                                                                                           NA
## `SourceDailyPost Nigeria`                                                                              NA
## Sourcedailytelegraph.com.au                                                                            NA
## SourceDailyuw                                                                                          NA
## `SourceDakota Financial News`                                                                          NA
## `SourceDallas Business Journal`                                                                        NA
## `SourceDallas Business Journal (blog)`                                                                 NA
## `SourceDallas Morning News`                                                                            NA
## `SourceDallas Morning News (blog)`                                                                     NA
## `SourceDallas Sun Times`                                                                               NA
## `SourceDanbury News Times`                                                                             NA
## `SourceDarien News-Review`                                                                             NA
## `SourceDark Reading`                                                                                   NA
## `SourceData Center Knowledge`                                                                          NA
## SourceDatamation                                                                                       NA
## SourceDatanami                                                                                         NA
## SourceDATAQUEST                                                                                        NA
## `SourceDavid Curry, Digital Trends via Yahoo! News`                                                    NA
## SourceDawn                                                                                             NA
## SourceDAWN.com                                                                                         NA
## `SourceDay Herald`                                                                                     NA
## `SourceDayton Business Journal`                                                                        NA
## `SourceDayton Daily News`                                                                              NA
## `SourceDaytona Beach News-Journal`                                                                     NA
## `SourceDazeinfo (blog)`                                                                                NA
## `SourceDC Inno`                                                                                        NA
## SourceDCist.com                                                                                        NA
## `SourceDe Dagelijkse Standaard (Blog)`                                                                 NA
## `SourceDe Montfort University (press release)`                                                         NA
## SourceDeadline                                                                                         NA
## `SourceDeadline Hollywood`                                                                             NA
## SourceDeadspin                                                                                         NA
## SourceDealBreaker                                                                                      NA
## SourceDEALSTREETASIA                                                                                   NA
## `SourceDeath and Taxes`                                                                                NA
## `SourceDEBKA file`                                                                                     NA
## SourceDEBKAfile                                                                                        NA
## `SourceDeccan Chronicle`                                                                               NA
## `SourceDeccan Herald`                                                                                  NA
## SourceDeepika                                                                                          NA
## `SourceDefense One`                                                                                    NA
## SourceDefenseNews.com                                                                                  NA
## `SourceDeKalb Daily Chronicle`                                                                         NA
## `SourceDelaware First Media`                                                                           NA
## SourceDelimiter                                                                                        NA
## `SourceDelmarva Daily Times`                                                                           NA
## SourceDelo                                                                                             NA
## `SourceDelta Farm Press`                                                                               NA
## `SourceDemocracy Now!`                                                                                 NA
## `SourceDemocracy Now! (blog)`                                                                          NA
## `SourceDentistry IQ`                                                                                   NA
## `SourceDenver Business Journal (blog)`                                                                 NA
## `SourceDenver Post`                                                                                    NA
## `SourceDenver Sun Times`                                                                               NA
## `SourceDepartment of Defense`                                                                          NA
## `SourceDerby Telegraph`                                                                                NA
## `SourceDerbyshire Times`                                                                               NA
## `SourceDerry Journal`                                                                                  NA
## `SourceDerry Now`                                                                                      NA
## `SourceDeseret News`                                                                                   NA
## `SourceDesign & Trend`                                                                                 NA
## `SourceDesign Week`                                                                                    NA
## `SourceDesign World Network`                                                                           NA
## `SourceDesignboom (blog)`                                                                              NA
## SourceDesignNews                                                                                       NA
## SourceDESINFOS.com                                                                                     NA
## `SourceDeSmog Canada`                                                                                  NA
## SourceDesMoinesRegister.com                                                                            NA
## `SourceDestination CRM`                                                                                NA
## SourceDestinyMan                                                                                       NA
## SourceDestructoid                                                                                      NA
## SourceDetails                                                                                          NA
## `SourceDetroit Free Press`                                                                             NA
## `SourceDetroit News`                                                                                   NA
## `SourceDeutsche Welle`                                                                                 NA
## SourceDevelop                                                                                          NA
## `SourceDeveloper Tech`                                                                                 NA
## SourceDeveloper.com                                                                                    NA
## SourceDeveloperTech                                                                                    NA
## SourceDevex                                                                                            NA
## `SourceDevils Lake Journal`                                                                            NA
## SourceDexigner                                                                                         NA
## SourceDezeen                                                                                           NA
## Sourcedh.be                                                                                            NA
## `SourceDhaka Tribune`                                                                                  NA
## SourceDhakaTribune                                                                                     NA
## `SourceDiamondback Online`                                                                             NA
## `SourceDickinson Press`                                                                                NA
## `SourceDigi Times`                                                                                     NA
## SourceDigiday                                                                                          NA
## SourceDiginomica                                                                                       NA
## SourceDigit                                                                                            NA
## `SourceDigital Arts Online`                                                                            NA
## `SourceDigital Journal`                                                                                NA
## `SourceDigital Music News`                                                                             NA
## `SourceDigital Spy`                                                                                    NA
## `SourceDigital Trends`                                                                                 NA
## `SourceDigital Trends via Yahoo Canada News`                                                           NA
## `SourceDigital Trends via Yahoo Maktoob News`                                                          NA
## `SourceDigital Trends via Yahoo UK & Ireland News`                                                     NA
## `SourceDigital Trends via Yahoo! Finance`                                                              NA
## `SourceDigital Trends via Yahoo! News`                                                              1.000
## `SourceDigital Trends via Yahoo! Sports`                                                            1.000
## SourceDigitalBroadcastingcom                                                                           NA
## SourceDIGITALLOOK                                                                                      NA
## SourceDigitalTVEurope.net                                                                              NA
## SourceDigitimes                                                                                        NA
## `SourceDin Merican`                                                                                    NA
## `SourceDirect Marketing News`                                                                          NA
## SourceDirectionsMag.com                                                                                NA
## `SourceDirector magazine`                                                                              NA
## `SourceDisability Scoop`                                                                               NA
## SourceDiscover                                                                                         NA
## `SourceDiscover Humboldt`                                                                              NA
## `SourceDiscover Magazine (blog)`                                                                       NA
## `SourceDiscovery News`                                                                                 NA
## `SourceDissident Voice`                                                                                NA
## `SourceDiverse: Issues in Higher Education`                                                            NA
## SourceDividend.com                                                                                     NA
## SourceDJBooth.net                                                                                      NA
## `SourceDL-Online`                                                                                      NA
## `SourceDNA India`                                                                                      NA
## SourceDNAinfo                                                                                          NA
## SourceDOGOnews                                                                                         NA
## `SourceDoha News`                                                                                      NA
## `SourceDomain News`                                                                                    NA
## `SourceDominican Today`                                                                                NA
## SourceDoordarshan                                                                                      NA
## `SourceDorking and Leatherhead Advertiser`                                                             NA
## `SourceDorset Echo`                                                                                    NA
## `SourceDothan Eagle`                                                                                   NA
## `SourceDothan First`                                                                                   NA
## `SourceDouglas Budget`                                                                                 NA
## `SourceDover Post`                                                                                     NA
## `SourceDownload.com via Yahoo! News`                                                                   NA
## `SourceDream Team FC`                                                                                  NA
## `SourceDreuz Info`                                                                                     NA
## `SourceDrexel University The Triangle Online`                                                          NA
## SourceDriving                                                                                          NA
## SourceDSNews.com                                                                                       NA
## `SourceDubuque Telegraph Herald`                                                                       NA
## `SourceDuluth News Tribune`                                                                            NA
## `SourceDuncan Banner`                                                                                  NA
## `SourceDunyaNews Pakistan`                                                                             NA
## `SourceDunyaNews Pakistan (blog)`                                                                      NA
## `SourceDurham Herald Sun`                                                                              NA
## SourceDutchNews.nl                                                                                     NA
## `SourceDZ Foot`                                                                                        NA
## `SourceDZone News`                                                                                     NA
## `SourceE-Commerce Times`                                                                            1.000
## `SourceE-Flux`                                                                                         NA
## `SourceE-Pao.net`                                                                                      NA
## `SourceE Kantipur`                                                                                     NA
## `SourceE! Online`                                                                                      NA
## `SourceE&T magazine`                                                                                   NA
## Sourcee27                                                                                              NA
## `Sourcee27 via Yahoo! Singapore News`                                                                  NA
## `SourceEagle-Tribune`                                                                                  NA
## `SourceEagle Radio`                                                                                    NA
## `SourceEast African Business Week`                                                                     NA
## `SourceEast Anglian Daily Times`                                                                       NA
## `SourceEast Asia Forum`                                                                                NA
## `SourceEast Bay Express`                                                                               NA
## `SourceEast Bay Times`                                                                                 NA
## `SourceEast Coast Radio`                                                                               NA
## `SourceEast London and West Essex Guardian Series`                                                     NA
## `SourceEast Oregonian (subscription)`                                                                  NA
## `SourceEastbourne Herald`                                                                              NA
## SourceEastday.com                                                                                      NA
## `SourceEat Out Magazine`                                                                               NA
## SourceEater                                                                                            NA
## `SourceEater Austin`                                                                                   NA
## `SourceEater DC`                                                                                       NA
## `SourceEater Detroit (blog)`                                                                           NA
## `SourceEater Seattle`                                                                                  NA
## `SourceeCampus News`                                                                                   NA
## `SourceECB Publishing`                                                                                 NA
## SourceEcho                                                                                             NA
## SourceEchonetdaily                                                                                     NA
## SourceECNmag.com                                                                                       NA
## Sourceecns                                                                                             NA
## `Sourceeco-business.com`                                                                               NA
## Sourceeconomia                                                                                         NA
## `SourceEconomic Calendar`                                                                              NA
## `SourceEconomic Times`                                                                                 NA
## `SourceEconomic Times (blog)`                                                                          NA
## SourceEconomics21                                                                                      NA
## `SourceEconoMonitor (blog)`                                                                            NA
## SourceEconomy                                                                                          NA
## SourceEconomyWatch.com                                                                                 NA
## SourceEconoTimes                                                                                       NA
## `SourceEContent (press release)`                                                                       NA
## SourceEcoWatch                                                                                         NA
## `SourceEcumenical News`                                                                                NA
## Sourceedie.net                                                                                         NA
## `SourceEdmond Sun`                                                                                     NA
## `SourceEdmonton Journal`                                                                               NA
## `SourceEdmonton Sun`                                                                                   NA
## SourceEdmunds.com                                                                                      NA
## SourceEdSurge                                                                                          NA
## `SourceEdTech Magazine: Focus on Higher Education`                                                     NA
## `SourceEducation Dive`                                                                                 NA
## `SourceEducation Week (subscription)`                                                                  NA
## `SourceEducation Week (subscription) (blog)`                                                           NA
## `SourceEducators NZ`                                                                                   NA
## `SourceEE Times`                                                                                       NA
## `SourceEE Times Asia`                                                                                  NA
## SourceEETimes                                                                                          NA
## SourceEFF                                                                                              NA
## `SourceEffingham's News Leader`                                                                        NA
## `SourceEffingham Daily News`                                                                           NA
## `SourceEgypt Independent`                                                                              NA
## `SourceEgypt SIS (press release)`                                                                      NA
## `SourceEgyptian Streets`                                                                               NA
## `SourceEJ Insight`                                                                                     NA
## SourceEkklesia                                                                                         NA
## `SourceEl Moudjahid`                                                                                   NA
## `SourceEl Paisano`                                                                                     NA
## `SourceEl Watan`                                                                                       NA
## `Sourceelan: The Guide to Global Muslim Culture`                                                       NA
## `SourceElectronic Beats (press release) (blog)`                                                        NA
## `SourceElectronics EETimes (registration)`                                                             NA
## `SourceElectronics Weekly`                                                                             NA
## `SourceElectronics Weekly (blog)`                                                                      NA
## `SourceElite Daily`                                                                                    NA
## `SourceElite Daily (blog)`                                                                             NA
## `SourceElizabethtown News Enterprise`                                                                  NA
## `SourceElko Daily Free Press`                                                                          NA
## `SourceELLE UK`                                                                                        NA
## SourceELLE.com                                                                                         NA
## `SourceElliott Wave`                                                                                   NA
## SourceEllwoodCity.org                                                                                  NA
## `SourceEly News`                                                                                       NA
## SourceeMarketer                                                                                        NA
## `SourceEmbassy News (subscription)`                                                                    NA
## `SourceEmergency Management (blog)`                                                                    NA
## Sourceemergingmarkets.org                                                                              NA
## `SourceEmirates 24|7`                                                                                  NA
## SourceEMQ                                                                                              NA
## `SourceEN DELFI`                                                                                       NA
## `SourceEN DELFI (subscription)`                                                                        NA
## SourceeNCA                                                                                             NA
## `SourceEnergy Matters`                                                                                 NA
## `SourceEnergy Voice`                                                                                   NA
## `SourceEnergy.gov (blog)`                                                                              NA
## `SourceeNews Park Forest`                                                                              NA
## SourceEngadget                                                                                      1.000
## `SourceEngadget (blog)`                                                                                NA
## SourceENGINEERING.com                                                                                  NA
## SourceEnnahar                                                                                          NA
## `SourceEnough Project`                                                                                 NA
## `SourceEnough Project (blog)`                                                                          NA
## `SourceENPI Info Centre`                                                                               NA
## SourceEnsia                                                                                            NA
## SourceEnstarz                                                                                          NA
## `SourceEnter Stage Right`                                                                              NA
## `SourceEnterprise Apps Tech`                                                                           NA
## `SourceEnterprise Innovation`                                                                          NA
## `SourceEnterprise Irregulars (blog)`                                                                   NA
## `SourceEnterprise Leader`                                                                              NA
## `SourceEnterprise Times`                                                                               NA
## `SourceEnterpriseContentManagementConnection-ECM`                                                      NA
## SourceEnterpriseTech                                                                                   NA
## `SourceEntertainment Tonight`                                                                          NA
## `SourceEntertainment Tonight via Yahoo Canada News`                                                    NA
## `SourceEntertainment Weekly`                                                                           NA
## `SourceEntertainment Weekly (blog)`                                                                    NA
## SourceEntrepreneur                                                                                     NA
## `SourceEntrepreneur via Yahoo Canada Finance`                                                          NA
## `SourceEntrepreneur via Yahoo! Finance`                                                                NA
## SourceEntrpreneur                                                                                      NA
## `SourceEnvironment & Energy Publishing`                                                                NA
## `SourceEnvironmental Data Interactive Exchange`                                                        NA
## `SourceEnvironmental Defense Fund (blog)`                                                              NA
## `SourceEnvironmental Finance`                                                                          NA
## `SourceEnvironmental Leader`                                                                           NA
## `SourceEnvironmental News Network`                                                                     NA
## `SourceEnvironmental Working Group`                                                                    NA
## SourceeParisExtra.com                                                                                  NA
## `SourceEqual Times`                                                                                    NA
## `SourceEquilibrio Informativo`                                                                         NA
## SourceEquities.com                                                                                     NA
## `SourceErie Times-News`                                                                                NA
## `SourceErvik.as (press release) (registration) (blog)`                                                 NA
## `Sourceeské noviny`                                                                                    NA
## SourceESPN                                                                                             NA
## `SourceESPN (blog)`                                                                                    NA
## `SourceESPN Blogs`                                                                                     NA
## `SourceESPN FC`                                                                                        NA
## `SourceESPN FC (blog)`                                                                                 NA
## SourceESPNcricinfo.com                                                                                 NA
## SourceEsquire.com                                                                                      NA
## SourceEssence.com                                                                                      NA
## `SourceEssex Chronicle`                                                                                NA
## SourceETAuto.com                                                                                       NA
## SourceETCIO.com                                                                                        NA
## `SourceETF Daily News`                                                                                 NA
## `SourceETF Trends via Yahoo! Finance`                                                                  NA
## `SourceETF.com via Yahoo! Finance`                                                                     NA
## SourceETFinalScore.com                                                                                 NA
## `SourceETonline via Yahoo Celebrity`                                                                   NA
## SourceETRetail.com                                                                                     NA
## SourceETtech.com                                                                                       NA
## SourceETTelecom.com                                                                                    NA
## SourceeTurboNews                                                                                       NA
## `SourceEu Business`                                                                                    NA
## `SourceEU News`                                                                                        NA
## `SourceEUbusiness (press release)`                                                                     NA
## SourceEUobserver                                                                                       NA
## SourceEurActiv                                                                                         NA
## `SourceEurasia Review`                                                                                 NA
## SourceEurasiaNet                                                                                       NA
## `SourceEureka Times Standard`                                                                          NA
## `SourceEurekAlert (press release)`                                                                     NA
## `SourceEurekAlert!`                                                                                    NA
## SourceEurogamer.net                                                                                    NA
## `SourceEuromoney magazine`                                                                             NA
## Sourceeuronews                                                                                         NA
## SourceEuroNews                                                                                         NA
## `SourceEurope Online Magazine`                                                                         NA
## `SourceEuropean Council on Foreign Relations`                                                          NA
## `SourceEuropean Jewish Press`                                                                          NA
## `SourceEuropean Parliament (press release)`                                                            NA
## SourceEuropeanCEO                                                                                      NA
## `SourceEUROPP - European Politics and Policy (blog)`                                                   NA
## SourceEuroScientist                                                                                    NA
## SourceEurosport                                                                                        NA
## SourceEURweb                                                                                           NA
## SourceEurweb.com                                                                                       NA
## `SourceEvenimentul Zilei`                                                                              NA
## `SourceEvening Chronicle`                                                                              NA
## `SourceEvening Standard`                                                                               NA
## `SourceEveningTimes Online`                                                                            NA
## `SourceEvent Magazine`                                                                                 NA
## SourceEventHubs                                                                                        NA
## `SourceEverett Herald`                                                                                 NA
## Sourceevertiq.com                                                                                      NA
## SourceEverythingLubbock.com                                                                            NA
## SourceeWeek                                                                                            NA
## `SourceExaminer Enterprise`                                                                            NA
## `SourceExaminer Gazette`                                                                               NA
## SourceExaminer.com                                                                                     NA
## `SourceExaminerPost.com (blog)`                                                                        NA
## `SourceExcalibur Online`                                                                               NA
## `SourceExchange News Direct`                                                                           NA
## `SourceExchange Rates UK`                                                                              NA
## `SourceExchangeWire (blog)`                                                                            NA
## `SourceExecutive Mosaic Media (blog)`                                                                  NA
## `SourceExecutiveBiz (blog)`                                                                            NA
## `SourceExpert Reviews`                                                                                 NA
## `SourceExperts Exchange (blog)`                                                                        NA
## `SourceExpress Computer`                                                                               NA
## SourceExpress.co.uk                                                                                    NA
## Sourceexpressandstar.com                                                                               NA
## SourceExtremeTech                                                                                      NA
## `SourceEye For Travel`                                                                                 NA
## Sourceeyefortravel.com                                                                                 NA
## `SourceEyewitness News`                                                                                NA
## `SourceEyewitness News 3 Hartford`                                                                     NA
## SourceeZadar                                                                                           NA
## `SourceFabius Maximus website (blog)`                                                                  NA
## SourceFactCheck.org                                                                                    NA
## SourceFAIR                                                                                             NA
## `SourceFair Observer`                                                                                  NA
## `SourceFairbanks Daily News-Miner`                                                                     NA
## `SourceFairfield Daily Republic`                                                                       NA
## `SourceFamagusta Gazette`                                                                              NA
## `SourceFamily Security Matters`                                                                        NA
## SourceFanSided                                                                                         NA
## `SourceFarm Business Communications`                                                                   NA
## `SourceFarm Futures`                                                                                   NA
## `SourceFarm Weekly`                                                                                    NA
## SourceFarmersWeekly                                                                                    NA
## `SourceFarming Life`                                                                                   NA
## `SourceFarmington Daily Times`                                                                         NA
## `SourceFashionista (blog)`                                                                             NA
## `SourceFast Company`                                                                                   NA
## `SourceFast Company Magazine`                                                                          NA
## `SourceFayetteville Observer`                                                                          NA
## `SourceFC Inter.it`                                                                                    NA
## Sourcefdanewsalert.com                                                                                 NA
## `SourceFederal Computer Week`                                                                          NA
## `SourceFederal Reserve Bank of San Francisco`                                                          NA
## `SourceFederal Reserve Bank of San Francisco (blog)`                                                   NA
## `SourceFederal Times`                                                                                  NA
## SourceFederalNewsRadio.com                                                                             NA
## SourceFedScoop                                                                                         NA
## SourceFeedstuffs                                                                                       NA
## `SourceFG Insight`                                                                                     NA
## SourceFIBA                                                                                             NA
## SourceFibre2fashion.com                                                                                NA
## `SourceFIDH (Communiqu\\u009d\\u009d de presse)`                                                       NA
## `SourceFIDH (press release)`                                                                           NA
## SourceFierceCIO                                                                                        NA
## SourceFierceContentManagement                                                                          NA
## SourceFierceEnterpriseCommunications                                                                   NA
## SourceFierceGovernmentIT                                                                               NA
## `SourceFierceMedicalDevices (press release) (registration)`                                            NA
## SourceFierceMobileIT                                                                                   NA
## SourceFierceTelecom                                                                                    NA
## SourceFierceWireless                                                                                   NA
## SourceFIFA                                                                                             NA
## SourceFIFA.com                                                                                         NA
## `SourceFife Today`                                                                                     NA
## `SourceFight Back! Newspaper`                                                                          NA
## `SourceFiji Sun Online`                                                                                NA
## `SourceFiji Times`                                                                                     NA
## `SourceFileHippo News`                                                                                 NA
## `SourceFinalCall.com News`                                                                             NA
## `SourceFinance and Commerce`                                                                           NA
## `SourceFinance Magnates`                                                                               NA
## `SourceFinance Magnates (blog)`                                                                        NA
## SourceFinanceAsia                                                                                      NA
## `SourceFinancial Advisor Magazine (registration)`                                                      NA
## `SourceFinancial Director`                                                                             NA
## `SourceFinancial Express`                                                                              NA
## `SourceFinancial Express Bangladesh`                                                                   NA
## `SourceFinancial Market News`                                                                          NA
## `SourceFinancial News (subscription)`                                                                  NA
## `SourceFinancial Planning`                                                                             NA
## `SourceFinancial Post`                                                                                 NA
## `SourceFinancial Times`                                                                                NA
## `SourceFinancial Times via Yahoo! New Zealand Finance`                                                 NA
## SourceFinancialSpots.com                                                                               NA
## SourceFinanzen.net                                                                                     NA
## SourcefindBIOMETRICS                                                                                   NA
## Sourcefinder.com.au                                                                                    NA
## SourceFinextra                                                                                         NA
## `SourceFinextra (press release)`                                                                       NA
## `SourceFingal Independent`                                                                             NA
## `SourceFirst Things (blog)`                                                                            NA
## SourceFirstcoastnews.com                                                                               NA
## SourceFirstpost                                                                                        NA
## `SourceFirstpost (satire)`                                                                             NA
## SourceFiveThirtyEight                                                                                  NA
## `SourceFlathead Beacon`                                                                                NA
## SourceFlavorwire                                                                                       NA
## `SourceFleet Owner (blog)`                                                                             NA
## SourceFleetNews                                                                                        NA
## `SourceFleetwood Today`                                                                                NA
## SourceFlightglobal                                                                                     NA
## `SourceFlorida Flambeau`                                                                               NA
## `SourceFlorida Politics (blog)`                                                                        NA
## `SourceFlorida Times-Union`                                                                            NA
## `SourceFlorida Today`                                                                                  NA
## `SourceFlorida Trend`                                                                                  NA
## `SourceFlyer News`                                                                                     NA
## `SourceFM World`                                                                                       NA
## `SourceFocus News`                                                                                     NA
## `SourceFocus Taiwan News Channel`                                                                      NA
## `SourceFond du Lac Reporter`                                                                           NA
## `SourceFood Tank (blog)`                                                                               NA
## SourceFoodManufacture.co.uk                                                                            NA
## `SourceFoodNavigator-Asia.com`                                                                         NA
## SourceFoodProductionDaily.com                                                                          NA
## `SourceFor The Win`                                                                                    NA
## SourceForbes                                                                                           NA
## `SourceForbes India`                                                                                   NA
## `SourceForbes via Yahoo! Finance`                                                                      NA
## `SourceForbes via Yahoo! News`                                                                         NA
## `SourceForeign Affairs`                                                                                NA
## `SourceForeign Affairs (subscription)`                                                                 NA
## `SourceForeign Policy`                                                                                 NA
## `SourceForeign Policy (blog)`                                                                          NA
## `SourceForeign Policy Blogs (blog)`                                                                    NA
## `SourceForeign Policy In Focus`                                                                        NA
## `SourceForeign Policy Journal`                                                                         NA
## `SourceForeign Relations`                                                                              NA
## `SourceForex Factory`                                                                                  NA
## SourceForexLive                                                                                        NA
## `SourceFormtek Blog (blog)`                                                                            NA
## `SourceFort Wayne Journal Gazette`                                                                     NA
## `SourceFort Wayne Journal Gazette (blog)`                                                              NA
## `SourceFort Worth Star-Telegram`                                                                       NA
## `SourceFort Worth Star Telegram`                                                                       NA
## `SourceFort Worth Star Telegram (blog)`                                                                NA
## SourceFortune                                                                                          NA
## `SourceFortune via Yahoo Canada Finance`                                                               NA
## `SourceFortune via Yahoo! Finance`                                                                     NA
## SourceForward                                                                                          NA
## `SourceFoster's Daily Democrat`                                                                        NA
## SourceFourFourTwo                                                                                      NA
## `SourceFourFourTwo via Yahoo Canada Sports`                                                            NA
## `SourceFOX 11 Los Angeles`                                                                             NA
## `SourceFOX 11 Reno`                                                                                    NA
## `SourceFOX 12 Oregon`                                                                                  NA
## `SourceFOX 13 News, Tampa Bay`                                                                         NA
## `SourceFOX 13 Utah`                                                                                    NA
## `SourceFOX 19 Cincinnati`                                                                              NA
## `SourceFox 2 Detroit`                                                                                  NA
## `SourceFOX 2 News St. Louis`                                                                           NA
## `SourceFox 28`                                                                                         NA
## `SourceFOX 28 South Bend`                                                                              NA
## `SourceFOX 29 News Philadelphia`                                                                       NA
## `SourceFOX 31 Denver`                                                                                  NA
## `SourceFox 32 Chicago`                                                                                 NA
## `SourceFox 35 Orlando`                                                                                 NA
## `SourceFOX 4 Kansas City`                                                                              NA
## `SourceFOX 4 News`                                                                                     NA
## `SourceFOX 41 Louisville`                                                                              NA
## `SourceFOX 43 Harrisburg`                                                                              NA
## `SourceFOX 46 Charlotte`                                                                               NA
## `SourceFOX 5 Atlanta`                                                                                  NA
## `SourceFOX 5 Las Vegas`                                                                                NA
## `SourceFOX 5 San Diego`                                                                                NA
## `SourceFox 59`                                                                                         NA
## `SourceFOX 59 Indianapolis`                                                                            NA
## `SourceFOX 6 Milwaukee`                                                                                NA
## `SourceFOX 6 News Birmingham`                                                                          NA
## `SourceFOX 61`                                                                                         NA
## `SourceFOX 7 Austin`                                                                                   NA
## `SourceFOX 7 WTVW Evansville`                                                                          NA
## `SourceFOX 8 Cleveland`                                                                                NA
## `SourceFOX 8 New Orleans`                                                                              NA
## `SourceFOX 8 WGHP`                                                                                     NA
## `SourceFox Business`                                                                                   NA
## `SourceFOX Business`                                                                                   NA
## `SourceFox Business via Yahoo! Finance`                                                                NA
## `SourceFOX CT Hartford`                                                                                NA
## `SourceFOX Illinois`                                                                                   NA
## `SourceFox News`                                                                                       NA
## `SourceFox News Insider`                                                                               NA
## `SourceFox News Latino`                                                                                NA
## `SourceFOX News Radio (blog)`                                                                          NA
## `SourceFox Sports`                                                                                     NA
## SourceFox11online.com                                                                                  NA
## `SourceFOX13 Memphis`                                                                                  NA
## Sourcefox13now.com                                                                                     NA
## SourceFox17                                                                                            NA
## SourceFOX21News.com                                                                                    NA
## Sourcefox2now.com                                                                                      NA
## `SourceFOX30 / CBS47 Jacksonville`                                                                     NA
## `SourceFOX31 Denver`                                                                                   NA
## SourceFOX40                                                                                            NA
## `SourceFOX40 Sacramento`                                                                               NA
## SourceFOX43.com                                                                                        NA
## Sourcefox4kc.com                                                                                       NA
## SourceFox5NY                                                                                           NA
## Sourcefox5sandiego.com                                                                                 NA
## Sourcefox6now.com                                                                                      NA
## Sourcefox8.com                                                                                         NA
## SourceFoxReno.com                                                                                      NA
## SourceFOXSports.com                                                                                    NA
## `SourceFRANCE 24`                                                                                      NA
## `SourceFranklin Independent`                                                                           NA
## `SourceFranklin News Post`                                                                             NA
## `SourceFraser Coast Chronicle`                                                                         NA
## `SourceFrederick News Post (subscription)`                                                             NA
## SourceFredericksburg.com                                                                               NA
## `SourceFree Malaysia Today`                                                                         1.000
## `SourceFree Press Journal`                                                                             NA
## `SourceFreedom Newspaper`                                                                              NA
## SourceFreestonecountytimesonline                                                                       NA
## `SourceFresh Business Thinking`                                                                        NA
## SourceFreshPlaza                                                                                       NA
## `SourceFresno Bee`                                                                                     NA
## `SourceFresno Bee (blog)`                                                                              NA
## `SourceFresno Business Journal`                                                                        NA
## `SourceFrome Standard`                                                                                 NA
## `SourceFrome Times`                                                                                    NA
## SourceFRONTLINE                                                                                        NA
## `SourceFrontPage Magazine`                                                                             NA
## `SourceFrost Illustrated`                                                                              NA
## SourceFSView                                                                                           NA
## `SourceFT Adviser`                                                                                     NA
## `SourceFT Alphaville (registration)`                                                                   NA
## `SourceFT.com (blog)`                                                                                  NA
## `SourceFT.com (registration) (blog)`                                                                   NA
## `SourceFudzilla (blog)`                                                                                NA
## `SourceFuelFix (blog)`                                                                                 NA
## `SourceFulton News`                                                                                    NA
## `SourceFund Strategy`                                                                                  NA
## Sourcefuse.tv                                                                                          NA
## `SourceFuseworks via Yahoo! New Zealand Finance`                                                       NA
## SourceFusion                                                                                           NA
## SourceFXStreet                                                                                         NA
## SourceGadget                                                                                           NA
## SourceGadgette                                                                                         NA
## `SourceGainesville Sun`                                                                                NA
## `SourceGainesville Times`                                                                              NA
## `SourceGalesburg Register-Mail`                                                                        NA
## SourceGalleyCat                                                                                        NA
## SourceGallup                                                                                           NA
## SourceGallup.com                                                                                       NA
## SourceGamasutra                                                                                        NA
## `SourceGamasutra (blog)`                                                                               NA
## `SourceGame Debate`                                                                                    NA
## `SourceGame Informer`                                                                                  NA
## `SourceGame Rant`                                                                                      NA
## `SourceGame Revolution`                                                                                NA
## SourceGameDev.net                                                                                      NA
## SourceGamenguide                                                                                       NA
## SourceGamepur                                                                                          NA
## `SourceGameranx (blog)`                                                                                NA
## `SourceGamereactor UK`                                                                                 NA
## `SourceGames Radar`                                                                                    NA
## Sourcegamesindustry.biz                                                                                NA
## SourceGamesIndustry.biz                                                                                NA
## `SourceGamesIndustry.biz (registration)`                                                               NA
## SourceGameSpot                                                                                         NA
## `SourceGameSpot (blog)`                                                                                NA
## `SourceGameSpot via Yahoo! News`                                                                       NA
## SourceGamespresso                                                                                      NA
## `SourceGamesRadar (blog)`                                                                              NA
## SourceGameZone                                                                                         NA
## SourceGamingBolt                                                                                       NA
## `SourceGant Daily`                                                                                     NA
## `SourceGas 2.0`                                                                                        NA
## `SourceGatestone Institute`                                                                            NA
## SourceGawker                                                                                           NA
## `SourceGazette Live`                                                                                   NA
## `SourceGazette News`                                                                                   NA
## SourceGazetteNET                                                                                       NA
## `SourceGazetteUnion,com (blog)`                                                                        NA
## Sourcegbtimes                                                                                          NA
## SourceGCaptain                                                                                         NA
## SourceGCN.com                                                                                          NA
## `SourceGear Junkie (blog)`                                                                             NA
## Sourcegearburn                                                                                         NA
## SourceGearNuke                                                                                         NA
## SourceGeek                                                                                             NA
## `SourceGeek Snack`                                                                                     NA
## SourceGeek.com                                                                                         NA
## SourceGeekSided                                                                                        NA
## SourceGeektime                                                                                         NA
## SourceGeekWire                                                                                         NA
## `SourceGeeky Gadgets`                                                                                  NA
## `SourceGeelong Advertiser`                                                                             NA
## SourceGematsu                                                                                          NA
## SourceGenomeWeb                                                                                        NA
## `SourceGeo News, Pakistan`                                                                             NA
## `SourceGeorgetown University The Hoya`                                                                 NA
## `SourceGeorgia Today`                                                                                  NA
## Sourcegetreading                                                                                       NA
## Sourcegetwestlondon                                                                                    NA
## `SourceGhacks Technology News`                                                                         NA
## `SourceGhana Broadcasting Corporation`                                                                 NA
## SourceGhanasoccernet.com                                                                               NA
## SourceGhanaWeb                                                                                         NA
## SourceGhanaweb.com                                                                                     NA
## `SourceGia \\u009dnh Vnexpresss`                                                                       NA
## SourceGigaom                                                                                           NA
## `SourceGigaom via Yahoo! Finance`                                                                      NA
## `SourceGilmer Mirror`                                                                                  NA
## `SourceGippsland Times`                                                                                NA
## `SourceGisborne Herald`                                                                                NA
## SourceGizbot                                                                                           NA
## Sourcegizmag                                                                                           NA
## SourceGizmag                                                                                           NA
## SourceGizmodo                                                                                       1.000
## `SourceGizmodo Australia`                                                                              NA
## `SourceGizmodo India`                                                                                  NA
## `SourceGizmodo UK`                                                                                     NA
## SourceGizmoids                                                                                         NA
## `SourceGladstone Observer`                                                                             NA
## SourceGlamour                                                                                          NA
## `SourceGlamour (blog)`                                                                                 NA
## `SourceGlasgow Daily Times`                                                                            NA
## `SourceGlasgow Evening Times`                                                                          NA
## `SourceGlens Falls Post-Star`                                                                          NA
## `SourceGlenwood Springs Post Independent`                                                              NA
## `SourceGlobal Envision`                                                                                NA
## `SourceGlobal Grind`                                                                                   NA
## `SourceGlobal Indonesian Voices (GIVnews.com)`                                                         NA
## `SourceGlobal Investor`                                                                                NA
## `SourceGlobal News`                                                                                    NA
## `SourceGlobal Risk Insights`                                                                           NA
## `SourceGlobal Times`                                                                                   NA
## `SourceGlobal Trade Review (GTR)`                                                                      NA
## `SourceGlobal Voices Online`                                                                           NA
## SourceGlobalMeatNews.com                                                                               NA
## SourceGlobalnews.ca                                                                                    NA
## SourceGlobalPost                                                                                       NA
## `SourceGlobeNewswire (press release)`                                                                  NA
## `SourceGlobeNewswire via Yahoo Canada Finance`                                                         NA
## `SourceGlobeNewswire via Yahoo UK & Ireland Finance`                                                   NA
## `SourceGlobeNewswire via Yahoo! Finance`                                                               NA
## `SourceGlobeNewswire via Yahoo! Finance India`                                                         NA
## `SourceGlobeNewswire via Yahoo! New Zealand Finance`                                                   NA
## `SourceGlobeNewswire via Yahoo!7 Finance`                                                              NA
## SourceGlobes                                                                                           NA
## `SourceGlobes Online`                                                                                  NA
## SourceGlobeSt.com                                                                                      NA
## `SourceGMA News`                                                                                       NA
## `SourceGMA News Online`                                                                                NA
## `SourceGo Certify`                                                                                     NA
## SourceGoal.com                                                                                         NA
## `SourceGoal.com via Yahoo! Sports`                                                                     NA
## SourceGoDanRiver.com                                                                                   NA
## SourceGoErie.com                                                                                       NA
## `SourceGold Coast Bulletin`                                                                            NA
## `SourceGold Seek`                                                                                      NA
## `SourceGolden Gate Xpress`                                                                             NA
## SourceGoldSeek.com                                                                                     NA
## SourceGolf.com                                                                                         NA
## SourceGolfDigest.com                                                                                   NA
## SourceGoLocalProv                                                                                      NA
## `SourceGood Gear Guide`                                                                                NA
## `SourceGOOD Magazine`                                                                                  NA
## `SourceGood Morning America via Yahoo! News`                                                           NA
## `SourceGood News Network`                                                                              NA
## `SourceGood News Pilipinas`                                                                            NA
## SourceGood4Utah                                                                                        NA
## `SourceGoodCall News (blog)`                                                                           NA
## `SourceGoogle (press release)`                                                                         NA
## SourceGOPUSA                                                                                           NA
## `SourceGoshen News`                                                                                    NA
## `SourceGospel Herald`                                                                                  NA
## `SourceGossip Monthly Magazine`                                                                        NA
## `SourceGotham Gazette`                                                                                 NA
## SourceGothamist                                                                                        NA
## `SourceGotta Be Mobile`                                                                                NA
## SourceGovConWire                                                                                       NA
## `SourceGovernance Now`                                                                                 NA
## SourceGoverning                                                                                        NA
## `SourceGovernment of Canada News`                                                                      NA
## `SourceGovernment of Jamaica, Jamaica Information Service`                                             NA
## `SourceGovernment of Ontario News`                                                                     NA
## `SourceGovernment Technology`                                                                          NA
## `SourceGQ Magazine`                                                                                    NA
## SourceGQ.com                                                                                           NA
## `SourceGraham Cluley Security News`                                                                    NA
## `SourceGrand Forks Herald`                                                                             NA
## `SourceGrand Island Independent`                                                                       NA
## `SourceGrand Junction Daily Sentinel`                                                                  NA
## `SourceGrand Rapids Herald-Review`                                                                     NA
## `SourceGrand River Sachem`                                                                             NA
## `SourceGrande Prairie Daily Herald-Tribune`                                                            NA
## `SourceGreat Falls Tribune`                                                                            NA
## SourceGreatandhra.com                                                                                  NA
## `SourceGreater Baton Rouge Business Report`                                                            NA
## `SourceGreater Greater Washington`                                                                     NA
## `SourceGreater Kashmir`                                                                                NA
## `SourceGreek Reporter`                                                                                 NA
## `SourceGreeley Tribune`                                                                                NA
## `SourceGreen Bay Press Gazette`                                                                        NA
## `SourceGreen Car Reports`                                                                              NA
## `SourceGreen Left Weekly`                                                                              NA
## `SourceGreen Valley News`                                                                              NA
## SourceGreenBiz                                                                                         NA
## SourceGreenbot                                                                                         NA
## `SourceGreene County Messenger`                                                                        NA
## `SourceGreenfield Daily Reporter`                                                                      NA
## `SourceGreenock Telegraph`                                                                             NA
## `SourceGreensboro News & Record`                                                                       NA
## `SourceGreentech Media`                                                                                NA
## `SourceGreenville News`                                                                                NA
## `SourceGreenwich Time`                                                                                 NA
## `SourceGrimsby Telegraph`                                                                              NA
## SourceGrist                                                                                            NA
## `SourceGroesbeck Journal`                                                                              NA
## SourcegroovyPost                                                                                       NA
## `SourceGrub Street`                                                                                    NA
## SourceGSMArena.com                                                                                     NA
## `SourceGuardian Liberty Voice`                                                                         NA
## `SourceGuitar World Magazine`                                                                          NA
## `SourceGulf Business News`                                                                             NA
## `SourceGulf Digital News`                                                                              NA
## `SourceGulf News`                                                                                      NA
## `SourceGulf News Journal`                                                                              NA
## `SourceGulf News via Yahoo Maktoob News`                                                               NA
## `SourceGulf Times`                                                                                     NA
## `SourceGulf Today`                                                                                     NA
## Sourcegulfnews.com                                                                                     NA
## SourceGuns.com                                                                                         NA
## `SourceGuru Focus`                                                                                     NA
## `Sourceguru3d.com (press release)`                                                                     NA
## SourceGuruFocus.com                                                                                    NA
## `SourceGuruFocus.com via Yahoo! Finance`                                                               NA
## `SourceGW Today`                                                                                       NA
## `SourceGympie Times`                                                                                   NA
## `SourceH\\u009d\\u009d Ni Mi`                                                                          NA
## SourceHaaretz                                                                                          NA
## `SourceHaaretz Daily`                                                                                  NA
## `SourceHack Read`                                                                                      NA
## SourceHackaday                                                                                         NA
## SourceHaitilibre.com                                                                                   NA
## `SourceHamilton Journal News`                                                                          NA
## `SourceHamilton Spectator`                                                                             NA
## `SourceHampshire Chronicle`                                                                            NA
## `SourceHandelsblatt Global Edition (subscription)`                                                     NA
## `SourceHanford Sentinel`                                                                               NA
## `SourceHardcore Gamer`                                                                                 NA
## `SourceHardOCP (press release)`                                                                        NA
## `SourceHardware Secrets`                                                                               NA
## SourceHardwareZone                                                                                     NA
## `SourceHardwareZone via Yahoo! Philippines News`                                                       NA
## `SourceHardwareZone via Yahoo! Singapore News`                                                         NA
## SourceHarpersBAZAAR.com                                                                                NA
## `SourceHartford Courant`                                                                               NA
## `SourceHartlepool Mail`                                                                                NA
## `SourceHarvard Business Review`                                                                        NA
## `SourceHarvard Gazette`                                                                                NA
## `SourceHarvard Law Record`                                                                             NA
## `SourceHarvard Law School News`                                                                        NA
## `SourceHastings Tribune`                                                                               NA
## `SourceHavana Times`                                                                                   NA
## Sourcehaveeruonline                                                                                    NA
## `SourceHawaii 24/7 (press release)`                                                                    NA
## `SourceHawaii News Now`                                                                                NA
## `SourceHeadlines & Global News`                                                                        NA
## `SourceHealth Affairs (blog)`                                                                          NA
## `SourceHealth Aim`                                                                                     NA
## `SourceHealthcare IT News`                                                                             NA
## SourceHealthline                                                                                       NA
## `SourceHeat Street`                                                                                    NA
## `SourceHeavy Duty Trucking`                                                                            NA
## SourceHeavy.com                                                                                        NA
## `SourceHelena Daily World`                                                                             NA
## `SourceHelena Independent Record`                                                                      NA
## `SourceHellenic News of America`                                                                       NA
## `SourceHellenic Shipping News Worldwide`                                                               NA
## `SourceHello Beautiful - Interactive One (blog)`                                                       NA
## Sourcehellomagazine.com                                                                                NA
## `SourceHelsingin Sanomat`                                                                              NA
## `SourceHenderson Daily News`                                                                           NA
## `SourceHerald-Mail Media`                                                                              NA
## `SourceHerald & Review`                                                                                NA
## `SourceHerald & Review (blog)`                                                                         NA
## `SourceHerald and News`                                                                                NA
## `SourceHerald Scotland`                                                                                NA
## `SourceHerald Sun`                                                                                     NA
## `SourceHerald Times Reporter`                                                                          NA
## SourceHerald.ie                                                                                        NA
## SourceHeraldNet                                                                                        NA
## `SourceHere And Now`                                                                                   NA
## `SourceHereford Times`                                                                                 NA
## `SourceHeritage Florida Jewish News`                                                                   NA
## `SourceHeritage Foundation`                                                                            NA
## SourceHeritage.org                                                                                     NA
## `SourceHerts and Essex Observer`                                                                       NA
## `SourceHexa News`                                                                                      NA
## SourceHEXUS                                                                                            NA
## `SourceHibbing Daily Tribune`                                                                          NA
## `SourceHickory Daily Record`                                                                           NA
## `SourceHigh Country News`                                                                              NA
## `SourceHigh Country Press`                                                                             NA
## `SourceHigh Plains Journal`                                                                            NA
## `SourceHigh Point University (press release) (blog)`                                                   NA
## `SourceHIGH TIMES`                                                                                     NA
## `SourceHighbrow Magazine`                                                                              NA
## `SourceHighlands Today`                                                                                NA
## SourceHighsnobiety                                                                                     NA
## `SourceHill Times (subscription)`                                                                      NA
## `SourceHimalayan Times`                                                                                NA
## `SourceHindu Business Line`                                                                            NA
## `SourceHindustan Times`                                                                                NA
## `SourceHints News Network`                                                                             NA
## SourceHipHopDX                                                                                         NA
## `SourceHistory News Network (HNN)`                                                                     NA
## `SourceHIT Consultant`                                                                                 NA
## SourceHITC                                                                                             NA
## `SourceHollywood Life`                                                                                 NA
## `SourceHollywood Reporter`                                                                             NA
## SourceHolyrood.com                                                                                     NA
## SourceHometownlife.com                                                                                 NA
## `SourceHonest Reporting Canada`                                                                        NA
## SourceHonestreporting.com                                                                              NA
## `SourceHong Kong Free Press`                                                                           NA
## `SourceHong Kong Standard`                                                                             NA
## `SourceHong Kong Standard (press release)`                                                             NA
## `SourceHonolulu Civil Beat`                                                                            NA
## `SourceHonolulu Star-Advertiser`                                                                       NA
## `SourceHoosier Ag Today`                                                                               NA
## `SourceHope Star`                                                                                      NA
## `SourceHornell Evening Tribune`                                                                        NA
## `SourceHospitality Net`                                                                                NA
## `SourceHot Air`                                                                                        NA
## `SourceHot Hardware`                                                                                   NA
## `SourceHot Springs Sentinel`                                                                           NA
## `SourceHot Stocks Point`                                                                               NA
## `SourceHotel News Now`                                                                                 NA
## `SourceHotel News Resource (press release)`                                                            NA
## `SourceHotelier Middle East`                                                                           NA
## SourceHotNewHipHop                                                                                     NA
## `SourceHouma Courier`                                                                                  NA
## SourceHousingWire                                                                                      NA
## `SourceHousingWire (blog)`                                                                             NA
## `SourceHouston Chronicle`                                                                              NA
## `SourceHouston Public Media`                                                                           NA
## `SourceHoustonia Magazine`                                                                             NA
## `SourceHoward University The District Chronicles`                                                      NA
## `SourceHowStuffWorks NOW`                                                                              NA
## SourceHPCwire                                                                                          NA
## `SourceHQ Grande Prairie`                                                                              NA
## SourceHRHub                                                                                            NA
## `SourceHSUS News`                                                                                      NA
## `SourceHSUS News (blog)`                                                                               NA
## `Sourcehttp://hamodia.com`                                                                             NA
## `Sourcehttp://wales.gov.uk/`                                                                           NA
## `Sourcehttp://www.newsgram.com/`                                                                       NA
## `SourceHuddersfield Daily Examiner`                                                                    NA
## `SourceHuddersfield Examiner`                                                                          NA
## `SourceHuffington Post`                                                                                NA
## `SourceHuffington Post (blog)`                                                                         NA
## `SourceHuffington Post Australia`                                                                      NA
## `SourceHuffington Post Canada`                                                                         NA
## `SourceHuffington Post India`                                                                          NA
## `SourceHuffington Post UK`                                                                             NA
## SourceHUH.                                                                                             NA
## `SourceHuman Capital`                                                                                  NA
## `SourceHuman Events`                                                                                   NA
## `SourceHuman Resources Online`                                                                         NA
## `SourceHuman Rights Campaign (blog)`                                                                   NA
## `SourceHuman Rights First`                                                                             NA
## `SourceHuman Rights First (blog)`                                                                      NA
## `SourceHuman Rights Watch`                                                                             NA
## SourceHumanosphere                                                                                     NA
## `SourceHungary Today`                                                                                  NA
## `SourceHuntington Herald Dispatch`                                                                     NA
## `SourceHuntsville Item`                                                                                NA
## `SourceHuron Daily Tribune`                                                                            NA
## `SourceHurriyet Daily News`                                                                            NA
## `SourceHybrid Cars News`                                                                               NA
## `SourceHyde Park Herald`                                                                               NA
## SourceHydrocarbonOnline                                                                                NA
## SourceHyperallergic                                                                                    NA
## `SourceHypergrid Business`                                                                             NA
## `SourceI am in dna of India`                                                                           NA
## Sourcei24news                                                                                          NA
## `SourceI4U News`                                                                                       NA
## SourceiAfrica.com                                                                                      NA
## `SourceIAM (registration) (blog)`                                                                      NA
## SourceiamWire                                                                                          NA
## `SourceIANS India Private Limited via Yahoo! India News`                                               NA
## `SourceIANS India Private Limited via Yahoo! Singapore News`                                           NA
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! India News`                           1.000
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! Singapore News`                       1.000
## `SourceIANS via Yahoo Maktoob News`                                                                 1.000
## `SourceIANS via Yahoo! Finance India`                                                                  NA
## `SourceIB Times via Yahoo UK & Ireland News`                                                           NA
## `SourceIB Times via Yahoo! Singapore News`                                                             NA
## `SourceIBN live`                                                                                       NA
## SourceIBN7                                                                                             NA
## SourceIBNLive                                                                                          NA
## `SourceIBNLive (blog)`                                                                                 NA
## `SourceIceland Monitor`                                                                                NA
## SourceIceNews                                                                                          NA
## SourceICIS                                                                                             NA
## SourceiClarified                                                                                       NA
## `SourceICRC (press release)`                                                                           NA
## `SourceIdaho State Journal`                                                                            NA
## `SourceIdaho Statesman`                                                                                NA
## `SourceIDEX Online`                                                                                    NA
## SourceiDigitalTimes.com                                                                                NA
## `SourceIDN InDepthNews | Analysis That Matters`                                                        NA
## `SourceIEEE Spectrum`                                                                                  NA
## `SourceiFiber One`                                                                                     NA
## SourceIGN                                                                                              NA
## `SourceIGN Videogames`                                                                                 NA
## `SourceIGN Xbox One Games`                                                                             NA
## `SourceIHS Electronics360`                                                                             NA
## `SourceIJ Review`                                                                                      NA
## SourceikhwanWeb.com                                                                                    NA
## `SourceIlford Recorder`                                                                                NA
## `SourceIlford Recorder 24`                                                                             NA
## `SourceIllawarra Mercury`                                                                              NA
## SourceIlliniHQ.com                                                                                     NA
## Sourceiloubnan.info                                                                                    NA
## SourceiMediaEthics                                                                                     NA
## `SourceImmortal News`                                                                                  NA
## Sourceimpact24                                                                                         NA
## `SourceImperial College London`                                                                        NA
## `SourceImperial Valley Press`                                                                          NA
## `SourceIn-Cyprus (press release) (subscription) (blog)`                                                NA
## `SourceIn Defense of Marxism`                                                                          NA
## `SourceIn Homeland Security`                                                                           NA
## `SourceIn These Times`                                                                                 NA
## SourceInc.com                                                                                          NA
## SourceInDaily                                                                                          NA
## `SourceIndependent Australia`                                                                          NA
## `SourceIndependent Catholic News`                                                                      NA
## `SourceIndependent Florida Alligator`                                                                  NA
## `SourceIndependent Media Review Analysis (IMRA)`                                                       NA
## `SourceIndependent Online`                                                                             NA
## `SourceIndependent Reporter`                                                                           NA
## `SourceIndependent Tribune`                                                                            NA
## SourceIndependent.ae                                                                                   NA
## SourceIndex.hr                                                                                         NA
## `SourceIndia Infoline`                                                                                 NA
## `SourceIndia Today`                                                                                    NA
## `SourceIndia Today Group via Yahoo! Finance India`                                                     NA
## `SourceIndia Tribune`                                                                                  NA
## `SourceIndia TV`                                                                                       NA
## SourceIndia.com                                                                                        NA
## Sourceindiablooms                                                                                      NA
## SourceIndiainfoline                                                                                    NA
## `SourceIndian Country Today Media Network`                                                             NA
## `SourceIndiana Public Media`                                                                           NA
## `SourceIndiana&#39;s NewsCenter`                                                                       NA
## `SourceIndianapolis Business Journal`                                                                  NA
## `SourceIndianapolis Business Journal (blog)`                                                           NA
## `SourceIndianapolis Star`                                                                              NA
## SourceIndiatimes.com                                                                                   NA
## `SourceIndie Shuffle Music News (blog)`                                                                NA
## `SourceIndie Wire`                                                                                     NA
## `SourceIndie Wire (blog)`                                                                              NA
## `SourceIndo American News`                                                                             NA
## `SourceIndonesia Investments (press release)`                                                          NA
## `SourceIndustrial Laser Solutions Magazine`                                                            NA
## `SourceIndustry Leaders Magazine`                                                                      NA
## `SourceIndustry Week`                                                                                  NA
## SourceIndustryWeek                                                                                     NA
## SourceiNews                                                                                            NA
## SourceiNews880.com                                                                                     NA
## SourceInferse                                                                                          NA
## `Sourceinfo-europa`                                                                                    NA
## `SourceInfo-Palestine`                                                                                 NA
## `Sourceinfo komputer`                                                                                  NA
## SourceInfoQ.com                                                                                        NA
## `SourceInformation Age`                                                                             0.786
## SourceInformationWeek                                                                                  NA
## SourceINFORUM                                                                                          NA
## `SourceInfosecurity Magazine`                                                                          NA
## `SourceInfoTel News Ltd`                                                                               NA
## SourceInfoToday.com                                                                                    NA
## SourceInfoWorld                                                                                        NA
## SourceInhabitat                                                                                        NA
## `SourceInnovation Excellence (blog)`                                                                   NA
## SourceInquirer                                                                                         NA
## SourceInquirer.net                                                                                     NA
## `SourceInSerbia News`                                                                                  NA
## `SourceInside Bay Area`                                                                                NA
## `SourceInside Edition`                                                                                 NA
## `SourceInside Higher Ed`                                                                               NA
## `SourceInside Higher Ed (blog)`                                                                        NA
## `SourceInside INdiana Business`                                                                        NA
## `SourceInside NoVA`                                                                                    NA
## `SourceInside Trade`                                                                                   NA
## `SourceInside Tucson Business`                                                                         NA
## `SourceInside World Football`                                                                          NA
## `SourceInsideClimate News`                                                                             NA
## SourceInsideHalton.com                                                                                 NA
## `SourceInsider Louisville (press release) (registration)`                                              NA
## `SourceInsider Media`                                                                                  NA
## `SourceInsider Monkey (blog)`                                                                          NA
## `SourceInsider Trading Report`                                                                         NA
## SourceInsideSources                                                                                    NA
## `SourceInsight via Yahoo Canada Finance`                                                               NA
## `SourceInstitute for Defence Studies and Analyses`                                                     NA
## `SourceInstitutional Investor`                                                                         NA
## `SourceInstitutional Investor (blog)`                                                                  NA
## SourceInStyle                                                                                          NA
## `SourceInsurance Journal`                                                                              NA
## `SourceIntelligence & Terrorism Information Center`                                                    NA
## `SourceIntelligence Online (subscription)`                                                             NA
## `SourceInter Press Service`                                                                            NA
## `SourceInteractive Investor`                                                                           NA
## SourceInterAksyon                                                                                      NA
## SourceInterfax                                                                                         NA
## `SourceIntermountain Jewish News`                                                                      NA
## `SourceInternational Adviser`                                                                          NA
## `SourceInternational Business Times`                                                                1.000
## `SourceInternational Business Times AU`                                                                NA
## `SourceInternational Business Times UK`                                                             1.000
## `SourceInternational Business Times via Yahoo UK & Ireland News`                                    1.000
## `SourceInternational Business Times, India Edition`                                                    NA
## `SourceInternational Business Times, Singapore Edition`                                                NA
## `SourceInternational Chamber of Commerce`                                                              NA
## `SourceInternational Falls Journal`                                                                    NA
## `SourceInternational Federation of Red Cross and Red Crescent Societies`                               NA
## `SourceInternational Herald Tribune`                                                                   NA
## `SourceInternational Middle East Media Center`                                                         NA
## `SourceInternational Monetary Fund`                                                                    NA
## `SourceInternational New York Times`                                                                   NA
## `SourceInternational Paralymic Committee`                                                              NA
## `SourceInternational Solidarity Movement`                                                              NA
## SourceinTheBay                                                                                         NA
## `SourceIntifada Palestine`                                                                             NA
## SourceInverse                                                                                          NA
## SourceInvestCorrectly                                                                                  NA
## SourceInvesting.com                                                                                    NA
## `SourceInvestment Executive`                                                                           NA
## `SourceInvestment U`                                                                                   NA
## `SourceInvestment Week`                                                                                NA
## SourceInvestmentNews                                                                                   NA
## SourceInvestopedia                                                                                     NA
## `SourceInvestor's Business Daily`                                                                      NA
## `SourceInvestor Newswire`                                                                              NA
## SourceInvestorGuide                                                                                    NA
## `SourceInvestorIdeas.com (press release)`                                                              NA
## SourceInvestorplace.com                                                                                NA
## `SourceInvestors Chronicle`                                                                            NA
## Sourceio9                                                                                              NA
## `SourceIoT Evolution World (blog)`                                                                     NA
## `SourceIoT Hub`                                                                                        NA
## `SourceIowa City Press Citizen`                                                                        NA
## `SourceiPolitics.ca (subscription)`                                                                    NA
## SourceiProgrammer                                                                                      NA
## `SourceIpsos News & Polls (subscription)`                                                              NA
## `SourceIpswich Star`                                                                                   NA
## SourceIPWatchdog.com                                                                                   NA
## `SourceIRA Market Report`                                                                              NA
## `SourceIran News Update`                                                                               NA
## SourceIRINnews.org                                                                                     NA
## `SourceIrish Building Magazine`                                                                        NA
## `SourceIrish Examiner`                                                                                 NA
## `SourceIrish Independent`                                                                              NA
## `SourceIrish Legal News`                                                                               NA
## `SourceIrish Mirror`                                                                                   NA
## `SourceIrish Times`                                                                                    NA
## SourceIrishCentral                                                                                     NA
## `SourceIrvine World News`                                                                              NA
## `SourceIs stories`                                                                                     NA
## SourceiSchoolGuide                                                                                     NA
## `SourceIsland Packet`                                                                                  NA
## `SourceIsland Sun`                                                                                     NA
## SourceISM                                                                                              NA
## SourceISPreview                                                                                        NA
## `SourceIsrael Hayom`                                                                                   NA
## `Sourceisrael heute ltd.`                                                                              NA
## `SourceIsrael Today`                                                                                   NA
## SourceIsraelValley                                                                                     NA
## SourceIsthmus                                                                                          NA
## `SourceIT Business Edge`                                                                               NA
## `SourceIT Business Edge (blog)`                                                                        NA
## `SourceiT News`                                                                                        NA
## `SourceiT News (blog)`                                                                                 NA
## `SourceIT News Africa`                                                                                 NA
## `SourceIT PRO`                                                                                         NA
## `SourceIT World`                                                                                       NA
## `SourceIT World Canada`                                                                                NA
## `SourceIT World Canada (blog)`                                                                         NA
## SourceITBusiness.ca                                                                                    NA
## `SourceiTech Post`                                                                                     NA
## `SourceIthaca Journal`                                                                                 NA
## SourceITProPortal                                                                                      NA
## `SourceITS International`                                                                              NA
## `SourceITV News`                                                                                       NA
## SourceITV.com                                                                                          NA
## SourceITWeb                                                                                            NA
## SourceiTWire                                                                                           NA
## `SourceiTWire (press release)`                                                                         NA
## SourceITworld                                                                                          NA
## `SourceJ-Wire Jewish Australian News Service`                                                          NA
## `SourceJ Weekly`                                                                                       NA
## `SourceJacaranda FM`                                                                                   NA
## `SourceJackson Clarion Ledger`                                                                         NA
## `SourceJackson Free Press`                                                                             NA
## `SourceJackson Hole News & Guide`                                                                      NA
## `SourceJackson Sun`                                                                                    NA
## `SourceJacksonville Business Journal`                                                                  NA
## `SourceJacksonville Daily Progress`                                                                    NA
## `SourceJacksonville Journal Courier`                                                                   NA
## `SourceJacobin magazine`                                                                               NA
## SourceJadaliyya                                                                                        NA
## `SourceJakarta Globe`                                                                                  NA
## `SourceJakarta Post`                                                                                   NA
## SourceJalopnik                                                                                         NA
## `SourceJamaica Gleaner`                                                                                NA
## `SourceJamaica Observer`                                                                               NA
## `SourceJamestown Sun`                                                                                  NA
## `SourceJanesville Gazette`                                                                             NA
## `SourceJapan Today`                                                                                    NA
## `SourceJefferson City News Tribune`                                                                    NA
## `SourceJerusalem Center for Public Affairs`                                                            NA
## `SourceJerusalem Post Israel News`                                                                     NA
## `SourceJerusalem Post Israel News (blog)`                                                              NA
## `SourceJeune Afrique`                                                                                  NA
## `SourceJewish Business News`                                                                           NA
## `SourceJewish Chronicle`                                                                               NA
## `SourceJewish Ledger`                                                                                  NA
## `SourceJewish Link of New Jersey`                                                                      NA
## `SourceJewish News`                                                                                    NA
## `SourceJewish Post`                                                                                    NA
## `SourceJewish Telegraphic Agency`                                                                      NA
## SourceJewschool                                                                                        NA
## SourceJezebel                                                                                          NA
## SourceJNS.org                                                                                          NA
## `SourceJobs & Hire`                                                                                    NA
## SourceJOC.com                                                                                          NA
## SourceJOE                                                                                              NA
## SourceJOE.co.uk                                                                                        NA
## `SourceJohannesburg Sunday World`                                                                      NA
## `SourceJohnson City Press`                                                                             NA
## `SourceJoplin Globe`                                                                                   NA
## `SourceJordan Times`                                                                                   NA
## `SourceJournal and Courier`                                                                            NA
## `SourceJournal Gazette and Times-Courier`                                                              NA
## `SourceJournal of Turkish Weekly`                                                                      NA
## `SourceJournal Online`                                                                                 NA
## `SourceJournal Pioneer`                                                                                NA
## `SourceJournal Times`                                                                                  NA
## SourceJournalism.co.uk                                                                                 NA
## `SourceJP Updates`                                                                                     NA
## `SourceJspace News`                                                                                    NA
## `SourceJuneau Empire (subscription)`                                                                   NA
## `SourceJunior College`                                                                                 NA
## SourceJunkee                                                                                           NA
## SourceJURIST                                                                                           NA
## `Sourcejust-style.com (subscription)`                                                                  NA
## `SourceJust International`                                                                             NA
## `SourceJust Jared`                                                                                     NA
## `SourceJust Security`                                                                                  NA
## SourceJustmeans                                                                                        NA
## `SourceJustmeans (blog)`                                                                               NA
## SourceJweekly.com                                                                                      NA
## `SourceK24 TV`                                                                                         NA
## `SourceKABC-TV`                                                                                        NA
## `SourceKABC-TV Los Angeles`                                                                            NA
## `SourceKaiser Family Foundation`                                                                       NA
## SourceKAKE                                                                                             NA
## SourceKALW                                                                                             NA
## SourceKanglaOnline                                                                                     NA
## `SourceKankakee Daily Journal`                                                                         NA
## `SourceKansas City Business Journal`                                                                   NA
## `SourceKansas City InfoZine`                                                                           NA
## `SourceKansas City Star`                                                                               NA
## `SourceKansas City Star (blog)`                                                                        NA
## SourceKAPP                                                                                             NA
## SourceKARE                                                                                             NA
## SourceKARK                                                                                             NA
## `SourceKashmir Life`                                                                                   NA
## `SourceKashmir Media Service`                                                                          NA
## `SourceKashmir Reader`                                                                                 NA
## `SourceKashmir Watch`                                                                                  NA
## `SourceKasmir Monitor`                                                                                 NA
## `SourceKATC Lafayette News`                                                                            NA
## SourceKathimerini                                                                                      NA
## `SourceKathmandu Post`                                                                                 NA
## `SourceKatib\\u009d\\u009dn`                                                                           NA
## `SourceKatoikos.eu (satire) (registration) (blog)`                                                     NA
## SourceKATU                                                                                             NA
## SourceKATV                                                                                             NA
## `SourceKaufman Herald`                                                                                 NA
## `SourceKAUZ-TV`                                                                                        NA
## `SourceKawartha Media Group`                                                                           NA
## `SourceKawowo Sports`                                                                                  NA
## `SourceKBS WORLD Radio News`                                                                           NA
## SourceKBTX                                                                                             NA
## `SourceKBTX 3 Bryan - College Station`                                                                 NA
## `SourceKCBD-TV Lubbock`                                                                                NA
## `SourceKCCI 8 Des Moines`                                                                              NA
## `SourceKCCI Des Moines`                                                                                NA
## `SourceKCEN-TV`                                                                                        NA
## SourceKCET                                                                                             NA
## `SourceKCRA 3 Sacramento`                                                                              NA
## `SourceKCRA Sacramento`                                                                                NA
## SourceKCRG                                                                                             NA
## `SourceKCTV 5 Kansas City`                                                                             NA
## `SourceKDLT News`                                                                                      NA
## SourceKdminer                                                                                          NA
## SourceKDramaStars                                                                                      NA
## `SourceKearney Hub`                                                                                    NA
## `SourceKELO AM-FM`                                                                                     NA
## `SourceKELOLAND TV`                                                                                    NA
## `SourceKelowna Capital News`                                                                           NA
## `SourceKenai Peninsula Online`                                                                         NA
## `SourceKennebec Journal & Morning Sentinel`                                                            NA
## `SourceKENS 5 TV`                                                                                      NA
## `SourceKent Online`                                                                                    NA
## `SourceKERA News`                                                                                      NA
## `SourceKERA North Texas`                                                                               NA
## `SourceKern Golden Empire`                                                                             NA
## SourceKESQ                                                                                             NA
## `SourceKETV 7 Omaha`                                                                                   NA
## `SourceKETV Omaha`                                                                                     NA
## `SourceKEVN Black Hills Fox`                                                                           NA
## `SourceKewanee Star Courier`                                                                           NA
## `SourceKEYE TV`                                                                                        NA
## SourceKEYT                                                                                             NA
## SourceKFDA                                                                                             NA
## `SourceKFDA-TV Amarillo`                                                                               NA
## SourceKFDI                                                                                             NA
## SourceKFGO                                                                                             NA
## Sourcekfor.com                                                                                         NA
## `SourceKFOX 14 El Paso`                                                                                NA
## `SourceKFOX El Paso`                                                                                   NA
## `SourceKFSM Ft. Smith-Fayetteville`                                                                    NA
## `SourceKFSN-TV`                                                                                        NA
## `SourceKFSN-TV Fresno`                                                                                 NA
## SourceKFVS                                                                                             NA
## SourceKgab                                                                                             NA
## `SourceKGBT-TV`                                                                                        NA
## SourceKGMI                                                                                             NA
## SourceKGNS.tv                                                                                          NA
## `SourceKGO-TV`                                                                                         NA
## `SourceKGO-TV Bay Area`                                                                                NA
## SourceKGOU                                                                                             NA
## `SourceKGTV San Diego`                                                                                 NA
## Sourcekgw.com                                                                                          NA
## `SourceKhaama Press (press release) (blog)`                                                            NA
## `SourceKhaleej Times`                                                                                  NA
## `SourceKhaleej Times via Yahoo Maktoob News`                                                           NA
## `SourceKHBS - KHOG Fort Smith - Fayetteville`                                                          NA
## SourceKHON2                                                                                            NA
## SourceKHOU                                                                                             NA
## SourceKHOU.com                                                                                         NA
## `SourceKHQ Right Now`                                                                                  NA
## `SourceKHQ Spokane`                                                                                    NA
## `SourceKiama Independent`                                                                              NA
## SourceKicker                                                                                           NA
## `SourceKIII TV3`                                                                                       NA
## `SourceKilgore News Herald`                                                                            NA
## `SourceKill Screen (blog)`                                                                             NA
## `SourceKilleen Daily Herald`                                                                           NA
## `SourceKIMT 3`                                                                                         NA
## SourceKING5.com                                                                                        NA
## SourceKIONrightnow.com                                                                                 NA
## `SourceKiplinger Personal Finance`                                                                     NA
## SourceKiplinger.com                                                                                    NA
## `SourceKipp Report`                                                                                    NA
## `SourceKIRO 7 Seattle-Tacoma`                                                                          NA
## `SourceKIRO Seattle`                                                                                   NA
## `SourceKitchener - Waterloo Record`                                                                    NA
## SourceKitGuru                                                                                          NA
## `SourceKitsap Sun`                                                                                     NA
## `SourceKITV Honolulu`                                                                                  NA
## `SourceKKTV 11 Colorado Springs`                                                                       NA
## `SourceKKTV 11 News`                                                                                   NA
## `SourceKLAS-TV`                                                                                        NA
## SourceKLTV                                                                                             NA
## `SourceKLTV 7 Tyler`                                                                                   NA
## `SourceKMBC-TV Kansas City`                                                                            NA
## `SourceKMBC Kansas City`                                                                               NA
## SourceKMOV.com                                                                                         NA
## SourceKMUW                                                                                             NA
## `SourceKMWorld Magazine`                                                                               NA
## `SourceKNBN Rapid City`                                                                                NA
## Sourceknopnews2                                                                                        NA
## `SourceKnow Your Mobile`                                                                               NA
## `SourceKnowledge at Wharton`                                                                           NA
## `SourceKnowledge Wharton Today`                                                                        NA
## `SourceKnowledge@Wharton`                                                                              NA
## `SourceKnowTechie (blog)`                                                                              NA
## `SourceKnoxville News Sentinel`                                                                        NA
## `SourceKOAA.com Colorado Springs and Pueblo News`                                                      NA
## `SourceKOAM-TV`                                                                                        NA
## `SourceKOAM-TV Pittsburg`                                                                              NA
## `SourceKOAT Albuquerque`                                                                               NA
## `SourceKOB 4 Albuquerque`                                                                              NA
## SourceKOB.com                                                                                          NA
## `SourceKOBI-TV NBC5 / KOTI-TV NBC2`                                                                    NA
## `SourceKOCO 5 Oklahoma City`                                                                           NA
## `SourceKOCO Oklahoma City`                                                                             NA
## `SourceKokomo Tribune`                                                                                 NA
## `SourceKOLD News 13 Tuscon`                                                                            NA
## SourceKOLO                                                                                             NA
## `SourceKOLO 8 Reno`                                                                                    NA
## SourceKomando                                                                                          NA
## `SourceKOMO News`                                                                                      NA
## `SourceKOMO Seattle`                                                                                   NA
## `SourceKOMU Columbia`                                                                                  NA
## `SourceKorea JoongAng Daily`                                                                           NA
## `SourceKorea Portal (English Edition)`                                                                 NA
## `SourceKorea Times`                                                                                    NA
## SourceKOSU                                                                                             NA
## SourceKotaku                                                                                           NA
## `SourceKotaku Australia`                                                                               NA
## SourceKotatv                                                                                           NA
## `SourceKPAX-TV`                                                                                        NA
## SourceKPBS                                                                                             NA
## `SourceKPBS San Diego`                                                                                 NA
## `SourceKPCC Pasadena`                                                                                  NA
## `Sourcekpfa 94.1fm`                                                                                    NA
## `SourceKPHO Phoenix`                                                                                   NA
## `SourceKPLR 11 St. Louis`                                                                              NA
## `SourceKPLU News for Seattle and the Northwest`                                                        NA
## `SourceKPRC Houston`                                                                                   NA
## `SourceKPRC Local 2 Houston`                                                                           NA
## `SourceKPVI News 6`                                                                                    NA
## SourceKQED                                                                                             NA
## SourceKRBD                                                                                             NA
## SourceKRCRTV.COM                                                                                       NA
## SourceKRDO                                                                                             NA
## `SourceKRDO Colorado Springs`                                                                          NA
## `SourceKrebs on Security`                                                                              NA
## SourceKRGV                                                                                             NA
## `SourceKRIS Corpus Christi News`                                                                       NA
## `SourceKRNV My News 4`                                                                                 NA
## SourceKRON4.com                                                                                        NA
## `SourceKRQE & KASA FOX 2 Albuquerque`                                                                  NA
## `SourceKRQE News 13`                                                                                   NA
## `SourceKRTV Great Falls News`                                                                          NA
## `SourceKSAT San Antonio`                                                                               NA
## `SourceKSBY San Luis Obispo News`                                                                      NA
## SourceKSDK                                                                                             NA
## SourceKSDK.com                                                                                         NA
## SourceKSHB                                                                                             NA
## `SourceKSHB-TV Kansas City`                                                                            NA
## SourceKSL.com                                                                                          NA
## `SourceKSLA-TV`                                                                                        NA
## `SourceKSLA-TV Shreveport`                                                                             NA
## `SourceKSNT (press release) (registration) (blog)`                                                     NA
## SourceKSPR                                                                                             NA
## SourceKSWO                                                                                             NA
## `SourceKSWO Lawton-Wichita Falls`                                                                      NA
## SourceKTAL                                                                                             NA
## `SourceKTAL Shreveport`                                                                                NA
## SourceKTAR.com                                                                                         NA
## SourceKTBS                                                                                             NA
## SourceKTIC                                                                                             NA
## SourceKTLA                                                                                             NA
## SourceKTOO                                                                                             NA
## SourceKTRE                                                                                             NA
## `SourceKTRE Lufkin and Nacogdoches`                                                                    NA
## `SourceKTRK-TV`                                                                                        NA
## `SourceKTTC Rochester`                                                                                 NA
## `SourceKTTS 94.7`                                                                                      NA
## SourceKTUL                                                                                             NA
## SourceKTUU.com                                                                                         NA
## `SourceKTVA.com - Anchorage, Alaska`                                                                   NA
## SourceKTVB                                                                                             NA
## SourceKTVB.com                                                                                         NA
## SourceKTVN                                                                                             NA
## `SourceKTVN Reno`                                                                                      NA
## `SourceKTVQ Billings News`                                                                             NA
## `SourceKTVU San Francisco`                                                                             NA
## SourceKTVZ                                                                                             NA
## SourceKTXS                                                                                             NA
## `SourceKuensel, Buhutan's National Newspaper`                                                          NA
## `SourceKUOW News and Information`                                                                      NA
## SourceKUT                                                                                              NA
## `SourceKUTV 2News`                                                                                     NA
## `SourceKuwait News Agency`                                                                             NA
## `SourceKuwait Times`                                                                                   NA
## `SourceKVOA Tucson News`                                                                               NA
## SourceKVUE                                                                                             NA
## SourceKVUE.com                                                                                         NA
## Sourcekwbe                                                                                             NA
## SourceKWCH                                                                                             NA
## `SourceKWQC-TV6`                                                                                       NA
## `SourceKWTV News9`                                                                                     NA
## Sourcekwwl.com                                                                                         NA
## `SourceKX TV North Dakota`                                                                             NA
## SourceKXAN.com                                                                                         NA
## `SourceKXLH Helena News`                                                                               NA
## SourceKXNet.com                                                                                        NA
## `SourceKXXV News Channel 25`                                                                           NA
## `SourceKXXV Waco`                                                                                      NA
## SourceKY3                                                                                              NA
## `SourceKyiv Post`                                                                                      NA
## `SourceKYIV Post`                                                                                      NA
## `SourceKykernel.com (subscription)`                                                                    NA
## SourceKYMA                                                                                             NA
## SourceKYTX                                                                                             NA
## SourceKYUK                                                                                             NA
## `SourceL'Express`                                                                                      NA
## `SourceL'Expression`                                                                                   NA
## `SourceL'Humanit\\u009d\\u009d`                                                                        NA
## `SourceL'Humanité`                                                                                     NA
## `SourceL'info en direct d'Isra\\u009d\\u009dl 24h/24 (Communiqu\\u009d\\u009d de presse) (Blog)`       NA
## `SourceL'Orient-Le Jour`                                                                               NA
## `SourceL&#39;Atelier`                                                                                  NA
## `SourceL.A. Biz`                                                                                       NA
## `SourceL.A. Weekly`                                                                                    NA
## `SourceLa Croix`                                                                                       NA
## `SourceLa Crosse Tribune`                                                                              NA
## `SourceLA Daily News`                                                                                  NA
## SourceLabourList                                                                                       NA
## Sourceladepeche.fr                                                                                     NA
## `SourceLadysmith Gazette`                                                                              NA
## SourceLAist                                                                                            NA
## `SourceLake Cowichan Gazette`                                                                          NA
## `SourceLake Tahoe News`                                                                                NA
## SourceLakenewsonline.com                                                                               NA
## `SourceLakeshore Public Media`                                                                         NA
## `SourceLamorinda Sun`                                                                                  NA
## `SourceLancashire Evening Post`                                                                        NA
## `SourceLancashire Telegraph`                                                                           NA
## `SourceLancaster Eagle Gazette`                                                                        NA
## `SourceLancaster Today`                                                                                NA
## SourceLancasterOnline                                                                                  NA
## `SourceLanka Business Online`                                                                          NA
## `SourceLansing State Journal`                                                                          NA
## `SourceLaptop Mag`                                                                                     NA
## `SourceLas Cruces Sun-News`                                                                            NA
## `SourceLas Vegas Review-Journal`                                                                       NA
## `SourceLas Vegas Review-Journal (blog)`                                                                NA
## `SourceLas Vegas Sun`                                                                                  NA
## `SourceLast Night On`                                                                                  NA
## `SourceLatin American Herald Tribune`                                                                  NA
## `SourceLatin Correspondent`                                                                            NA
## `SourceLatin Post`                                                                                     NA
## `SourceLatin Times`                                                                                    NA
## `SourceLatino Post`                                                                                    NA
## `SourceLatinos Post`                                                                                   NA
## `SourceLawfare (blog)`                                                                                 NA
## SourceLawNewz                                                                                          NA
## `SourceLawrence Berkeley National Laboratory`                                                          NA
## `SourceLawrence Journal-World`                                                                         NA
## `SourceLawrence Journal World`                                                                         NA
## `SourceLawrence Journal World (blog)`                                                                  NA
## `SourceLawyer Herald`                                                                                  NA
## `SourceLayman Online`                                                                                  NA
## SourceLazygamer                                                                                        NA
## `SourceLBC 97.3`                                                                                       NA
## `SourceLe Club de Mediapart (Blog)`                                                                    NA
## `SourceLe Figaro`                                                                                      NA
## `SourceLe Grand Soir.info`                                                                             NA
## `SourceLe Mauricien`                                                                                   NA
## `SourceLe Mirabel`                                                                                     NA
## `SourceLe Monde`                                                                                       NA
## `SourceLe Monde Diplomatique`                                                                          NA
## `SourceLe Monde Diplomatique (blog)`                                                                   NA
## `SourceLe Parisien`                                                                                    NA
## `SourceLe Soleil`                                                                                      NA
## `SourceLe T\\u009d\\u009dl\\u009d\\u009dgramme`                                                        NA
## `SourceLeader-Telegram`                                                                                NA
## `SourceLeader Journal`                                                                                 NA
## `SourceLeaders Tunisie`                                                                                NA
## `SourceLeadership Newspapers`                                                                          NA
## SourceLeafly                                                                                           NA
## `SourceLeamington Courier`                                                                             NA
## SourceLearnBonds                                                                                       NA
## SourceLEDinside                                                                                        NA
## `SourceLee's Summit Journal`                                                                           NA
## `SourceLeek Post & Times`                                                                              NA
## `SourceLeesville Daily Leader`                                                                         NA
## SourceLeFaso.net                                                                                       NA
## `SourceLeft Foot Forward`                                                                              NA
## `SourceLeftLane News`                                                                                  NA
## `Sourcelegal Insurrection (blog)`                                                                      NA
## `SourceLehigh Valley Business`                                                                         NA
## Sourcelehighvalleylive.com                                                                             NA
## `SourceLeicester Mercury`                                                                              NA
## SourceleJDD.fr                                                                                         NA
## SourceleJSD                                                                                            NA
## `SourceLet Me Know About This`                                                                         NA
## `SourceLethbridge Herald`                                                                              NA
## Sourceletsrecycle.com                                                                                  NA
## `SourceLexington Herald-Leader`                                                                        NA
## `SourceLexington Herald Leader`                                                                        NA
## `SourceLexology (registration)`                                                                        NA
## `SourceLGBTQ Nation`                                                                                   NA
## `SourceLiberal Democrat Voice`                                                                         NA
## SourceLiberation                                                                                       NA
## `SourceLiberian Daily Observer`                                                                        NA
## `SourceLiberty News Now`                                                                               NA
## SourceLifehacker                                                                                       NA
## `SourceLifehacker Australia`                                                                           NA
## `SourceLifehacker UK`                                                                                  NA
## SourceLifeNews.com                                                                                     NA
## SourceLifesite                                                                                         NA
## SourceLifestyles                                                                                       NA
## SourceLifeZette                                                                                        NA
## `SourceLight Reading`                                                                                  NA
## SourceLiliputing                                                                                       NA
## `SourceLim Kit Siang`                                                                                  NA
## `SourceLimerick Post`                                                                                  NA
## `SourceLincoln Journal Star`                                                                           NA
## `SourceLincolnshire Echo`                                                                              NA
## `SourceLinkedIn (blog)`                                                                                NA
## `SourceLinn's Stamp News`                                                                              NA
## SourceLinux                                                                                            NA
## `SourceLinux Journal`                                                                                  NA
## `SourceLinux Today`                                                                                    NA
## `SourceLinux.com (blog)`                                                                               NA
## SourceLinuxInsider.com                                                                                 NA
## `SourceLion's Roar`                                                                                    NA
## `SourceLisbon Morning Journal`                                                                         NA
## `SourceLive 5 News Charleston`                                                                         NA
## `SourceLive Science`                                                                                   NA
## `SourceLive Trading News`                                                                              NA
## SourceLivemint                                                                                         NA
## `SourceLiverpool Echo`                                                                                 NA
## `SourceLiveScience.com via Yahoo! News`                                                                NA
## `SourceLivingston Daily`                                                                               NA
## SourceLLRX.com                                                                                         NA
## SourceLobeLog                                                                                          NA
## `SourceLocal 10`                                                                                       NA
## `SourceLocal 10 Miami`                                                                                 NA
## `SourceLocal 6 Orlando`                                                                                NA
## `SourceLocal 8 Now`                                                                                    NA
## SourceLocalNews8.com                                                                                   NA
## `SourceLockport Union-Sun & Journal`                                                                   NA
## `SourceLogistics Management`                                                                           NA
## `SourceLompoc Record`                                                                                  NA
## `SourceLondon Evening Standard`                                                                        NA
## `SourceLondon Free Press`                                                                              NA
## `SourceLondon Loves Business`                                                                          NA
## `SourceLondon Review of Books (subscription)`                                                          NA
## `SourceLondon School of Business and Finance (blog)`                                                   NA
## `SourceLondon South East (registration) (blog)`                                                        NA
## SourceLondon24                                                                                         NA
## `SourceLondonderry Today`                                                                              NA
## SourceLondonist                                                                                        NA
## `SourceLong Beach Press Telegram`                                                                      NA
## `SourceLong Island Business News`                                                                      NA
## `SourceLong Island Business News (subscription)`                                                       NA
## `SourceLong War Journal`                                                                               NA
## `SourceLongview Daily News`                                                                            NA
## `SourceLongview News-Journal`                                                                          NA
## `SourceLonoke News`                                                                                    NA
## `SourceLos Angeles Business Journal`                                                                   NA
## `SourceLos Angeles Daily News`                                                                         NA
## `SourceLos Angeles Sun Times`                                                                          NA
## `SourceLos Angeles Times`                                                                              NA
## `SourceLost Coast Outpost`                                                                             NA
## SourceLoudwire                                                                                         NA
## `SourceLowell Sun`                                                                                     NA
## SourceLubbockOnline.com                                                                                NA
## `SourceLudwig von Mises Institute`                                                                     NA
## `SourceLusaka Times`                                                                                   NA
## `SourceLuton Today`                                                                                    NA
## `SourceLuxemburger Wort - English Edition`                                                             NA
## `SourceLuxury Daily`                                                                                   NA
## `SourceLynchburg News and Advance`                                                                     NA
## `SourceLynn News`                                                                                      NA
## `SourceM\\u009d\\u009ddecins Sans Fronti\\u009d\\u009dres (MSF) International`                         NA
## `SourceM\\u009d\\u009ddias-Presse-Info`                                                                NA
## `SourceM\\u009d\\u009dtro Montr\\u009d\\u009dal`                                                       NA
## `SourceMac Kung Fu (satire) (blog)`                                                                    NA
## `SourceMac Rumors`                                                                                     NA
## `SourceMacau Daily Times`                                                                              NA
## SourceMacDailyNews                                                                                     NA
## `SourceMackay Daily Mercury`                                                                           NA
## SourceMacleans.ca                                                                                      NA
## SourceMacNN                                                                                            NA
## `SourceMacroBusiness (blog)`                                                                           NA
## SourceMacworld                                                                                         NA
## `SourceMacworld (blog)`                                                                                NA
## `SourceMacworld UK`                                                                                 1.000
## `SourceMadame Figaro`                                                                                  NA
## `SourceMadame Noire`                                                                                   NA
## SourceMadameNoire                                                                                      NA
## SourceMadison.com                                                                                      NA
## `SourceMaidenhead Advertiser`                                                                          NA
## `SourceMail & Guardian`                                                                                NA
## `SourceMail & Guardian Africa`                                                                         NA
## `SourceMail & Guardian Online`                                                                         NA
## `SourceMail Today via Yahoo! India News`                                                               NA
## `SourceMain Line Times`                                                                                NA
## `SourceMaine Public Broadcasting`                                                                      NA
## SourceMainStreet                                                                                       NA
## `SourceMaison des Droits de l'Homme de Limoges`                                                        NA
## SourceMakeUseOf                                                                                        NA
## SourceMalawi24                                                                                         NA
## `SourceMalay Mail Online`                                                                              NA
## `SourceMalaysia Chronicle`                                                                             NA
## `SourceMalaysiakini (subscription)`                                                                    NA
## `SourceMalaysian Digest`                                                                               NA
## Sourcemalaysiandigest.com                                                                              NA
## `SourceMalta Independent Online`                                                                       NA
## `SourceMalta Independent Online (blog)`                                                                NA
## `SourceMalta Star`                                                                                     NA
## SourceMaltaToday                                                                                       NA
## `SourceMaltaToday (blog)`                                                                              NA
## `SourceManagement Today`                                                                               NA
## `SourceManawatu Standard`                                                                              NA
## `SourceManchester Evening News`                                                                        NA
## `SourceManila Bulletin`                                                                                NA
## `SourceManila Standard Today`                                                                          NA
## `SourceMankato Free Press`                                                                             NA
## `SourceMansfield News Journal`                                                                         NA
## SourceManufacturing.net                                                                                NA
## `SourceManx Radio`                                                                                     NA
## `SourceMaple Ridge News`                                                                               NA
## `SourceMaple Ridge Times`                                                                              NA
## SourceMarca                                                                                            NA
## `SourceMarie Claire Australia`                                                                         NA
## SourceMarieClaire.com                                                                                  NA
## `SourceMarine Corps Times`                                                                             NA
## SourceMarineLink                                                                                       NA
## `SourceMarket Exclusive`                                                                               NA
## `SourceMarket Realist`                                                                                 NA
## `SourceMarket Realist via Yahoo Canada Finance`                                                        NA
## `SourceMarket Realist via Yahoo UK & Ireland Finance`                                                  NA
## `SourceMarket Realist via Yahoo! Finance`                                                           1.000
## `SourceMarket Realist via Yahoo! Finance India`                                                        NA
## `SourceMarket Realist via Yahoo! New Zealand Finance`                                                  NA
## `SourceMarket Realist via Yahoo!7 Finance`                                                             NA
## `SourceMarket Watch`                                                                                   NA
## SourceMarketing                                                                                        NA
## `SourceMarketing Interactive`                                                                          NA
## `SourceMarketing Land`                                                                                 NA
## `SourceMarketing magazine Australia (registration)`                                                    NA
## `SourceMarketingProfs.com (subscription)`                                                              NA
## SourceMarketplace.org                                                                                  NA
## `SourceMarketPulse (blog)`                                                                             NA
## `SourceMarkets Daily`                                                                                  NA
## `SourceMarkets Morning`                                                                                NA
## SourceMarketWatch                                                                                      NA
## `SourceMarketWatch (blog)`                                                                             NA
## `SourceMarketWatch via Yahoo Canada Finance`                                                           NA
## `SourceMarketWatch via Yahoo UK & Ireland Finance`                                                     NA
## `SourceMarketWatch via Yahoo! Finance`                                                                 NA
## `SourceMarketWatch via Yahoo! Finance India`                                                           NA
## `SourceMarketWatch via Yahoo! New Zealand Finance`                                                     NA
## `SourceMarketWatch via Yahoo! News`                                                                    NA
## `SourceMarketWatch via Yahoo!7 Finance`                                                                NA
## SourceMarketwire                                                                                       NA
## `SourceMarketwired (press release)`                                                                    NA
## `SourceMarketwired via Yahoo Canada Finance`                                                           NA
## `SourceMarketwired via Yahoo UK & Ireland Finance`                                                     NA
## `SourceMarketwired via Yahoo! Finance`                                                                 NA
## `SourceMarlborough Express`                                                                            NA
## `SourceMarquette Wire`                                                                                 NA
## `SourceMarTech Advisor`                                                                                NA
## `SourceMartins Ferry Times Leader`                                                                     NA
## `SourceMartinsburg Journal`                                                                            NA
## `SourceMaryland Daily Record (subscription)`                                                           NA
## SourceMashable                                                                                      1.000
## `SourceMashable Tech via Yahoo UK & Ireland News`                                                      NA
## `SourceMashable via Yahoo Canada News`                                                                 NA
## `SourceMashable via Yahoo! News`                                                                       NA
## `SourceMason City Globe Gazette`                                                                       NA
## `SourceMass Device`                                                                                    NA
## SourceMassLive.com                                                                                     NA
## `SourceMasterstudies News (blog)`                                                                      NA
## `SourceMaterial Handling & Logistics`                                                                  NA
## `SourceMaui Now`                                                                                       NA
## `SourceMaximum PC`                                                                                     NA
## `SourceMcClatchy Washington Bureau`                                                                    NA
## SourceMCV                                                                                              NA
## `SourceMeadville Tribune`                                                                              NA
## `SourceMeat and Poultry Online`                                                                        NA
## `SourceMed Device Online (press release)`                                                              NA
## `SourceMedCity News`                                                                                   NA
## `SourceMedia Life Magazine`                                                                            NA
## `SourceMedia Matters for America`                                                                      NA
## `SourceMedia Matters for America (blog)`                                                               NA
## SourceMediaite                                                                                         NA
## SourceMediapart                                                                                        NA
## SourceMediaPost                                                                                        NA
## `SourceMediaPost Communications`                                                                       NA
## `SourceMedical Daily`                                                                                  NA
## `SourceMedical Xpress`                                                                                 NA
## `SourceMedicine Hat News`                                                                              NA
## SourceMedicineNet.com                                                                                  NA
## `SourceMedill Reports: Chicago`                                                                        NA
## `SourceMedPage Today`                                                                                  NA
## `SourceMEED (subscription)`                                                                            NA
## SourceMegaGames                                                                                        NA
## `SourceMehr News Agency - English Version`                                                             NA
## SourceMemeburn                                                                                         NA
## `SourceMemorial Examiner`                                                                              NA
## `SourceMemphis Business Journal`                                                                       NA
## `SourceMemphis Business Journal (blog)`                                                                NA
## `SourceMemphis Commercial Appeal`                                                                      NA
## `SourceMemphis Daily News (blog)`                                                                      NA
## `SourceMemphis Flyer`                                                                                  NA
## `SourceMen's News Daily`                                                                               NA
## `SourceMen&#39;s Journal Tech via Yahoo! News`                                                         NA
## SourceMENAFN                                                                                        1.000
## SourceMENAFN.COM                                                                                       NA
## `SourceMennonite World Review`                                                                         NA
## SourceMensquare                                                                                        NA
## `SourceMerced Sun-Star`                                                                                NA
## SourceMercoPress                                                                                       NA
## `SourceMercury Daily (blog)`                                                                           NA
## `SourceMeriden Record-Journal`                                                                         NA
## `SourceMeridian Booster`                                                                               NA
## `SourceMeridian Star`                                                                                  NA
## SourceMerinews                                                                                         NA
## `SourceMeriTalk (blog)`                                                                                NA
## `SourceMERRY JANE`                                                                                     NA
## `SourceMetal Injection.net`                                                                            NA
## SourceMetalMiner                                                                                       NA
## SourceMetro                                                                                         0.999
## `SourceMetro Halifax`                                                                                  NA
## `SourceMetro TV News`                                                                                  NA
## SourceMetro.us                                                                                         NA
## `SourceMetroNews Canada`                                                                               NA
## SourceMetrotvnews.com                                                                                  NA
## `SourceMetroWest Daily News`                                                                           NA
## `SourceMFA China`                                                                                      NA
## `SourceMiami Herald`                                                                                   NA
## `SourceMiami Herald (blog)`                                                                            NA
## `SourceMiami New Times`                                                                                NA
## SourceMiBiz                                                                                            NA
## SourceMic                                                                                              NA
## Sourcemicebtn                                                                                          NA
## `SourceMichigan Journal`                                                                               NA
## `SourceMichigan Radio`                                                                                 NA
## `SourceMichigan State University Extension`                                                            NA
## SourceMichronicleonline                                                                                NA
## `SourceMicroCap Magazine`                                                                              NA
## `SourceMicrogrid Knowledge`                                                                            NA
## SourceMicroScope                                                                                       NA
## `SourceMicrosoft - Channel 9`                                                                          NA
## `SourceMicrosoft - Channel 9 (blog)`                                                                   NA
## `SourceMid-Day`                                                                                        NA
## `SourceMiddle East Confidential`                                                                       NA
## `SourceMiddle East Eye`                                                                                NA
## `SourceMiddle East Forum`                                                                              NA
## `SourceMiddle East Forum (blog)`                                                                       NA
## `SourceMiddle East Monitor`                                                                            NA
## `SourceMiddle East Monitor (blog)`                                                                     NA
## `SourceMiddle East Newsline`                                                                           NA
## `SourceMiddle East Online`                                                                             NA
## `SourceMiddle East Report Online`                                                                      NA
## `SourceMiddletown Press`                                                                               NA
## `SourceMidland Daily News`                                                                             NA
## `SourceMidland Reporter-Telegram`                                                                      NA
## `SourceMidlothian Exchange`                                                                            NA
## `SourceMilitary Times`                                                                                 NA
## SourceMilitary.com                                                                                     NA
## `SourceMille Babords (Communiqu\\u009d\\u009d de presse)`                                              NA
## `SourceMilli Gazette`                                                                                  NA
## `SourceMilpitas Post`                                                                                  NA
## `SourceMilwaukee Business Journal`                                                                     NA
## `SourceMilwaukee Journal Sentinel`                                                                     NA
## `SourceMilwaukee Journal Sentinel (blog)`                                                              NA
## SourceMINA                                                                                             NA
## SourceMineweb                                                                                          NA
## `SourceMining Journal (subscription)`                                                                  NA
## `SourceMining MX`                                                                                      NA
## SourceMINING.com                                                                                       NA
## `SourceMinistry of External Affairs (press release)`                                                   NA
## `SourceMinistry of Foreign Affairs of Denmark`                                                         NA
## `SourceMinneapolis-St. Paul Star Tribune`                                                              NA
## `SourceMinneapolis Star Tribune`                                                                       NA
## `SourceMinneapolis Sun Times`                                                                          NA
## `SourceMinnesota Daily`                                                                                NA
## `SourceMinnesota Public Radio`                                                                         NA
## `SourceMinnesota Public Radio News`                                                                    NA
## SourceMinnPost                                                                                         NA
## `SourceMintpress News (blog)`                                                                          NA
## SourceMinyanville.com                                                                                  NA
## `SourceMirage News`                                                                                    NA
## SourceMirror.co.uk                                                                                     NA
## `SourceMIS Asia`                                                                                       NA
## `SourceMiscellany News`                                                                                NA
## SourceMississauga                                                                                      NA
## `SourceMississauga News`                                                                               NA
## `SourceMississippi Business Journal`                                                                   NA
## `SourceMississippi News Now`                                                                           NA
## `SourceMIT News`                                                                                       NA
## `SourceMIT Technology Review`                                                                          NA
## `SourceMitzpeh (press release)`                                                                        NA
## SourceMixmag                                                                                           NA
## `SourceMizzima News`                                                                                   NA
## SourceMLive.com                                                                                        NA
## `SourceMLT News`                                                                                       NA
## SourceMMAjunkie.com                                                                                    NA
## `SourceMmegi Online`                                                                                   NA
## SourceMMH.com                                                                                          NA
## `SourceMNR Daily`                                                                                      NA
## `SourceMo4ch News (press release) (blog)`                                                              NA
## `SourceMoberly Monitor-Index`                                                                          NA
## SourceMobiHealthNews                                                                                   NA
## `SourceMobile & Apps`                                                                                  NA
## `SourceMobile Burn`                                                                                    NA
## `SourceMobile Choice`                                                                                  NA
## `SourceMobile Computing Today`                                                                         NA
## `SourceMobile ID World`                                                                                NA
## `SourceMobile News`                                                                                    NA
## `SourceMobile Payments Today`                                                                          NA
## `SourceMobile Press-Register`                                                                          NA
## `SourceMobile Today`                                                                                   NA
## `SourceMobile World Live`                                                                              NA
## SourceMobileSyrup.com                                                                                  NA
## SourceMobiPicker                                                                                       NA
## `SourceModel D`                                                                                        NA
## `SourceModern Diplomacy`                                                                               NA
## `SourceModern Distribution Management`                                                                 NA
## SourceModernHealthcare.com                                                                             NA
## SourceModernMedicine                                                                                   NA
## `SourceModest Money (press release) (blog)`                                                            NA
## `SourceMohave Daily News`                                                                              NA
## `SourceMohave Valley News`                                                                             NA
## `SourceMonadnock Ledger Transcript`                                                                    NA
## `SourceMondaq News Alerts (registration)`                                                              NA
## SourceMondoweiss                                                                                       NA
## SourceMoney                                                                                            NA
## `SourceMoney Flow Index`                                                                               NA
## `SourceMoney Magazine`                                                                                 NA
## `SourceMoney Marketing`                                                                                NA
## `SourceMoney Marketing Online`                                                                         NA
## `SourceMoney Morning`                                                                                  NA
## `SourceMoney Morning Australia`                                                                        NA
## `SourceMoney News (press release)`                                                                     NA
## `SourceMoney Talks News via Yahoo! Finance`                                                            NA
## SourceMoneycontrol.com                                                                                 NA
## SourceMoneySense                                                                                       NA
## SourceMoneyweb.co.za                                                                                   NA
## SourceMoneyWeek                                                                                        NA
## SourceMonitor                                                                                          NA
## `SourceMonitor Online (blog)`                                                                          NA
## `SourceMonroe Evening News`                                                                            NA
## `SourceMonroe News Star`                                                                               NA
## `SourceMontana Standard`                                                                               NA
## `SourceMontana Tech`                                                                                   NA
## `SourceMonterey County Weekly`                                                                         NA
## `SourceMontgomery Advertiser`                                                                          NA
## `SourceMonthly Review`                                                                                 NA
## `SourceMontreal Gazette`                                                                               NA
## `SourceMontserrat Reporter`                                                                            NA
## `SourceMoodys.com (press release) (subscription)`                                                      NA
## `SourceMorning Consult`                                                                                NA
## `SourceMorning Journal News`                                                                           NA
## `SourceMorning News USA`                                                                               NA
## `SourceMorning Star`                                                                                   NA
## `SourceMorning Star Online`                                                                            NA
## `SourceMorning Ticker`                                                                                 NA
## SourceMorningstar                                                                                      NA
## SourceMorningstar.com                                                                                  NA
## `SourceMorocco World News`                                                                             NA
## `SourceMorris Daily Herald`                                                                            NA
## `SourceMother Jones`                                                                                   NA
## `SourceMother Nature Network (blog)`                                                                   NA
## SourceMotherboard                                                                                      NA
## `SourceMotley Fool`                                                                                    NA
## `SourceMotley Fool Australia`                                                                          NA
## `SourceMotor Trend`                                                                                    NA
## SourceMotoring                                                                                         NA
## `SourceMotorsport.com, Edition: Global`                                                                NA
## SourceMotorTrend                                                                                       NA
## `SourceMountain View Voice`                                                                            NA
## `SourceMovie TV Tech Geeks News`                                                                       NA
## SourceMoviefone                                                                                        NA
## Sourcemoviepilot.com                                                                                   NA
## SourceMovieWeb                                                                                         NA
## `SourceMRCTV (blog)`                                                                                   NA
## `SourceMRCTV (satire) (blog)`                                                                          NA
## `SourceMrTopStep.com via Yahoo! Finance`                                                               NA
## SourceMSDynamicsWorld.com                                                                              NA
## `SourceMSN Autos`                                                                                      NA
## SourceMSNBC                                                                                            NA
## SourceMSPmentor                                                                                        NA
## `SourceMSPmentor (blog)`                                                                               NA
## SourceMSPoweruser.com                                                                                  NA
## SourceMTPR                                                                                             NA
## SourceMTV.com                                                                                          NA
## `SourceMulti-Housing News`                                                                             NA
## `SourceMultichannel News`                                                                              NA
## `SourceMumbai Mirror`                                                                                  NA
## SourceMuMbrella                                                                                        NA
## `SourceMunchies_ Food by VICE`                                                                         NA
## `SourceMuncie Star Press`                                                                              NA
## `SourceMuscat Daily`                                                                                   NA
## `SourceMuscatine Journal`                                                                              NA
## `SourceMusic Business Worldwide`                                                                       NA
## SourceMusicrooms.net                                                                                   NA
## `SourceMuslimVillage.com (press release) (blog)`                                                       NA
## `SourceMWC News`                                                                                       NA
## `SourceMy Fox Boston`                                                                                  NA
## `SourceMy News LA`                                                                                     NA
## `SourceMy Nintendo News (blog)`                                                                        NA
## `SourceMy Twin Tiers.com`                                                                              NA
## SourceMyAJC                                                                                            NA
## `SourceMyAJC (blog)`                                                                                   NA
## `SourceMyanmar Times`                                                                                  NA
## SourceMyBroadband                                                                                      NA
## SourceMyCentralJersey.com                                                                              NA
## SourceMyDaytonDailyNews                                                                                NA
## Sourcemyfox8.com                                                                                       NA
## SourceMYFOXZONE.com                                                                                    NA
## SourceMyjoyonline.com                                                                                  NA
## SourceMyMotherLode.com                                                                                 NA
## SourceMyNewsLA.com                                                                                     NA
## SourceMyNorthwest.com                                                                                  NA
## `SourceMyrtle Beach Sun News`                                                                          NA
## SourcemySanAntonio.com                                                                                 NA
## `SourcemySanAntonio.com (blog)`                                                                        NA
## SourceMyStateline.com                                                                                  NA
## SourceMyStatesman.com                                                                                  NA
## SourceMyTechBits                                                                                       NA
## `SourceN.C. State University Technician Online`                                                        NA
## SourceN4BB                                                                                             NA
## SourceNaharnet                                                                                         NA
## SourceNAIJ.COM                                                                                         NA
## `SourceNaked Capitalism`                                                                               NA
## `SourceNaked Security`                                                                                 NA
## `SourceNaked Security (blog)`                                                                          NA
## `SourceNamibia Economist`                                                                              NA
## SourceNamibian                                                                                         NA
## `SourceNanaimo News Bulletin`                                                                          NA
## `SourceNanoNews (blog)`                                                                                NA
## `SourceNapa Valley Register`                                                                           NA
## `SourceNaples Daily News`                                                                              NA
## `SourceNarendra Modi (press release) (blog)`                                                           NA
## SourceNascar                                                                                           NA
## SourceNasdaq                                                                                           NA
## `SourceNashua Telegraph`                                                                               NA
## `SourceNashville Business Journal`                                                                     NA
## `SourceNashville Business Journal (blog)`                                                              NA
## `SourceNashville Chatter`                                                                              NA
## `SourceNathan McAlone, Business Insider via Yahoo! Finance`                                            NA
## `SourceNation News`                                                                                    NA
## `Sourcenation.lk - The Nation Newspaper`                                                               NA
## `SourceNational Catholic Register`                                                                     NA
## `SourceNational Catholic Reporter`                                                                     NA
## `SourceNational Catholic Reporter (blog)`                                                              NA
## `SourceNational Constitution Center via Yahoo! News`                                                   NA
## `SourceNational Geographic`                                                                            NA
## `SourceNational Journal`                                                                               NA
## `SourceNational Mirror`                                                                                NA
## `SourceNational Observer`                                                                              NA
## `SourceNational Post`                                                                                  NA
## `SourceNational Review Online`                                                                         NA
## `SourceNational Science Foundation (press release)`                                                    NA
## `SourceNational Turk English`                                                                          NA
## `SourceNATO HQ (press release)`                                                                        NA
## `SourceNatural Gas Intelligence`                                                                       NA
## `SourceNatural Resources Defense Council`                                                              NA
## `SourceNatural Resources Defense Council (blog)`                                                       NA
## SourceNature                                                                                           NA
## `SourceNature World News`                                                                              NA
## SourceNature.com                                                                                       NA
## `SourceNBC 12 Richmond`                                                                                NA
## `SourceNBC 2 Fort Myers`                                                                               NA
## `SourceNBC 29 News`                                                                                    NA
## `SourceNBC 5 Dallas-Fort Worth`                                                                        NA
## `SourceNBC 6 South Florida`                                                                            NA
## `SourceNBC 7 San Diego`                                                                                NA
## `SourceNBC Bay Area`                                                                                   NA
## `SourceNBC Chicago`                                                                                    NA
## `SourceNBC Chicago (blog)`                                                                             NA
## `SourceNBC Connecticut`                                                                                NA
## `SourceNBC Montana`                                                                                    NA
## `SourceNBC Nebraska`                                                                                   NA
## `SourceNBC New York`                                                                                   NA
## `SourceNBC NEWS`                                                                                       NA
## `SourceNBC Southern California`                                                                        NA
## `SourceNBC2 News`                                                                                      NA
## `SourceNBC4 Washington`                                                                                NA
## SourceNBC4i.com                                                                                        NA
## SourceNBCNews.com                                                                                      NA
## SourceNBCSports.com                                                                                    NA
## SourceNCAA.com                                                                                         NA
## `SourceNCR-Iran.org`                                                                                   NA
## SourceNDTV                                                                                             NA
## `SourceNDTV (blog)`                                                                                    NA
## SourceNDTVSports.com                                                                                   NA
## `SourceNearshore Americas`                                                                             NA
## `SourceNehanda Radio`                                                                                  NA
## `SourceNenagh Guardian`                                                                                NA
## `SourceNeos Kosmos`                                                                                    NA
## `SourceNeosho Daily News`                                                                              NA
## SourceNeowin                                                                                           NA
## SourceNerdist                                                                                          NA
## `SourceNerdWallet (blog)`                                                                              NA
## SourceNESN.com                                                                                         NA
## `SourceNetGuide NZ`                                                                                    NA
## SourceNetimperative                                                                                    NA
## `SourceNetwork World`                                                                                  NA
## `SourceNetworks Asia`                                                                                  NA
## SourceNeurogadget                                                                                      NA
## `SourceNevada County Picayune`                                                                         NA
## `SourceNew America Media`                                                                              NA
## `SourceNew Bern Sun Journal`                                                                           NA
## `SourceNew Era`                                                                                        NA
## `SourceNew Europe`                                                                                     NA
## `SourceNew Hampshire Business Review`                                                                  NA
## `SourceNew Hampshire Public Radio`                                                                     NA
## `SourceNew Hampshire Union Leader`                                                                     NA
## `SourceNew Haven Register`                                                                             NA
## `SourceNew Historian`                                                                                  NA
## `SourceNew Internationalist (blog)`                                                                    NA
## `SourceNew Jersey 101.5 FM Radio`                                                                      NA
## `SourceNew Jersey Herald`                                                                              NA
## `SourceNew Kerala`                                                                                  1.000
## `SourceNew Matilda`                                                                                    NA
## `SourceNew Republic`                                                                                   NA
## `SourceNew Ross Standard`                                                                              NA
## `SourceNew Sabah Times`                                                                                NA
## `SourceNew Scientist`                                                                                  NA
## `SourceNew Statesman`                                                                                  NA
## `SourceNew Straits Times Online`                                                                       NA
## `SourceNew Straits Times via Yahoo! Singapore News`                                                    NA
## `SourceNew University`                                                                                 NA
## `SourceNew Vision`                                                                                     NA
## `SourceNew York's PIX11 / WPIX-TV`                                                                     NA
## `SourceNew York Business Journal`                                                                      NA
## `SourceNew York Daily News`                                                                            NA
## `SourceNew York Magazine`                                                                              NA
## `SourceNew York Post`                                                                                  NA
## `SourceNew York Recorder`                                                                              NA
## `SourceNew York Review of Books`                                                                       NA
## `SourceNew York Sun`                                                                                   NA
## `SourceNew York Times`                                                                             <2e-16
## `SourceNew York Times (blog)`                                                                          NA
## `SourceNew York Times Finance`                                                                         NA
## `SourceNew Zealand Herald`                                                                             NA
## `SourceNew Zealand Listener`                                                                           NA
## `SourceNew Zimbabwe`                                                                                   NA
## `SourceNew Zimbabwe.com`                                                                               NA
## SourceNewbritainherald                                                                                 NA
## `SourceNewcastle Herald`                                                                               NA
## `SourceNewham Recorder`                                                                                NA
## SourceNewNowNext                                                                                       NA
## `SourceNews-Medical.net`                                                                               NA
## `SourceNews & Observer`                                                                                NA
## `SourceNews & Observer (blog)`                                                                         NA
## `SourceNews & Star`                                                                                    NA
## `SourceNews 10NBC`                                                                                     NA
## `SourceNews 1130`                                                                                      NA
## `SourceNews 24 South Africa`                                                                           NA
## `SourceNews Channel 12 New Bern`                                                                       NA
## `SourceNews Every day`                                                                                 NA
## `SourceNews from Rutgers`                                                                              NA
## `SourceNews Ghana`                                                                                     NA
## `SourceNews On 6`                                                                                      NA
## `SourceNews On 6 Tulsa`                                                                                NA
## `SourceNews One`                                                                                       NA
## `SourceNews Oracle`                                                                                    NA
## `SourceNews Radio 710 KEEL`                                                                            NA
## `SourceNews Sentinel`                                                                                  NA
## `SourceNews Talk 610 CKTB`                                                                             NA
## `SourceNews Talk 650 CKOM`                                                                             NA
## `SourceNews Talk 770 Calgary`                                                                          NA
## `SourceNews Talk Florida`                                                                              NA
## `SourceNews Tribe`                                                                                     NA
## `SourceNews Watch International`                                                                       NA
## `SourceNews West 9 Midland`                                                                            NA
## `SourceNews World India`                                                                               NA
## SourceNews.Az                                                                                          NA
## SourceNews.com.au                                                                                      NA
## SourceNEWS.com.au                                                                                      NA
## `SourceNews.com.au Travel`                                                                             NA
## Sourcenews.delaware.gov                                                                                NA
## `SourceNEWS10 ABC`                                                                                     NA
## SourceNews1130                                                                                         NA
## SourceNews18                                                                                           NA
## SourceNews24                                                                                           NA
## `SourceNews24 Nigeria`                                                                                 NA
## SourceNews3LV                                                                                          NA
## SourceNews4C                                                                                           NA
## `Sourcenews9.com KWTV`                                                                                 NA
## `SourceNewsAhead Agency`                                                                               NA
## SourceNewsandtribune                                                                                   NA
## SourcenewsBTC                                                                                          NA
## SourceNewsbug.info                                                                                     NA
## `SourceNewsBusters (blog)`                                                                             NA
## SourceNewscenter1.tv                                                                                   NA
## `SourceNewschannel 6 Wichita Falls`                                                                    NA
## SourceNewsChannel5.com                                                                                 NA
## SourceNewsday                                                                                          NA
## SourceNewsDay                                                                                          NA
## SourceNewsdzeZimbabwe                                                                                  NA
## SourceNewser                                                                                           NA
## SourceNewsexaminer                                                                                     NA
## `SourceNewsFactor Network`                                                                             NA
## SourceNewsfirst                                                                                        NA
## SourceNewsGhana.com.gh                                                                                 NA
## `SourceNewsHounds (blog)`                                                                              NA
## SourceNewshub                                                                                          NA
## `SourceNewshub (blog)`                                                                                 NA
## SourceNewsInferno                                                                                      NA
## SourceNewsmax                                                                                          NA
## `SourceNewsnext Bangladesh`                                                                            NA
## SourceNewsOK.com                                                                                       NA
## SourceNewsQuench                                                                                       NA
## `SourceNewstalk 106-108 fm`                                                                            NA
## `SourceNewstalk ZB`                                                                                    NA
## `SourceNewsWay 21`                                                                                     NA
## SourceNewsweek                                                                                         NA
## `SourceNewsweek ME`                                                                                    NA
## `SourceNewsweek via Yahoo UK & Ireland News`                                                           NA
## `SourceNewsweek via Yahoo! News`                                                                       NA
## `SourceNewsweel ME (satire) (press release) (blog)`                                                    NA
## SourceNewsWest9.com                                                                                    NA
## SourceNewswise                                                                                         NA
## SourceNewsWithViews.com                                                                                NA
## SourceNewsworks.org                                                                                    NA
## SourceNewsx                                                                                            NA
## SourceNewsy                                                                                            NA
## `SourceNewton Press Mentor`                                                                            NA
## SourceNewzy                                                                                            NA
## `SourceNext Big Future`                                                                                NA
## `SourceNext City`                                                                                      NA
## SourceNextShark                                                                                        NA
## `SourceNFC World`                                                                                      NA
## SourceNFL.com                                                                                          NA
## `SourceNiagara Falls Review`                                                                           NA
## `SourceNiche Gamer`                                                                                    NA
## `SourceNigeria (press release) (blog)`                                                                 NA
## `SourceNightcap TV`                                                                                    NA
## `SourceNikkei Asian Review`                                                                            NA
## `SourceNine O&#39;Clock`                                                                               NA
## `Sourceninemsn 9Stories`                                                                               NA
## `SourceNintendo Life`                                                                                  NA
## `SourceNIU Newsroom`                                                                                   NA
## SourceNJ.com                                                                                           NA
## SourceNJBIZ                                                                                            NA
## `SourceNK News`                                                                                        NA
## `SourceNL Times`                                                                                       NA
## SourceNME                                                                                              NA
## SourceNME.com                                                                                          NA
## SourceNMPolitics.net                                                                                   NA
## `SourceNo Jitter`                                                                                      NA
## SourceNOLA.com                                                                                         NA
## SourceNooga.com                                                                                        NA
## SourceNoozhawk                                                                                         NA
## `SourceNorfolk Eastern Daily Press`                                                                    NA
## `SourceNorman Transcript`                                                                              NA
## `SourceNorth American Windpower`                                                                       NA
## `SourceNorth Bay Business Journal`                                                                     NA
## `SourceNorth Country Public Radio`                                                                     NA
## `SourceNorth Queensland Register`                                                                      NA
## `SourceNorthampton Chronicle & Echo`                                                                   NA
## `SourceNorthamptonshire Telegraph`                                                                     NA
## `SourceNortheast Mississippi Daily Journal`                                                            NA
## `SourceNorthern Californian`                                                                           NA
## `SourceNorthern Echo`                                                                                  NA
## `SourceNorthern Star`                                                                                  NA
## SourceNorthernLife.ca                                                                                  NA
## SourceNorthfield.org                                                                                   NA
## SourceNorthJersey.com                                                                                  NA
## `SourceNorthumberland Gazette`                                                                         NA
## `SourceNorthwest Arkansas News`                                                                        NA
## `SourceNorthwest Georgia News`                                                                         NA
## `SourceNorthwest Herald`                                                                               NA
## `SourceNorthwestern University NewsCenter`                                                             NA
## `SourceNotebook Review`                                                                                NA
## SourceNotebookReview.com                                                                               NA
## `SourceNottingham Post`                                                                                NA
## SourceNovinite                                                                                         NA
## SourceNovinite.com                                                                                     NA
## `SourceNOW Magazine`                                                                                   NA
## SourceNowGamer                                                                                         NA
## SourceNPR                                                                                              NA
## SourceNSEAVoice.com                                                                                    NA
## `SourceNT News`                                                                                        NA
## SourceNTV                                                                                              NA
## SourceNumbersUSA                                                                                       NA
## SourceNuvo                                                                                             NA
## `SourceNUVO Newsweekly`                                                                                NA
## SourceNWAOnline                                                                                        NA
## SourceNWCN.com                                                                                         NA
## Sourcenwitimes.com                                                                                     NA
## `SourceNY Blueprint`                                                                                   NA
## `SourceNyasa Times`                                                                                    NA
## SourceNYCaribNews                                                                                      NA
## `SourceNYSE Post`                                                                                      NA
## `SourceNYU Washington Square News`                                                                     NA
## `SourceNZ Newswire via Yahoo! New Zealand News`                                                        NA
## `SourceNZ Newswire via Yahoo!7 News`                                                                   NA
## SourceNZCity                                                                                           NA
## `SourceOakland Tribune`                                                                                NA
## `SourceOakville Beaver`                                                                                NA
## SourceObserver                                                                                         NA
## `SourceObserver-Reporter`                                                                              NA
## `SourceObstacle Racing Media (press release) (blog)`                                                   NA
## SourceOcala                                                                                            NA
## SourceOCCRP                                                                                            NA
## SourceOCRegister                                                                                       NA
## `Sourceodditycentral (blog)`                                                                           NA
## `SourceOdessa American`                                                                                NA
## SourceOilOnline                                                                                        NA
## SourceOilPrice.com                                                                                     NA
## `SourceOilprice.com via Yahoo Canada Finance`                                                          NA
## `SourceOilprice.com via Yahoo! Finance`                                                                NA
## `SourceOilprice.com via Yahoo! New Zealand Finance`                                                    NA
## `SourceOilprice.com via Yahoo!7 Finance`                                                               NA
## `SourceOK! Magazine`                                                                                   NA
## `SourceOklahoma&#39;s NewsChannel 4`                                                                   NA
## `SourceOldham Chronicle`                                                                               NA
## `SourceOlean Times Herald`                                                                             NA
## `SourceOlhar Digital`                                                                                  NA
## `SourceOlive Press`                                                                                    NA
## `SourceOmaha World-Herald`                                                                             NA
## `SourceOMCT World Organisation Against Torture`                                                        NA
## `SourceOmnisport via Yahoo! Sports`                                                                    NA
## `SourceOn Cars India`                                                                                  NA
## `SourceOn Line opinion`                                                                                NA
## `SourceOne India`                                                                                      NA
## SourceOneindia                                                                                         NA
## SourceOneNewsNow                                                                                       NA
## `SourceOneonta Daily Star`                                                                             NA
## `SourceOnline Athens`                                                                                  NA
## `SourceOnly Single Player`                                                                             NA
## Sourceonmanorama                                                                                       NA
## SourceOnrec                                                                                            NA
## `SourceOntario Argus Observer`                                                                         NA
## `SourceOnward State`                                                                                   NA
## SourceOnWindows.com                                                                                    NA
## `SourceOPB News`                                                                                       NA
## SourceOpEdNews                                                                                         NA
## `SourceOpen Democracy`                                                                                 NA
## `SourceOPEN MINDS (registration)`                                                                      NA
## `SourceOpen Minds UFO News`                                                                            NA
## SourceOpenCanada                                                                                       NA
## `SourceOpenDNS Blog (blog)`                                                                            NA
## `SourceOpinion Internationale`                                                                         NA
## `SourceOpposing Views`                                                                                 NA
## `SourceoptionMONSTER Research`                                                                         NA
## `SourceoptionMONSTER via Yahoo! Finance`                                                               NA
## `SourceOR-Politics.com`                                                                                NA
## `SourceOracleUnion.com (blog)`                                                                         NA
## `SourceOrange County Register`                                                                         NA
## `SourceOregon Daily Emerald`                                                                           NA
## `SourceOregon Public Broadcasting`                                                                     NA
## SourceOregonLive.com                                                                                   NA
## `SourceOrlando Business Journal`                                                                       NA
## `SourceOrlando Business Journal (blog)`                                                                NA
## `SourceOrlando Sentinel`                                                                               NA
## `SourceOrlando Weekly (blog)`                                                                          NA
## `SourceOroville Mercury Register`                                                                      NA
## `SourceOS News`                                                                                        NA
## SourceOSNews                                                                                           NA
## `SourceOSU - The Lantern`                                                                              NA
## `SourceOsun Defender`                                                                                  NA
## `SourceOswego Daily News`                                                                              NA
## `SourceOtago Daily Times`                                                                              NA
## `SourceOTC Outlook`                                                                                    NA
## `SourceOttawa Citizen`                                                                                 NA
## `SourceOttawa Sun`                                                                                     NA
## `SourceOumma.com: point de vue musulman sur l'actualit\\u009d\\u009d`                                  NA
## `SourceOumma.com: point de vue musulman sur l'actualité`                                               NA
## `SourceOUPblog (blog)`                                                                                 NA
## SourceOurQuadCities                                                                                    NA
## `SourceOut-Law`                                                                                        NA
## `SourceOut-Law.com`                                                                                    NA
## `SourceOut Magazine`                                                                                   NA
## SourceOutdoorHub                                                                                       NA
## `SourceOuter Places`                                                                                   NA
## `SourceOutlook India`                                                                                  NA
## SourceOverlawyered                                                                                     NA
## `SourceOxfam America (press release) (blog)`                                                           NA
## `SourceOxford Mail`                                                                                    NA
## `SourceOxford Student`                                                                                 NA
## `SourceOye! Times`                                                                                     NA
## SourceOZY                                                                                              NA
## `SourceOzy via Yahoo Canada News`                                                                      NA
## `SourceOzy via Yahoo! News`                                                                            NA
## `SourcePA Money News via Yahoo UK & Ireland Finance`                                                   NA
## `SourcePacific Business News (Honolulu)`                                                               NA
## `SourcePacific Daily News`                                                                             NA
## `SourcePacific Standard`                                                                               NA
## `SourcePage Six`                                                                                       NA
## `SourcePajhwok Afghan News (subscription) (blog)`                                                      NA
## `SourcePakistan Christian Post`                                                                        NA
## `SourcePakistan Observer`                                                                              NA
## `SourcePakistan Today`                                                                                 NA
## SourcePalatinate                                                                                       NA
## `SourcePalestine Herald Press`                                                                         NA
## `SourcePalestine News Network`                                                                         NA
## `SourcePalestine Note`                                                                                 NA
## `SourcePalladium-Item`                                                                                 NA
## SourcePallonate                                                                                        NA
## `SourcePalm Beach Daily News`                                                                          NA
## `SourcePalm Beach Post`                                                                                NA
## `SourcePalm Beach Post (blog)`                                                                         NA
## `SourcePamplin Media Group`                                                                            NA
## `SourcePanAm Post (blog)`                                                                              NA
## SourcePanARMENIAN.Net                                                                                  NA
## SourceParade                                                                                           NA
## `SourceParent Herald`                                                                                  NA
## `SourceParkersburg News`                                                                               NA
## `SourceParksville Qualicum Beach News`                                                                 NA
## `SourceParti Anti Sioniste`                                                                            NA
## `SourcePassport Magazine`                                                                              NA
## SourcePatch.com                                                                                        NA
## `SourcePatently Apple`                                                                                 NA
## `SourcePatheos (blog)`                                                                                 NA
## `SourcePatriot Post`                                                                                   NA
## `SourcePattaya Today`                                                                                  NA
## `SourcePayment Week`                                                                                   NA
## `SourcePayScale Career News (blog)`                                                                    NA
## SourcePayvand                                                                                          NA
## `SourcePayvand Iran News`                                                                              NA
## `SourcePBS NewsHour`                                                                                   NA
## `SourcePC-Tablet`                                                                                      NA
## `SourcePc-Tablet Media`                                                                                NA
## `SourcePC Advisor`                                                                                     NA
## `SourcePC Authority`                                                                                   NA
## `SourcePC Gamer`                                                                                       NA
## `SourcePC Magazine`                                                                                    NA
## `SourcePC Perspectives`                                                                                NA
## `SourcePC PowerPlay`                                                                                   NA
## `SourcePC Tech Magazine`                                                                               NA
## `SourcePC World`                                                                                    1.000
## SourcePCGamesN                                                                                         NA
## `SourcePCMag India`                                                                                    NA
## `Sourcepcplus tabloid komputer`                                                                        NA
## `SourcePCR-online.biz`                                                                                 NA
## SourcePCWorld                                                                                          NA
## `SourcePE Hub (subscription) (blog)`                                                                   NA
## `SourcePeeblesshire News`                                                                              NA
## `SourcePeninsula Clarion`                                                                              NA
## `SourcePeninsula On-line`                                                                              NA
## `SourcePenn State News`                                                                                NA
## `SourcePenn: Office of University Communications`                                                      NA
## SourcePennLive.com                                                                                     NA
## `SourcePensacola News Journal`                                                                         NA
## `SourcePensions & Investments`                                                                         NA
## `SourcePenticton Western News`                                                                         NA
## `SourcePeople's World`                                                                                 NA
## `SourcePEOPLE Great Ideas`                                                                             NA
## `SourcePeople Magazine`                                                                                NA
## `SourcePEOPLE StyleWatch`                                                                              NA
## `SourcePeoria Journal Star`                                                                            NA
## `SourcePeoria Public Radio`                                                                            NA
## `SourcePerez Hilton`                                                                                   NA
## SourcePerezHilton.com                                                                                  NA
## `SourcePersonal Liberty Digest`                                                                        NA
## SourcePersonnelToday.com                                                                               NA
## `SourcePerth Now`                                                                                      NA
## `SourcePeru this Week`                                                                                 NA
## `SourcePetaPixel (blog)`                                                                               NA
## `SourcePeter Greenberg.com Travel News`                                                                NA
## `SourcePeterborough Telegraph`                                                                         NA
## `SourcePetoskey News-Review`                                                                           NA
## `SourcePetra News Agency`                                                                              NA
## `SourcePew Research Center`                                                                            NA
## `SourcePew Research Center's Global Attitudes Project`                                                 NA
## `SourcePew Research Center's Internet and American Life Project`                                       NA
## `SourcePew Research Center for the People and the Press`                                               NA
## SourcePhandroid.com                                                                                    NA
## `SourcePharmaceutical Executive (press release) (registration) (blog)`                                 NA
## SourcePharmaceuticalOnline                                                                             NA
## `SourcePhiladelphia Business Journal`                                                                  NA
## `SourcePhilippine Star`                                                                                NA
## `SourcePhilippine Star via Yahoo! Philippines News`                                                    NA
## SourcePhilly.com                                                                                       NA
## `SourcePhilly.com (blog)`                                                                              NA
## SourcePhillyVoice.com                                                                                  NA
## `SourcePhnom Penh Post`                                                                                NA
## `SourcePhoenix Business Journal (blog)`                                                                NA
## `SourcePhone Arena`                                                                                    NA
## `SourcePhone Scoop`                                                                                    NA
## SourcePhoneDog                                                                                         NA
## `SourcePhones Review`                                                                                  NA
## `SourcePhoneWorld Magazine (press release) (blog)`                                                     NA
## `SourcePhotographyBLOG (blog)`                                                                         NA
## SourcePhotonics.com                                                                                    NA
## SourcePhys.Org                                                                                         NA
## `SourcePhysics Today`                                                                                  NA
## SourcePickupTrucks.com                                                                                 NA
## `SourcePine Bluff Commercial`                                                                          NA
## SourcePinkNews                                                                                         NA
## `SourcePioneers Post (press release) (registration) (blog)`                                            NA
## `SourcePirate FM`                                                                                      NA
## `SourcePitchfork Media`                                                                                NA
## `SourcePittsburgh Business Times (blog)`                                                               NA
## `SourcePittsburgh Post-Gazette`                                                                        NA
## `SourcePittsburgh Tribune-Review`                                                                      NA
## `SourcePJ Media`                                                                                       NA
## `SourcePJ Media (blog)`                                                                                NA
## SourcePlanet                                                                                           NA
## SourcePlanetSave.com                                                                                   NA
## SourcePlantAutomation.com                                                                              NA
## `SourcePlastics & Rubber Weekly`                                                                       NA
## `SourcePlastics and Rubber Weekly`                                                                     NA
## `SourcePlastics News`                                                                                  NA
## SourcePlatts                                                                                           NA
## `SourcePlatts (blog)`                                                                                  NA
## `SourcePlay the Game`                                                                                  NA
## `SourcePlayStation LifeStyle`                                                                          NA
## `Sourceplus55 (blog)`                                                                                  NA
## `SourcePlymouth Herald`                                                                                NA
## `SourcePMLiVE (blog)`                                                                                  NA
## `SourcePocket-lint.com`                                                                                NA
## `SourcePoint of Sale News (tm) (press release) (blog)`                                                 NA
## `SourcePolicy Network`                                                                                 NA
## SourcePolitickerNJ                                                                                     NA
## SourcePolitico                                                                                         NA
## `SourcePolitico (blog)`                                                                                NA
## `SourcePOLITICO Magazine`                                                                              NA
## SourcePOLITICO.eu                                                                                      NA
## SourcePoliticsHome.com                                                                                 NA
## SourcePoliticsweb                                                                                      NA
## SourcePoliticusUSA                                                                                     NA
## SourcePolitiFact                                                                                       NA
## SourcePolygon                                                                                          NA
## `SourcePolygon via Yahoo! News`                                                                        NA
## `SourcePOP Herald`                                                                                     NA
## SourcePOPSUGAR                                                                                         NA
## `SourcePopular Mechanics`                                                                              NA
## `SourcePopular Science`                                                                                NA
## SourcePopzara                                                                                          NA
## `SourcePort Huron Times Herald`                                                                        NA
## `SourcePorterville Recorder`                                                                           NA
## `SourcePortland Business Journal (blog)`                                                               NA
## `SourcePortland Tribune`                                                                               NA
## `SourcePortsmouth News`                                                                                NA
## `SourcePost-Bulletin`                                                                                  NA
## `SourcePost-Tribune`                                                                                   NA
## `SourcePost and Parcel`                                                                                NA
## `SourcePost Online`                                                                                    NA
## `SourcePost Online (blog)`                                                                             NA
## `SourcePoughkeepsie Journal`                                                                           NA
## `SourcePowder Magazine`                                                                                NA
## `SourcePower Line (blog)`                                                                              NA
## SourcePoynter.org                                                                                      NA
## `SourcePPcorn (blog)`                                                                                  NA
## SourcePplware                                                                                          NA
## `SourcePR Newswire`                                                                                    NA
## `SourcePR Newswire (press release)`                                                                    NA
## `SourcePR Newswire UK (press release)`                                                                 NA
## `SourcePR Newswire via Yahoo! Finance`                                                              1.000
## `SourcePR Web (press release)`                                                                         NA
## `SourcePrague Daily Monitor`                                                                           NA
## `SourcePrague Post`                                                                                    NA
## SourcePrameyaNews7                                                                                     NA
## SourcePravda                                                                                           NA
## SourcePremier                                                                                          NA
## `SourcePremium Times`                                                                                  NA
## `SourcePrensa Latina`                                                                                  NA
## `SourcePress-Enterprise`                                                                               NA
## `SourcePress & Sun-Bulletin`                                                                           NA
## `SourcePress & Sun-Bulletin (blog)`                                                                    NA
## `SourcePress and Journal`                                                                              NA
## `SourcePress Association via Yahoo UK & Ireland News`                                                  NA
## `SourcePress Herald`                                                                                   NA
## `SourcePress Insider Daily`                                                                            NA
## `SourcePress of Atlantic City`                                                                         NA
## `SourcePress Release Rocket`                                                                           NA
## `SourcePress Release Service (press release)`                                                          NA
## `SourcePress Telegraph (blog)`                                                                         NA
## `SourcePress Trust of India`                                                                           NA
## `SourcePress TV`                                                                                       NA
## `SourcePressChronicle.com (blog)`                                                                      NA
## `SourcePressenza International Press Agency`                                                           NA
## SourcePRI                                                                                              NA
## `SourcePrime Minister of Canada (press release)`                                                       NA
## `SourcePrince Albert Daily Herald`                                                                     NA
## `SourcePrince George Citizen`                                                                          NA
## `SourcePrinted Electronics World`                                                                      NA
## `SourcePrivate Eye`                                                                                    NA
## SourcePRNewser                                                                                         NA
## `SourceProactive Investors UK`                                                                         NA
## `SourceProduct Reviews`                                                                                NA
## `SourceProfit Confidential`                                                                            NA
## SourceProgrammableWeb                                                                                  NA
## `SourceProgress Illinois`                                                                              NA
## `SourceProgress.org (blog)`                                                                            NA
## `SourceProject Syndicate`                                                                              NA
## `SourceProlific North`                                                                                 NA
## `SourceProperty Guru via Yahoo! Singapore News`                                                        NA
## `SourceProperty Magazine International`                                                                NA
## SourcePropertyCasualty360                                                                              NA
## SourceProPublica                                                                                       NA
## `SourceProspect (blog)`                                                                                NA
## `SourceProthom Alo (English)`                                                                          NA
## `SourceProvidence Business News`                                                                       NA
## SourcePRWeb                                                                                         1.000
## SourcePRWeek                                                                                           NA
## `SourcePSFK (blog)`                                                                                    NA
## `SourcePSX Extreme`                                                                                    NA
## `SourcePublic Finance`                                                                                 NA
## `SourcePublic Finance International`                                                                   NA
## `SourcePublic Knowledge Tech News and Comment (blog)`                                                  NA
## `SourcePublishers Weekly (blog)`                                                                       NA
## `SourcePueblo Chieftain`                                                                               NA
## `SourcePuget Sound Business Journal (Seattle)`                                                         NA
## `SourcePuget Sound Business Journal (Seattle) (blog)`                                                  NA
## `SourcePulitzer Center on Crisis Reporting`                                                            NA
## Sourcepulse                                                                                            NA
## `SourcePulse Headlines`                                                                                NA
## `SourcePulse Nigeria`                                                                                  NA
## SourcePulse.com.gh                                                                                     NA
## `SourcePulse+IT`                                                                                       NA
## `SourcePurdue Agricultural Communications`                                                             NA
## `SourcePush Square`                                                                                    NA
## `SourcePV-Tech`                                                                                        NA
## `Sourcepv magazine`                                                                                    NA
## SourcePYMNTS.com                                                                                       NA
## `SourceQ13 FOX`                                                                                        NA
## `SourceQ13 FOX Seattle`                                                                                NA
## SourceQantara.de                                                                                       NA
## `SourceQuad-Cities Online`                                                                             NA
## `SourceQuad City Times`                                                                                NA
## SourceQuartz                                                                                           NA
## `SourceQuartz via Yahoo UK & Ireland Finance`                                                          NA
## `SourceQuartz via Yahoo! Finance`                                                                      NA
## `SourceQueen's Journal`                                                                                NA
## `SourceQueensland Country Life`                                                                        NA
## `SourceQueensland Times`                                                                               NA
## SourceQueerty                                                                                          NA
## `SourceQuincy Herald-Whig`                                                                             NA
## `SourceR & D Magazine`                                                                                 NA
## Sourcerabble.ca                                                                                        NA
## `Sourcerabble.ca (blog)`                                                                               NA
## `SourceRacked NY`                                                                                      NA
## SourceRadarOnline                                                                                      NA
## `SourceRadio Cadena Agramonte`                                                                         NA
## `SourceRadio Canada International`                                                                     NA
## `SourceRadio Free Asia`                                                                                NA
## `SourceRadio Iowa`                                                                                     NA
## `SourceRadio New Zealand`                                                                              NA
## `SourceRadio Pakistan (press release)`                                                                 NA
## `SourceRadio Prague`                                                                                   NA
## `SourceRadio Tamazuj`                                                                                  NA
## `SourceRadio Times`                                                                                    NA
## `SourceRadio.com Music and Entertainment News`                                                         NA
## `SourceRadioFreeEurope/RadioLiberty`                                                                   NA
## SourceRadioVop                                                                                         NA
## `SourceRand Daily Mail`                                                                                NA
## `SourceRandolph County Herald Tribune`                                                                 NA
## SourceRapaport                                                                                         NA
## `SourceRapid City Journal`                                                                             NA
## `SourceRapid tv news`                                                                                  NA
## SourceRappler                                                                                          NA
## SourceRappler.com                                                                                      NA
## `SourceRasmussen Reports`                                                                              NA
## `SourceRaw Story`                                                                                      NA
## `SourceRCR Wireless News`                                                                              NA
## `SourceRe/code`                                                                                        NA
## `SourceReading Eagle`                                                                                  NA
## SourceReadWrite                                                                                        NA
## SourceReadWriteWeb                                                                                     NA
## SourceRealClearMarkets                                                                                 NA
## SourceRealClearPolitics                                                                                NA
## SourceRéalités                                                                                         NA
## `SourceRealtor.com News`                                                                               NA
## `SourceRealty Today`                                                                                   NA
## `SourceRealWire (press release)`                                                                       NA
## SourceReason                                                                                           NA
## `SourceReason (blog)`                                                                                  NA
## `SourceReboot Illinois`                                                                                NA
## SourceRecode                                                                                           NA
## SourceRecombu                                                                                          NA
## `SourceRecorder Press (blog)`                                                                          NA
## `SourceRecorderpost.com (satire) (registration) (blog)`                                                NA
## `SourceRecycling International`                                                                        NA
## `SourceRecycling Today`                                                                                NA
## `SourceRed Alert Politics`                                                                             NA
## `SourceRed and Black`                                                                                  NA
## `SourceRed Deer Advocate`                                                                              NA
## `SourceRed Flag`                                                                                       NA
## `SourceRedding Record Searchlight`                                                                     NA
## `SourceRedheaded Blackbelt`                                                                            NA
## Sourcerediff.com                                                                                       NA
## `SourceRedmond Channel Partner`                                                                        NA
## `SourceRedmond Channel Partner (blog)`                                                                 NA
## `SourceRedmond Reporter`                                                                               NA
## SourceRedmondmag.com                                                                                   NA
## `SourceRedmondmag.com (blog)`                                                                          NA
## `SourceRedress Information & Analysis`                                                                 NA
## `SourceRedwood Falls Gazette`                                                                          NA
## SourceRefinery29                                                                                       NA
## `SourceRegina Leader-Post`                                                                             NA
## `SourceReligion News Service`                                                                          NA
## `SourceRenewable Energy Focus`                                                                         NA
## SourceRenewAmerica                                                                                     NA
## SourceRenewEconomy                                                                                     NA
## SourcereNews                                                                                           NA
## `SourceReno Gazette-Journal`                                                                           NA
## `SourceReno Gazette Journal`                                                                           NA
## `SourceReporters without borders (press release)`                                                      NA
## SourceRepublica                                                                                        NA
## `SourceReseller News`                                                                                  NA
## `SourceResource Investor`                                                                              NA
## SourceReuters                                                                                          NA
## `SourceReuters - UK Focus via Yahoo UK & Ireland Finance`                                              NA
## `SourceReuters Africa`                                                                                 NA
## `SourceReuters Blogs (blog)`                                                                           NA
## `SourceReuters Canada`                                                                                 NA
## `SourceReuters India`                                                                                  NA
## `SourceReuters Middle East via Yahoo Maktoob News`                                                     NA
## `SourceReuters UK`                                                                                     NA
## `SourceReuters via Yahoo Canada Finance`                                                               NA
## `SourceReuters via Yahoo Canada News`                                                                  NA
## `SourceReuters via Yahoo Maktoob News`                                                                 NA
## `SourceReuters via Yahoo UK & Ireland Finance`                                                         NA
## `SourceReuters via Yahoo UK & Ireland News`                                                            NA
## `SourceReuters via Yahoo UK & Ireland Sport`                                                           NA
## `SourceReuters via Yahoo! Finance`                                                                  1.000
## `SourceReuters via Yahoo! Finance India`                                                               NA
## `SourceReuters via Yahoo! India News`                                                                  NA
## `SourceReuters via Yahoo! New Zealand News`                                                            NA
## `SourceReuters via Yahoo! News`                                                                        NA
## `SourceReuters via Yahoo! Philippines News`                                                            NA
## `SourceReuters via Yahoo! Philippines Sports`                                                          NA
## `SourceReuters via Yahoo! Singapore News`                                                              NA
## `SourceReuters via Yahoo! Singapore Sports`                                                            NA
## `SourceReuters via Yahoo! Sports`                                                                      NA
## `SourceReuters via Yahoo!7 Finance`                                                                    NA
## `SourceReuters via Yahoo!7 News`                                                                       NA
## `SourceReykjav\\u009d\\u009dk Grapevine`                                                               NA
## SourceRFI                                                                                              NA
## `SourceRhode Island Public Radio`                                                                      NA
## `SourceRI Future`                                                                                      NA
## `SourceRichmond County Daily Journal`                                                                  NA
## `SourceRichmond Times-Dispatch`                                                                        NA
## SourceRichmond.com                                                                                     NA
## `SourceRick Kupchella's BringMeTheNews`                                                                NA
## `SourceRight Side News`                                                                                NA
## `SourceRight Wing Watch`                                                                               NA
## SourceRigzone                                                                                          NA
## `SourceRing of Fire`                                                                                   NA
## `SourceRisers & Fallers`                                                                               NA
## `SourceRising Kashmir (press release) (registration) (blog)`                                           NA
## `SourceRising Kashmir Daily English Newspaper`                                                         NA
## `SourceRIT University News Services`                                                                   NA
## `SourceRiverfront Times (blog)`                                                                        NA
## SourceRiversideGazette.com                                                                             NA
## `SourceRoad to Paris`                                                                                  NA
## `SourceRoad to VR`                                                                                     NA
## `SourceRoad Warrior Voices`                                                                            NA
## SourceRoadandTrack.com                                                                                 NA
## `SourceRoads and Kingdoms`                                                                             NA
## `SourceRoanoke Times`                                                                                  NA
## SourceRobdailynews                                                                                     NA
## SourceRobohub                                                                                          NA
## `SourceRochdale Online`                                                                                NA
## `SourceRochester Democrat and Chronicle`                                                               NA
## `SourceRochester Democrat and Chronicle (blog)`                                                        NA
## SourceRocketNews24                                                                                     NA
## `SourceRockford Register Star`                                                                         NA
## `SourceRockhampton Morning Bulletin`                                                                   NA
## `SourceRoll Call`                                                                                      NA
## `SourceRoll Call (blog)`                                                                               NA
## `SourceRoll Call (registration)`                                                                       NA
## `SourceRoll Call (registration) (blog)`                                                                NA
## SourceRollingStone.com                                                                                 NA
## `SourceRomania-Insider.com`                                                                            NA
## `SourceRomford Recorder`                                                                               NA
## SourceRomper                                                                                           NA
## `SourceRoute Fifty`                                                                                    NA
## `SourceRoyal Gazette`                                                                                  NA
## `SourceRoyal Society of Chemistry`                                                                     NA
## SourceRT                                                                                               NA
## SourceRTBF                                                                                             NA
## `SourceRTE News`                                                                                       NA
## `SourceRTÉ News`                                                                                       NA
## SourceRTE.ie                                                                                           NA
## `SourceRTT News`                                                                                    0.999
## `SourceRTV Slovenija`                                                                                  NA
## `SourceRU Daily Targum`                                                                                NA
## SourceRudaw                                                                                            NA
## `SourceRuidoso News`                                                                                   NA
## `SourceRunway Girl Network`                                                                            NA
## SourceRushLimbaugh.com                                                                                 NA
## `SourceRussia and India Report`                                                                        NA
## `SourceRussia Beyond the Headlines`                                                                    NA
## `SourceRussia Direct`                                                                                  NA
## `SourceRussian Information Agency Novosti`                                                             NA
## `SourceRutland Herald`                                                                                 NA
## SourceRwanda                                                                                           NA
## `SourceRwanda News Agency (registration)`                                                              NA
## `SourceSabah Daily Express`                                                                            NA
## `SourceSac City Express`                                                                               NA
## `SourceSacramento Bee`                                                                                 NA
## `SourceSacramento Bee (blog)`                                                                          NA
## `SourceSacramento Business Journal`                                                                    NA
## `SourceSahara Reporters`                                                                               NA
## SourceSaharaReporters.com                                                                              NA
## `SourceSalem-News.Com`                                                                                 NA
## `SourceSalem State Log`                                                                                NA
## SourceSalemNews.net                                                                                    NA
## SourceSalina.com                                                                                       NA
## `SourceSalisbury Journal`                                                                              NA
## SourceSalon                                                                                            NA
## SourceSalon.com                                                                                        NA
## `SourceSalt Lake Tribune`                                                                              NA
## `SourceSAMAA TV (press release) (registration) (blog)`                                                 NA
## `SourceSan Angelo LIVE!`                                                                               NA
## `SourceSan Angelo Standard Times`                                                                      NA
## `SourceSan Antonio Business Journal`                                                                   NA
## `SourceSan Antonio Express-News`                                                                       NA
## `SourceSan Antonio Express-News (subscription)`                                                        NA
## `SourceSan Bernardino County Sun`                                                                      NA
## `SourceSan Bernardino Sun`                                                                             NA
## `SourceSan Diego Free Press`                                                                           NA
## `SourceSan Diego Jewish World`                                                                         NA
## `SourceSan Francisco Bay View`                                                                         NA
## `SourceSan Francisco Business Times (blog)`                                                            NA
## `SourceSan Francisco Chronicle`                                                                        NA
## `SourceSan Francisco Examiner`                                                                         NA
## `SourceSan Francisco Sun Times`                                                                        NA
## `SourceSan Jose Mercury News`                                                                          NA
## `SourceSan Jose Mercury News media center`                                                             NA
## `SourceSan Mateo Daily Journal`                                                                        NA
## `SourceSandton Chronicle`                                                                              NA
## `SourceSanta Barbara Independent`                                                                      NA
## `SourceSanta Clarita Valley Signal`                                                                    NA
## `SourceSanta Cruz Sentinel`                                                                            NA
## `SourceSanta Fe New Mexican`                                                                           NA
## `SourceSanta Fe New Mexican (blog)`                                                                    NA
## `SourceSanta Fe Reporter`                                                                              NA
## `SourceSanta Maria Times (subscription)`                                                               NA
## `SourceSanta Rosa Press Democrat`                                                                      NA
## SourceSaphirNews.com                                                                                   NA
## `SourceSarasota Herald-Tribune`                                                                        NA
## `SourceSarnia Observer`                                                                                NA
## `SourceSaskatoon StarPhoenix`                                                                          NA
## SourceSaskatoonhomepage.ca                                                                             NA
## `SourceSaudi Gazette`                                                                                  NA
## `SourceSaudi Gazette via Yahoo Maktoob News`                                                           NA
## `SourceSauk Prairie Eagle`                                                                             NA
## `SourceSault Star`                                                                                     NA
## `SourceSault Ste. Marie Evening News`                                                                  NA
## `SourceSavannah Morning News`                                                                          NA
## `SourceSB Nation`                                                                                      NA
## SourceSBS                                                                                              NA
## `SourceSBS - The World Game`                                                                           NA
## `SourceSC Magazine`                                                                                    NA
## `SourceSC Magazine UK`                                                                                 NA
## `SourceScarborough Today`                                                                              NA
## `SourceSci-Tech Today`                                                                                 NA
## SourceSciDev.Net                                                                                       NA
## `SourceScience /AAAS`                                                                                  NA
## `SourceScience 2.0`                                                                                    NA
## `SourceScience Daily`                                                                                  NA
## `SourceScience Magazine`                                                                               NA
## `SourceScience Recorder`                                                                               NA
## `SourceScience Times`                                                                                  NA
## `SourceScience World Report`                                                                           NA
## SourceScienceAlert                                                                                     NA
## `SourceScienceBlog.com (blog)`                                                                         NA
## `SourceScientific American`                                                                            NA
## `SourceScientific American (blog)`                                                                     NA
## SourceSCNow                                                                                            NA
## SourceScoop.co.nz                                                                                      NA
## `SourceScoop.co.nz (press release)`                                                                    NA
## SourceScoopWhoop                                                                                       NA
## `SourceScotland on Sunday`                                                                             NA
## SourceScotsman                                                                                         NA
## `SourceScotsman (blog)`                                                                                NA
## `SourceScottish Daily Record`                                                                          NA
## `SourceScottish Housing News`                                                                          NA
## `SourceScottsbluff Star Herald`                                                                        NA
## `SourceSCOTUSblog (blog)`                                                                              NA
## `SourceScranton Times-Tribune`                                                                         NA
## `SourceScreen International`                                                                           NA
## SourceScroll.in                                                                                        NA
## `SourceSDE Entertainment News`                                                                         NA
## `SourceSDPB Radio`                                                                                     NA
## `SourceSDSU Newscenter`                                                                                NA
## SourceSDTimes.com                                                                                      NA
## SourceSeacoastonline.com                                                                               NA
## `SourceSearch Engine Journal`                                                                          NA
## `SourceSearch Engine Land`                                                                             NA
## `SourceSeattle Globalist`                                                                              NA
## `SourceSeattle Sun Times`                                                                              NA
## `SourceSeattle Times`                                                                               1.000
## Sourceseattlepi.com                                                                                    NA
## `Sourceseattlepi.com (blog)`                                                                           NA
## SourceSECcountry.com                                                                                   NA
## `SourceSecrecy News (blog)`                                                                            NA
## `SourceSecurity Intelligence (blog)`                                                                   NA
## `SourceSee It Market (blog)`                                                                           NA
## SourceSeeker                                                                                           NA
## `SourceSeeker (registration) (blog)`                                                                   NA
## `SourceSeeking Alpha`                                                                               1.000
## `SourceSeeNews (subscription)`                                                                         NA
## `SourceSeeNews Renewables`                                                                             NA
## SourceSegmentNext                                                                                      NA
## SourceSelectButton                                                                                     NA
## `SourceSentinel & Enterprise`                                                                          NA
## `SourceServer Watch`                                                                                   NA
## `SourceSETHLUI.com via Yahoo! Singapore News`                                                          NA
## `SourceSevier News Messenger`                                                                          NA
## `SourceSeychelles News Agency`                                                                         NA
## `SourceSeymour Tribune`                                                                                NA
## `SourceSF Weekly (blog)`                                                                               NA
## SourceSFGate                                                                                           NA
## `SourceSFGate (blog)`                                                                                  NA
## SourceSFist                                                                                            NA
## SourceShacknews                                                                                        NA
## `SourceShanghai Daily (subscription)`                                                                  NA
## Sourceshanghaidaily                                                                                    NA
## SourceShanghaiist                                                                                      NA
## `Sourceshare market updates (press release)`                                                           NA
## `SourceShareCafe (registration)`                                                                       NA
## SourceShareCast                                                                                        NA
## `SourceSharecast via Yahoo UK & Ireland Finance`                                                       NA
## SourceShareChat                                                                                        NA
## SourceSharekhan                                                                                        NA
## SourceSheKnows.com                                                                                     NA
## `SourceSherwood Park News`                                                                             NA
## `SourceShields Gazette`                                                                                NA
## `SourceShillong Times`                                                                                 NA
## `SourceShiny Shiny`                                                                                    NA
## `SourceShreveport Times`                                                                               NA
## SourceSHRM                                                                                             NA
## `SourceShropshire Star`                                                                                NA
## Sourceshropshirestar.com                                                                               NA
## `SourceSHU Spectrum`                                                                                   NA
## `SourceSierra Leone Telegraph`                                                                         NA
## `SourceSify News`                                                                                      NA
## `SourceSilicon Valley Business Journal`                                                                NA
## `SourceSilicon Valley Business Journal (blog)`                                                         NA
## SourceSiliconANGLE                                                                                 <2e-16
## `SourceSiliconANGLE (blog)`                                                                            NA
## SourceSiliconBeat                                                                                      NA
## SourceSiliconera                                                                                       NA
## SourceSiliconIndia                                                                                     NA
## SourceSiliconindia.com                                                                                 NA
## SourceSiliconrepublic.com                                                                              NA
## SourceSILive.com                                                                                       NA
## `SourceSilver City Sun-News`                                                                           NA
## SourceSimcoe.com                                                                                       NA
## `SourceSin Chew Jit Poh`                                                                               NA
## `SourceSingapore Business Review`                                                                      NA
## `SourceSingapore Business Review via Yahoo! Finance`                                                   NA
## `SourceSingapore Government Online (press release)`                                                    NA
## `SourceSioux City Journal`                                                                             NA
## `SourceSioux Falls Argus Leader`                                                                       NA
## `SourceSiouxland Matters`                                                                              NA
## `SourceSiskiyou Daily News`                                                                            NA
## `SourceSITE Intelligence Group (subscription)`                                                         NA
## SourceSitePoint                                                                                        NA
## SourceSkift                                                                                            NA
## `SourceSky News`                                                                                       NA
## `SourceSky News Australia`                                                                             NA
## `SourceSky News via Yahoo Canada News`                                                                 NA
## `SourceSky News via Yahoo UK & Ireland Finance`                                                        NA
## `SourceSky News via Yahoo UK & Ireland News`                                                           NA
## SourceSkySports                                                                                        NA
## `SourceSLAM Online`                                                                                    NA
## SourceSlashdot                                                                                         NA
## SourceSlashGear                                                                                     1.000
## `SourceSlate Magazine`                                                                                 NA
## `SourceSlate Magazine (blog)`                                                                          NA
## SourceSlate.fr                                                                                         NA
## `SourceSleepy Eye Herald Dispatch`                                                                     NA
## `SourceSlipped Disc`                                                                                   NA
## `SourceSlugger O'Toole`                                                                                NA
## `SourceSmall Business Computing`                                                                       NA
## `SourceSmall Business Times`                                                                           NA
## `SourceSmall Business Trends`                                                                          NA
## SourceSmallBusiness.co.uk                                                                              NA
## `Sourcesmallwarsjournal (blog)`                                                                        NA
## SourceSmartCompany.com.au                                                                              NA
## `SourceSmarter Analyst`                                                                                NA
## `SourceSME Insider`                                                                                    NA
## SourceSmithsonian                                                                                      NA
## `SourceSNAPPA Celebrity via Yahoo UK & Ireland News`                                                   NA
## `SourceSNAPPA Technology via Yahoo UK & Ireland News`                                                  NA
## Sourcesnopes.com                                                                                       NA
## `SourceSocial Europe`                                                                                  NA
## `SourceSocialist Alternative`                                                                          NA
## `SourceSocialist Project`                                                                              NA
## `SourceSocialist Worker`                                                                               NA
## `SourceSocialist Worker Online`                                                                        NA
## SourceSocialTimes                                                                                      NA
## `SourceSoftonic EN (blog)`                                                                             NA
## `SourceSoftpedia News`                                                                                 NA
## `SourceSoftpedia News (blog)`                                                                          NA
## SourceSOHH                                                                                             NA
## SourceSojourners                                                                                       NA
## `SourceSolomon Star`                                                                                   NA
## `SourceSonoma State Star`                                                                              NA
## `SourceSonoran Weekly Review`                                                                          NA
## SourceSooToday.com                                                                                     NA
## `SourceSOS Children`                                                                                   NA
## `SourceSounder At Heart`                                                                               NA
## SourceSoundersFC.com                                                                                   NA
## Sourcesourcingfocus.com                                                                                NA
## `SourceSouth Africa.info`                                                                              NA
## `SourceSouth African Broadcasting Corporation`                                                         NA
## `SourceSouth Bend Tribune`                                                                             NA
## `SourceSouth Carolina SC (press release) (blog)`                                                       NA
## `SourceSouth China Morning Post`                                                                       NA
## `SourceSouth China Morning Post (registration)`                                                        NA
## `SourceSouth China Morning Post (subscription)`                                                        NA
## `SourceSouth Florida Business Journal`                                                                 NA
## `SourceSouth Leeds Life`                                                                               NA
## `SourceSouth Wales Argus`                                                                              NA
## `SourceSouth Wales Evening Post`                                                                       NA
## SourceSouthCoastToday.com                                                                              NA
## `SourceSoutheast Asia GLOBE`                                                                           NA
## `SourceSoutheast Missourian`                                                                           NA
## `SourceSoutheast Texas Record`                                                                         NA
## `SourceSouthern Political Report`                                                                      NA
## SourceSouthernminn.com                                                                                 NA
## SourceSouthtownStar                                                                                    NA
## `SourceSouthwest Times`                                                                                NA
## `SourceSowetan Live (press release) (registration) (blog)`                                             NA
## `SourceSpace Daily`                                                                                    NA
## `SourceSpace War`                                                                                      NA
## SourceSpace.com                                                                                        NA
## SourceSpaceDaily                                                                                       NA
## SourceSpaceNews                                                                                        NA
## SourceSpaceRef                                                                                         NA
## `SourceSpalding Guardian`                                                                              NA
## `SourceSPAMfighter News (press release)`                                                               NA
## `SourceSpartanburg Herald-Journal`                                                                     NA
## SourceSpectator.co.uk                                                                                  NA
## `SourceSpectator.co.uk (blog)`                                                                         NA
## `SourceSpend Matters`                                                                                  NA
## SourceSpiked                                                                                           NA
## SourceSpin                                                                                             NA
## `SourceSplice Today`                                                                                   NA
## SourceSport24                                                                                          NA
## `SourceSporting Life`                                                                                  NA
## `SourceSporting News`                                                                                  NA
## `SourceSporting News via Yahoo UK & Ireland Sport`                                                     NA
## `SourceSporting News via Yahoo! Sports`                                                                NA
## SourceSportingNews                                                                                     NA
## SourceSportingNews.com                                                                                 NA
## `SourceSports Illustrated`                                                                             NA
## `SourceSportsBusiness Daily (subscription)`                                                            NA
## SourceSportsGrid                                                                                       NA
## SourceSportskeeda                                                                                      NA
## `SourceSportskeeda via Yahoo! India News`                                                              NA
## SourceSportsnet.ca                                                                                     NA
## SourceSportTechie                                                                                      NA
## `SourceSpringfield News-Leader`                                                                        NA
## `SourceSputnik France`                                                                                 NA
## `SourceSputnik International`                                                                          NA
## `SourceSputnik UK`                                                                                     NA
## `SourceSputnik US`                                                                                     NA
## `SourceSQL Server Pro (blog)`                                                                          NA
## `SourceSri Lanka Guardian`                                                                             NA
## `SourceSt, Thomas Source`                                                                              NA
## `SourceSt. Albert Gazette`                                                                             NA
## `SourceSt. Augustine Record`                                                                           NA
## `SourceSt. Catharines Standard`                                                                        NA
## `SourceSt. Cloud Times`                                                                                NA
## `SourceSt. George Daily Spectrum`                                                                      NA
## `SourceSt. Joseph News-Press`                                                                          NA
## `SourceSt. Louis Business Journal`                                                                     NA
## `SourceSt. Louis Business Journal (blog)`                                                              NA
## `SourceSt. Louis Jewish Light`                                                                         NA
## `SourceSt. Lucia News Online`                                                                          NA
## `SourceSt. Lucia Times Online News (press release)`                                                    NA
## `SourceSt. Petersburg Times Blogs`                                                                     NA
## `SourceSt. Thomas Times-Journal`                                                                       NA
## `SourceSTA - Slovenska Tiskovna Agencija (subscription)`                                               NA
## `SourceStabroek News`                                                                                  NA
## `SourceStaff Newsletter`                                                                               NA
## `SourceStaffing Industry Analysts`                                                                     NA
## `SourceStamford Advocate`                                                                              NA
## `SourceStanford Social Innovation Review (subscription)`                                               NA
## `SourceStanford University News`                                                                       NA
## `SourceStanly News & Press`                                                                            NA
## SourceStar2.com                                                                                        NA
## SourceStarAfrica.com                                                                                   NA
## SourceStarpulse.com                                                                                    NA
## `SourceStarr 103.5 FM`                                                                                 NA
## `SourceStars and Stripes`                                                                              NA
## SourceStartups.co.uk                                                                                   NA
## SourceStartupSmart                                                                                     NA
## SourceSTAT                                                                                             NA
## `SourceState-Journal.com`                                                                              NA
## `SourceState Journal`                                                                                  NA
## `SourceState of the State KS (subscription)`                                                           NA
## `SourceStateImpact Oklahoma`                                                                           NA
## `SourceStatesman Journal`                                                                              NA
## `SourceSteelers Lounge (blog)`                                                                         NA
## SourceStepFeed                                                                                         NA
## SourceStevenspointjournal                                                                              NA
## SourceStevivor                                                                                         NA
## `SourceStillwater News Press`                                                                          NA
## `Sourcestiripesurse.ro (Comunicat de Pres\\u009d\\u009d)`                                              NA
## Sourcestjoechannel.com                                                                                 NA
## SourceSTLtoday.com                                                                                     NA
## `SourceStock & Land`                                                                                   NA
## `SourceStock Transcript`                                                                               NA
## `SourceStock World`                                                                                    NA
## SourceStockhouse                                                                                       NA
## `SourceStockton Record (blog)`                                                                         NA
## SourceStorypick                                                                                        NA
## SourceStraight.com                                                                                     NA
## `SourceStraight.com (blog)`                                                                            NA
## `SourceStrategy Page`                                                                                  NA
## `Sourcestrategy+business (registration) (blog)`                                                        NA
## SourceSTRATFOR                                                                                         NA
## SourceStreamingMedia.com                                                                               NA
## `SourceStreet Updates`                                                                                 NA
## `SourceStreetAuthority Network via Yahoo! Finance`                                                     NA
## SourceStreetInsider.com                                                                                NA
## `SourceStreetInsider.com (blog)`                                                                       NA
## `SourceStreetsblog New York (blog)`                                                                    NA
## `SourceStreetWise Report`                                                                              NA
## `SourceStreetWise Report (press release)`                                                              NA
## SourceStuff                                                                                         0.999
## SourceStuff.co.nz                                                                                      NA
## `SourceSturgis Journal`                                                                                NA
## `SourceSTV News`                                                                                       NA
## Sourcestv.tv                                                                                           NA
## `SourceStyle News - StyleWatch - People.com`                                                           NA
## `SourceSud Ouest`                                                                                      NA
## `SourceSudan Tribune`                                                                                  NA
## SourceSudbury.com                                                                                      NA
## `SourceSun-Sentinel`                                                                                   NA
## `SourceSun Sentinel`                                                                                   NA
## `SourceSun Times National`                                                                             NA
## SourceSun.Star                                                                                         NA
## `SourceSunbury Daily Item`                                                                             NA
## `SourceSunday Business Post`                                                                           NA
## `SourceSunday Leader`                                                                                  NA
## `SourceSunday Observer`                                                                                NA
## `SourceSunday World`                                                                                   NA
## `SourceSunderland Echo`                                                                                NA
## SourceSunLive                                                                                          NA
## `SourceSunshine State News`                                                                            NA
## `SourceSupermarket News`                                                                               NA
## `SourceSuperSite for Windows`                                                                          NA
## `SourceSupply Chain Management Review`                                                                 NA
## SourceSurferToday                                                                                      NA
## `SourceSustainable Brands`                                                                             NA
## `SourceSutherland Northern Times`                                                                      NA
## SourceSwampland                                                                                        NA
## SourceSwarajya                                                                                         NA
## `SourceSwarthmore College The Phoenix Online`                                                          NA
## Sourceswissinfo.ch                                                                                     NA
## `SourceSwitzer Financial News`                                                                         NA
## `SourceSydney Morning Herald`                                                                          NA
## `SourceSyracuse University News`                                                                       NA
## SourceSyracuse.com                                                                                     NA
## `SourceSyria Deeply`                                                                                   NA
## `Sourcet-online.de`                                                                                    NA
## `SourceT.H.E. Journal`                                                                                 NA
## SourceT3                                                                                               NA
## `SourceTablet Magazine`                                                                                NA
## `SourceTablet PC Review`                                                                               NA
## `SourceTaipei Times`                                                                                   NA
## `SourceTaiwan Today`                                                                                   NA
## SourceTakePart                                                                                         NA
## `SourceTakePart.com via Yahoo! News`                                                                   NA
## `SourceTalkin' Cloud`                                                                                  NA
## SourceTallahassee.com                                                                                  NA
## SourceTameBay                                                                                          NA
## `SourceTampa Bay Business Journal`                                                                     NA
## `SourceTampa Bay Review`                                                                               NA
## `SourceTampa Bay Times`                                                                                NA
## SourceTampabay.com                                                                                     NA
## `SourceTampabay.com (blog)`                                                                            NA
## `SourceTaranaki Daily News`                                                                            NA
## `SourceTasmania Examiner`                                                                              NA
## `SourceTasnim News Agency (press release)`                                                             NA
## SourceTASS                                                                                             NA
## `SourceTax-News.com`                                                                                   NA
## SourceTBO.com                                                                                          NA
## SourceTCC                                                                                              NA
## SourceTCPalm                                                                                           NA
## SourceTDM.com                                                                                          NA
## `SourceTeague Chronicle`                                                                               NA
## `SourceTech Cocktail`                                                                                  NA
## `SourceTech in Asia`                                                                                   NA
## `SourceTech Insider`                                                                                   NA
## `SourceTech Insider (blog)`                                                                            NA
## `SourceTech Insider via Yahoo UK & Ireland News`                                                       NA
## `SourceTech Media Network (Laptop) via Yahoo! News`                                                    NA
## `SourceTech Media Network (Tom&#39;s Guide) via Yahoo! News`                                           NA
## `SourceTech News Today`                                                                                NA
## `SourceTech Page One`                                                                                  NA
## `SourceTech Pinas`                                                                                     NA
## `SourceTech Pro Research via Yahoo! News`                                                              NA
## `SourceTech Times`                                                                                     NA
## SourceTech.Co                                                                                          NA
## SourceTech2                                                                                            NA
## SourceTechCentral                                                                                      NA
## SourceTechcrunch                                                                                       NA
## SourceTechCrunch                                                                                    1.000
## SourceTechdirt                                                                                         NA
## SourceTechEye                                                                                          NA
## SourceTechFrag                                                                                         NA
## SourceTechGadgetCentral                                                                                NA
## SourceTechHive                                                                                         NA
## `SourceTechJuice (press release) (blog)`                                                               NA
## SourceTechland                                                                                         NA
## SourceTechly                                                                                           NA
## `SourceTechnabob (blog)`                                                                               NA
## SourceTechNewsWorld                                                                                    NA
## SourceTechNewsWorld.com                                                                                NA
## SourceTechnical.ly                                                                                     NA
## `SourceTechnical.ly Brooklyn`                                                                          NA
## `SourceTechnical.ly Philly`                                                                            NA
## SourceTechnoBuffalo                                                                                    NA
## `SourceTechnology Personalized`                                                                        NA
## `SourceTechnology Review`                                                                              NA
## `SourceTechnology Zimbabwe`                                                                            NA
## `SourceTechpoint.ng (blog)`                                                                            NA
## SourceTechRadar                                                                                     1.000
## `SourceTechradar India`                                                                                NA
## SourceTechRepublic                                                                                     NA
## `SourceTechRepublic (blog)`                                                                            NA
## `SourceTechRepublic via Yahoo! Finance`                                                                NA
## `SourceTechRepublic via Yahoo! News`                                                                   NA
## SourceTechRez                                                                                          NA
## SourceTechRitual                                                                                       NA
## SourceTechSpot                                                                                         NA
## SourceTechTarget                                                                                       NA
## `SourceTechTarget (blog)`                                                                              NA
## `SourceTechvibes (blog)`                                                                               NA
## `SourceTechWeekEurope UK`                                                                              NA
## SourceTechwire.net                                                                                     NA
## SourceTechWorld                                                                                        NA
## SourceTechworm                                                                                         NA
## SourceTeenVogue.com                                                                                    NA
## `SourceTehran Times`                                                                                   NA
## `SourceTelecom Asia`                                                                                   NA
## `SourceTelecom Reseller (press release)`                                                               NA
## Sourcetelecomasia.net                                                                                  NA
## `SourceTelecompaper (subscription)`                                                                    NA
## SourceTeleGeography                                                                                    NA
## `SourceTelegraph via Yahoo UK & Ireland Finance`                                                       NA
## SourceTelegraph.co.uk                                                                                  NA
## `SourceTelegraphStandard.com (blog)`                                                                   NA
## `SourceteleSUR English`                                                                                NA
## SourceTempo                                                                                            NA
## SourceTempo.co                                                                                         NA
## `SourceTen Eyewitness News`                                                                            NA
## `SourceTerre Haute Tribune Star`                                                                       NA
## `SourceTES News`                                                                                       NA
## `SourceTest Tube`                                                                                      NA
## `SourceTewkesbury ADMAG`                                                                               NA
## `SourceTexarkana Gazette`                                                                              NA
## `SourceTexas A&M The Battalion`                                                                        NA
## `SourceTexas Tribune`                                                                                  NA
## `SourceTG Daily`                                                                                       NA
## `SourceThaiVisa News`                                                                                  NA
## `SourceThanh Ni\\u009d\\u009dn`                                                                        NA
## `SourceThanh Nien Daily`                                                                               NA
## `SourceThe-review`                                                                                     NA
## `SourceThe `                                                                                           NA
## `SourceThe Abbotsford News`                                                                            NA
## `SourceThe Actuary`                                                                                    NA
## `SourceThe Adam Smith Institute (blog)`                                                                NA
## `SourceThe Advertiser`                                                                                 NA
## `SourceThe Advocate`                                                                                   NA
## `SourceThe Aero-News Network`                                                                          NA
## `SourceThe Africa Report`                                                                              NA
## `SourceThe Age`                                                                                        NA
## `SourceThe Albany Herald`                                                                              NA
## `SourceThe American Bazaar`                                                                            NA
## `SourceThe American Conservative`                                                                      NA
## `SourceThe American Genius`                                                                            NA
## `SourceThe American Lawyer`                                                                            NA
## `SourceThe American Prospect`                                                                          NA
## `SourceThe Ames Tribune`                                                                               NA
## `SourceThe Arab Daily News`                                                                            NA
## `SourceThe Architect's Newspaper`                                                                      NA
## `SourceThe Arctic Journal`                                                                             NA
## `SourceThe Argentina Independent`                                                                      NA
## `SourceThe Argus-Press`                                                                                NA
## `SourceThe Art Newspaper`                                                                              NA
## `SourceThe Art of Gears`                                                                               NA
## `SourceThe Asia Foundation - In Asia`                                                                  NA
## `SourceThe Asia Sentinel`                                                                              NA
## `SourceThe Asian Age`                                                                                  NA
## `SourceThe Associated Press via Yahoo Canada Sports`                                                   NA
## `SourceThe Associated Press via Yahoo! Sports`                                                         NA
## `SourceThe Atlantic`                                                                                   NA
## `SourceThe Atlantic via Yahoo Canada News`                                                             NA
## `SourceThe Atlantic via Yahoo UK & Ireland News`                                                       NA
## `SourceThe Atlantic via Yahoo! News`                                                                   NA
## `SourceThe Augusta Chronicle`                                                                          NA
## `SourceThe Australian`                                                                                 NA
## `SourceThe Australian (blog)`                                                                          NA
## `SourceThe Australian (subscription)`                                                                  NA
## `SourceThe Australian (subscription) (blog)`                                                           NA
## `SourceThe Australian Financial Review`                                                                NA
## `SourceThe Auto Channel`                                                                               NA
## `SourceThe Bakersfield Californian`                                                                    NA
## `SourceThe Baltic Course`                                                                              NA
## `SourceThe Barrie Examiner`                                                                            NA
## `SourceThe Beacon`                                                                                     NA
## `SourceThe Bellingham Herald`                                                                          NA
## `SourceThe Big Lead`                                                                                   NA
## `SourceThe Biloxi Sun Herald`                                                                          NA
## `SourceThe Bitbag`                                                                                     NA
## `SourceThe Boar`                                                                                       NA
## `SourceThe Bolton News`                                                                                NA
## `SourceThe Bookseller`                                                                                 NA
## `SourceThe Bookseller (blog)`                                                                          NA
## `SourceThe Border Mail`                                                                                NA
## `SourceThe Borneo Post`                                                                                NA
## `SourceThe Boston Globe`                                                                               NA
## `SourceThe Bottom Line`                                                                                NA
## `SourceThe Bournemouth Daily Echo`                                                                     NA
## `SourceThe Bozeman Daily Chronicle`                                                                    NA
## `SourceThe Bradford Era`                                                                               NA
## `SourceThe Brantford Expositor`                                                                        NA
## `SourceThe BRICS Post`                                                                                 NA
## `SourceThe Brown Daily Herald`                                                                         NA
## `SourceThe Brussels Times`                                                                             NA
## `SourceThe Bubble`                                                                                     NA
## `SourceThe Buffalo News`                                                                               NA
## `SourceThe Bulletin`                                                                                   NA
## `SourceThe Business of Fashion`                                                                        NA
## `SourceTHE BUSINESS TIMES`                                                                             NA
## `SourceThe Business Times Singapore`                                                                   NA
## `SourceThe Cairo Review of Global Affairs (blog)`                                                      NA
## `SourceThe California Aggie`                                                                           NA
## `SourceThe Cambodia Daily`                                                                             NA
## `SourceThe Cameron Herald`                                                                             NA
## `SourceThe Canadian Press via Yahoo Canada Finance`                                                 1.000
## `SourceThe Canadian Press via Yahoo Canada News`                                                       NA
## `SourceThe Canadian Press via Yahoo Canada Sports`                                                     NA
## `SourceThe Canberra Times`                                                                             NA
## `SourceThe Canton Repository`                                                                          NA
## `SourceThe Capital Journal`                                                                            NA
## `SourceThe Capitol Fax Blog (blog)`                                                                    NA
## `SourceThe Car Connection`                                                                             NA
## `SourceThe Cerbat Gem`                                                                                 NA
## `SourceThe Charleston Gazette`                                                                         NA
## `SourceThe Charlotte Post`                                                                             NA
## `SourceThe Chattanoogan`                                                                               NA
## `SourceThe Cheat Sheet`                                                                                NA
## `SourceThe Cherokeean Herald`                                                                          NA
## `SourceThe Chicago Maroon`                                                                             NA
## `SourceThe Chicago Monitor`                                                                            NA
## `SourceThe Christian Post`                                                                             NA
## `SourceThe Christian Science Monitor`                                                                  NA
## `SourceThe Christian Times`                                                                            NA
## `SourceThe Chronicle-Journal`                                                                          NA
## `SourceThe Chronicle-Telegram`                                                                         NA
## `SourceThe Chronicle Herald`                                                                           NA
## `SourceThe Chronicle Journal`                                                                          NA
## `SourceThe Citizen`                                                                                    NA
## `SourceThe Citizens&#39; Voice`                                                                        NA
## `SourceThe Climate Group`                                                                              NA
## `SourceThe Climate Group (blog)`                                                                       NA
## `SourceThe Coast`                                                                                      NA
## `SourceThe Coast Halifax`                                                                              NA
## `SourceThe Coldwater Daily Reporter`                                                                   NA
## `SourceThe College Fix`                                                                                NA
## `SourceThe Colorado Independent`                                                                       NA
## `SourceThe Coloradoan`                                                                                 NA
## `SourceThe Columbian`                                                                                  NA
## `SourceThe Commercial Dispatch`                                                                        NA
## `SourceThe Compass`                                                                                    NA
## `SourceThe Concordian (subscription)`                                                                  NA
## `SourceThe Connecticut College Voice`                                                                  NA
## `SourceThe Connexion`                                                                                  NA
## `SourceThe Conroe Courier`                                                                             NA
## `SourceThe Consumerist`                                                                                NA
## `SourceThe Conversation AU`                                                                            NA
## `SourceThe Conversation UK`                                                                            NA
## `SourceThe Conversation US`                                                                            NA
## `SourceThe Conversation via Yahoo!7 Finance`                                                           NA
## `SourceThe Copenhagen Post - Danish news in english`                                                   NA
## `SourceThe Corner Economic`                                                                            NA
## `SourceThe Cornishman`                                                                                 NA
## `SourceThe Courier`                                                                                    NA
## `SourceThe Courier-Journal`                                                                            NA
## `SourceThe Courier Life News`                                                                          NA
## `SourceThe Courier Mail`                                                                               NA
## `SourceThe CT Mirror`                                                                                  NA
## `SourceThe Cubic Lane`                                                                                 NA
## `SourceThe Daily Advertiser`                                                                           NA
## `SourceThe Daily Banter`                                                                               NA
## `SourceThe Daily Breeze`                                                                               NA
## `SourceThe Daily Buzz via Yahoo Canada News`                                                           NA
## `SourceThe Daily Collegian Online`                                                                     NA
## `SourceThe Daily Comet`                                                                                NA
## `SourceThe Daily Cougar`                                                                               NA
## `SourceThe Daily Courier`                                                                              NA
## `SourceThe Daily Dot`                                                                                  NA
## `SourceThe Daily Free Press`                                                                           NA
## `SourceThe Daily Freeman`                                                                              NA
## `SourceThe Daily Gazette`                                                                              NA
## `SourceThe Daily Herald (press release)`                                                               NA
## `SourceThe Daily Mercury`                                                                              NA
## `SourceThe Daily Mining Gazette`                                                                       NA
## `SourceThe Daily News Journal`                                                                         NA
## `SourceThe Daily News of Newburyport`                                                                  NA
## `SourceThe Daily Pennsylvanian`                                                                        NA
## `SourceThe Daily Progress`                                                                             NA
## `SourceThe Daily Reckoning`                                                                            NA
## `SourceThe Daily Record`                                                                               NA
## `SourceThe Daily Reflector`                                                                            NA
## `SourceThe Daily Star`                                                                                 NA
## `SourceThe Daily Voice`                                                                                NA
## `SourceThe Daily Vox (blog)`                                                                           NA
## `SourceThe Daily World`                                                                                NA
## `SourceThe Day`                                                                                        NA
## `SourceThe Denver Channel`                                                                             NA
## `SourceThe Denver Post`                                                                                NA
## `SourceThe Denver Post (blog)`                                                                         NA
## `SourceThe Desert Sun`                                                                                 NA
## `SourceThe Detroit News`                                                                               NA
## `SourceThe Diane Rehm Show`                                                                            NA
## `SourceThe Dickinson Press`                                                                            NA
## `SourceThe Diplomat`                                                                                   NA
## `SourceThe Dismal Scientist (subscription)`                                                            NA
## `SourceThe Dominion Post`                                                                              NA
## `SourceThe Dorset Echo`                                                                                NA
## `SourceThe Drive`                                                                                      NA
## `SourceThe Drum`                                                                                       NA
## `SourceThe Durango Herald`                                                                             NA
## `SourceThe Eagle Online`                                                                               NA
## `SourceThe Echo`                                                                                       NA
## `SourceThe Ecologist`                                                                                  NA
## `SourceThe Economic Times`                                                                             NA
## `SourceThe Economist`                                                                                  NA
## `SourceThe Economist (blog)`                                                                           NA
## `SourceThe Edge`                                                                                       NA
## `SourceThe Edge Markets`                                                                               NA
## `SourceThe Edge Markets MY`                                                                            NA
## `SourceThe Electronic Intifada`                                                                        NA
## `SourceThe Electronic Intifada (blog)`                                                                 NA
## `SourceThe Elkhart Truth`                                                                              NA
## `SourceThe Elkhart Truth (blog)`                                                                       NA
## `SourceThe Emory Wheel`                                                                                NA
## `SourceThe Epoch Times`                                                                                NA
## `SourceThe Escapist`                                                                                   NA
## `SourceThe Evening Sun`                                                                                NA
## `SourceThe Examiner`                                                                                   NA
## `SourceThe Exponent Telegram (press release) (registration)`                                           NA
## `SourceThe Express Tribune`                                                                            NA
## `SourceThe Express Tribune (blog)`                                                                     NA
## `SourceThe FADER`                                                                                      NA
## `SourceThe Fayetteville Observer`                                                                      NA
## `SourceThe Federalist`                                                                                 NA
## `SourceThe FINANCIAL`                                                                                  NA
## `SourceThe Financial Express via Yahoo! Finance India`                                                 NA
## `SourceThe Fiscal Times`                                                                               NA
## `SourceThe Fiscal Times via Yahoo UK & Ireland Finance`                                                NA
## `SourceThe Fiscal Times via Yahoo! Finance`                                                            NA
## `SourceThe Fiscal Times via Yahoo! New Zealand Finance`                                                NA
## `SourceThe Fiscal Times via Yahoo! News`                                                               NA
## `SourceThe Fiscal Times via Yahoo!7 Finance`                                                           NA
## `SourceThe Flagship`                                                                                   NA
## `SourceThe Flamborough Review (press release) (registration)`                                          NA
## `SourceThe Flinders News`                                                                              NA
## `SourceThe Fort Campbell Courier`                                                                      NA
## `SourceThe Forward`                                                                                    NA
## `SourceThe Fresno Bee`                                                                                 NA
## `SourceThe Gadgeteer`                                                                                  NA
## `SourceThe Gadsden Times`                                                                              NA
## `SourceThe Gainesville Times`                                                                          NA
## `SourceThe Garden City Telegram`                                                                       NA
## `SourceThe GATE`                                                                                       NA
## `SourceThe Gateway Online`                                                                             NA
## `SourceThe Gazette`                                                                                    NA
## `SourceThe Gazette  Western University's Student Newspaper`                                            NA
## `SourceThe Gazette: Eastern Iowa Breaking News and Headlines`                                          NA
## `SourceThe Gilmer Mirror`                                                                              NA
## `SourceThe Gleaner`                                                                                    NA
## `SourceThe Global Herald`                                                                              NA
## `SourceThe Globalist`                                                                                  NA
## `SourceThe Globe and Mail`                                                                             NA
## `SourceThe Globe and Mail (subscription)`                                                              NA
## `SourceThe Grio`                                                                                       NA
## `SourceThe Guardian`                                                                                   NA
## `SourceThe Guardian (Australia)`                                                                       NA
## `SourceThe Guardian (blog)`                                                                            NA
## `SourceThe Guardian Charlottetown`                                                                     NA
## `SourceThe Guardian Nigeria (satire) (press release) (blog)`                                           NA
## `SourceThe Guru Investor`                                                                              NA
## `SourceThe Hacked News`                                                                                NA
## `SourceThe Hamilton Journal News`                                                                      NA
## `SourceThe Hankyoreh`                                                                                  NA
## `SourceThe Hans India`                                                                                 NA
## `SourceThe Harvard Crimson`                                                                            NA
## `SourceThe Hazleton Standard-Speaker`                                                                  NA
## `SourceThe Heartland Institute`                                                                        NA
## `SourceThe Hechinger Report`                                                                           NA
## `SourceThe Heights`                                                                                    NA
## `SourceThe Henderson Daily News`                                                                       NA
## `SourceThe Hendersonville Times-News`                                                                  NA
## `SourceThe Herald`                                                                                     NA
## `SourceThe Herald-News`                                                                                NA
## `SourceThe Herald-Times (subscription)`                                                                NA
## `SourceThe Herald Bulletin`                                                                            NA
## `SourceThe Herald News`                                                                                NA
## `SourceThe Hereford Times`                                                                             NA
## `SourceThe Hill`                                                                                       NA
## `SourceThe Hill (blog)`                                                                                NA
## `SourceThe Hillsdale Daily News`                                                                       NA
## `SourceThe Hilltop News`                                                                               NA
## `SourceThe Hindu`                                                                                      NA
## `SourceThe Hollywood Reporter`                                                                         NA
## `SourceThe Hollywood Reporter via Yahoo! News`                                                         NA
## `SourceThe Hollywood Source`                                                                           NA
## `SourceThe Holmes Report`                                                                              NA
## `SourceThe Houma Courier`                                                                              NA
## `SourceThe Hub at Johns Hopkins`                                                                       NA
## `SourceThe Huffington Post`                                                                            NA
## `SourceThe Huffington Post UK`                                                                         NA
## `SourceThe Huntington News`                                                                            NA
## `SourceThe Independent`                                                                                NA
## `SourceThe Independent Florida Alligator`                                                              NA
## `SourceThe Indian Express`                                                                             NA
## `SourceThe Indian Express (blog)`                                                                      NA
## `SourceThe Indian Express via Yahoo! India News`                                                       NA
## `SourceThe Indian Panorama`                                                                            NA
## `SourceThe Indianapolis Star`                                                                          NA
## `SourceThe indy100`                                                                                    NA
## `SourceThe Inquirer`                                                                                   NA
## `SourceThe Inquisitr`                                                                                  NA
## `SourceThe Intelligencer / Wheeling News-Register`                                                     NA
## `SourceThe Intercept`                                                                                  NA
## `SourceThe Interpreter`                                                                                NA
## `SourceThe Irish Catholic`                                                                             NA
## `Sourcethe Irish News`                                                                                 NA
## `SourceThe Irish Times`                                                                                NA
## `SourceThe Irrawaddy News Magazine`                                                                    NA
## `SourceThe Ithaca Voice`                                                                               NA
## `SourceThe Jacksonville Daily News`                                                                    NA
## `SourceThe Japan News`                                                                                 NA
## `SourceThe Japan Times`                                                                                NA
## `SourceThe Jewish Journal of Greater Los Angeles`                                                      NA
## `SourceThe Jewish Press`                                                                               NA
## `SourceThe Jewish Press (blog)`                                                                        NA
## `SourceThe Jewish Standard`                                                                            NA
## `SourceThe Jewish Star`                                                                                NA
## `SourceThe Jewish Voice`                                                                               NA
## `SourceThe Jewish Week`                                                                                NA
## `SourceThe Journal`                                                                                    NA
## `SourceThe Journal News | LoHud.com`                                                                   NA
## `SourceThe Justice`                                                                                    NA
## `SourceThe Kansas City Star`                                                                           NA
## `SourceThe Keene Sentinel`                                                                             NA
## `SourceThe Killeen Daily Herald`                                                                       NA
## `SourceThe Kingston Whig-Standard`                                                                     NA
## `SourceThe Korea Herald`                                                                               NA
## `SourceThe Korea Observer`                                                                             NA
## `SourceThe Lakeland Ledger`                                                                            NA
## `SourceThe Lawton Constitution`                                                                        NA
## `SourceThe Lawyer`                                                                                     NA
## `SourceThe Lawyer (registration)`                                                                      NA
## `SourceThe Ledger`                                                                                     NA
## `SourceThe Lens`                                                                                       NA
## `SourceThe Libertarian Republic`                                                                       NA
## `SourceThe Link`                                                                                       NA
## `SourceThe Local`                                                                                      NA
## `SourceThe Local Denmark`                                                                              NA
## `SourceThe Local.ch`                                                                                   NA
## `SourceThe Local.de`                                                                                   NA
## `SourceThe Local.es`                                                                                   NA
## `SourceThe Local.fr`                                                                                   NA
## `SourceThe Local.it`                                                                                   NA
## `SourceThe Local.se`                                                                                   NA
## `SourceThe London News Review`                                                                         NA
## `SourceThe Longview News-Journal`                                                                      NA
## `SourceThe Louisville Cardinal`                                                                        NA
## `SourceThe Mac Observer`                                                                               NA
## `SourceThe Maitland Mercury`                                                                           NA
## `SourceThe Malay Mail Online via Yahoo! Singapore News`                                                NA
## `SourceThe Malaysian Insider`                                                                          NA
## `SourceThe Malaysian Insider via Yahoo! Singapore News`                                                NA
## `SourceThe Mancunion`                                                                                  NA
## `SourceThe Manila Times`                                                                               NA
## `SourceThe Marijuana Times`                                                                            NA
## `SourceThe Market Mogul`                                                                               NA
## `SourceThe Market Oracle`                                                                              NA
## `SourceThe Marshalltown`                                                                               NA
## `SourceThe Mary Sue`                                                                                   NA
## `SourceThe Mass Media`                                                                                 NA
## `SourceThe Massachusetts Daily Collegian`                                                              NA
## `SourceThe McDowell News`                                                                              NA
## `SourceThe McGill International Review`                                                                NA
## `SourceThe Mckeesport Daily News`                                                                      NA
## `SourceThe Media Line`                                                                                 NA
## `SourceThe Medina County Gazette`                                                                      NA
## `SourceThe Memo`                                                                                       NA
## `SourceThe Memphis Daily News`                                                                         NA
## `SourceThe Mercury`                                                                                    NA
## `SourceThe Mercury News`                                                                               NA
## `SourceThe Merkle (blog)`                                                                              NA
## `SourceThe MetroWest Daily News`                                                                       NA
## `SourceThe Michigan Daily`                                                                             NA
## `SourceThe Milpitas Post`                                                                              NA
## `SourceThe Minnesota Daily`                                                                            NA
## `SourceThe Mission City Record`                                                                        NA
## `SourceThe Missoulian`                                                                                 NA
## `SourceThe MIT Tech`                                                                                   NA
## `SourceThe Moderate Voice`                                                                             NA
## `SourceThe Moose Jaw Times Herald`                                                                     NA
## `SourceThe Morganton News Herald`                                                                      NA
## `SourceThe Morning Call`                                                                               NA
## `SourceThe Moscow Times`                                                                               NA
## `SourceThe Moscow Times (registration)`                                                                NA
## `SourceThe Motley Fool`                                                                                NA
## `SourceThe Motley Fool Canada`                                                                         NA
## `SourceThe Muslim News`                                                                                NA
## `SourceThe Narco News Bulletin`                                                                        NA
## `SourceThe Nashua Telegraph`                                                                           NA
## `SourceThe Nation`                                                                                     NA
## `SourceThe Nation - Thailand&#39;s English news`                                                    1.000
## `SourceThe Nation (blog)`                                                                              NA
## `SourceThe Nation Newspaper`                                                                           NA
## `SourceThe Nation.`                                                                                    NA
## `SourceThe Nation. (blog)`                                                                             NA
## `SourceThe National`                                                                                   NA
## `SourceThe National Business Review`                                                                   NA
## `SourceThe National Enquirer`                                                                          NA
## `SourceThe National Interest Online`                                                                   NA
## `SourceThe National Interest Online (blog)`                                                            NA
## `SourceThe National Law Review`                                                                        NA
## `SourceThe National Memo (blog)`                                                                       NA
## `SourceThe Native American Times`                                                                      NA
## `SourceThe Nelson Mail`                                                                                NA
## `SourceThe Neosho Daily News`                                                                          NA
## `SourceThe New American`                                                                               NA
## `SourceThe New Canaan News`                                                                            NA
## `SourceThe New Civil Rights Movement`                                                                  NA
## `SourceThe New Daily`                                                                                  NA
## `SourceThe New Indian Express`                                                                         NA
## `SourceThe New Mexico Daily Lobo`                                                                      NA
## `SourceThe New Orleans Advocate`                                                                       NA
## `SourceThe New School News (blog)`                                                                     NA
## `SourceThe New Statesman`                                                                              NA
## `SourceThe New Times`                                                                                  NA
## `SourceThe New York Observer`                                                                          NA
## `SourceThe New York Review of Books`                                                                   NA
## `SourceThe New Yorker`                                                                                 NA
## `SourceThe New Yorker (satire)`                                                                        NA
## `SourceThe New Zealand Herald`                                                                         NA
## `SourceThe News`                                                                                       NA
## `SourceThe News-Press`                                                                                 NA
## `SourceThe News-Times`                                                                                 NA
## `SourceThe News & Observer`                                                                            NA
## `SourceThe News Center`                                                                                NA
## `SourceThe News Herald`                                                                                NA
## `SourceThe News Hub`                                                                                   NA
## `SourceThe News International`                                                                         NA
## `SourceThe News Journal`                                                                               NA
## `SourceThe News Minute`                                                                                NA
## `SourceThe News Tribune`                                                                               NA
## `SourceThe News Tribune (blog)`                                                                        NA
## `SourceThe Next Digit`                                                                                 NA
## `SourceThe Next Silicon Valley`                                                                        NA
## `SourceThe Next Web`                                                                                   NA
## `SourceThe Nonprofit Quarterly (blog)`                                                                 NA
## `SourceThe Nordic Page`                                                                                NA
## `SourceThe North Bay Nugget`                                                                           NA
## `SourceThe Northern Echo (registration)`                                                               NA
## `SourceThe Northwest Florida Daily News`                                                               NA
## `SourceThe Oakland Press`                                                                              NA
## `SourceThe Oberlin Review`                                                                             NA
## `SourceThe Observer-Dispatch`                                                                          NA
## `SourceThe Oceanside Post`                                                                             NA
## `SourceThe Oklahoma Daily`                                                                             NA
## `SourceThe Olympian`                                                                                   NA
## `SourceThe Onion (satire)`                                                                             NA
## `SourceThe Orator`                                                                                     NA
## `SourceThe Oshkosh Northwestern`                                                                       NA
## `SourceThe Ottawa Times`                                                                               NA
## `SourceThe Oxford Times`                                                                               NA
## `SourceThe Palm Beach Post`                                                                            NA
## `SourceThe Panther`                                                                                    NA
## `SourceThe Pappas Post`                                                                                NA
## `SourceThe Pasadena Star-News`                                                                         NA
## `SourceThe Peak`                                                                                       NA
## `SourceThe People's Voice`                                                                             NA
## `SourceThe Philadelphia Inquirer`                                                                      NA
## `SourceThe Players Tribune`                                                                            NA
## `SourceThe Point Review`                                                                               NA
## `SourceThe Portugal News`                                                                              NA
## `SourceThe Post`                                                                                       NA
## `SourceThe Post and Courier`                                                                           NA
## `SourceThe Predictive Analytics Times`                                                                 NA
## `SourceThe Press`                                                                                      NA
## `SourceThe Press-Enterprise`                                                                           NA
## `SourceThe Prince Albert Daily Herald`                                                                 NA
## `SourceThe Progressive Pulse`                                                                          NA
## `SourceThe Providence Journal`                                                                         NA
## `SourceThe Province`                                                                                   NA
## `SourceThe Province - BC - Victoria`                                                                   NA
## `SourceThe Punch`                                                                                      NA
## `SourceThe Queensland Times`                                                                           NA
## `SourceThe Rancher`                                                                                    NA
## `SourceThe Randolph County Herald-Tribune`                                                             NA
## `SourceThe Real News Network`                                                                          NA
## `SourceThe Real News Network (blog)`                                                                   NA
## `SourceThe Rebel`                                                                                      NA
## `SourceThe Record`                                                                                     NA
## `SourceThe Record (New Westminster)`                                                                   NA
## `SourceThe Recorder`                                                                                   NA
## `SourceThe Register`                                                                                1.000
## `SourceThe Register-Guard`                                                                             NA
## `SourceThe Republic`                                                                                   NA
## `SourceThe Review`                                                                                     NA
## `SourceThe Ridgefield Press`                                                                           NA
## `SourceThe Ringer (blog)`                                                                              NA
## `SourceThe Rio Times`                                                                                  NA
## `SourceThe Robesonian`                                                                                 NA
## `SourceThe Rock Hill Herald`                                                                           NA
## `SourceThe Root`                                                                                       NA
## `SourceThe Root (blog)`                                                                                NA
## `SourceThe Rude Baguette`                                                                              NA
## `SourceThe Rushville Republican`                                                                       NA
## `SourceThe Russellville Courier`                                                                       NA
## `SourceThe Sacramento Bee`                                                                             NA
## `SourceThe Salem News`                                                                                 NA
## `SourceThe Salinas Californian`                                                                        NA
## `SourceThe Salt Lake Tribune`                                                                          NA
## `SourceThe San Diego Union-Tribune`                                                                    NA
## `SourceThe San Gabriel Valley Tribune`                                                                 NA
## `SourceThe San Luis Obispo Tribune`                                                                    NA
## `SourceThe Sarasota Herald-Tribune`                                                                    NA
## `SourceThe Saratogian`                                                                                 NA
## `SourceThe Scotsman`                                                                                   NA
## `SourceThe Scranton Times-Tribune`                                                                     NA
## `SourceThe Seattle Times`                                                                              NA
## `SourceThe Sheboygan Press`                                                                            NA
## `SourceThe Shillong Times`                                                                             NA
## `SourceThe Siasat Daily`                                                                               NA
## `SourceThe Simcoe Reformer`                                                                            NA
## `SourceThe Siver Times`                                                                                NA
## `SourceThe Skanner`                                                                                    NA
## `SourceThe Slovak Spectator`                                                                           NA
## `SourceThe Sofia Globe`                                                                                NA
## `SourceThe Source`                                                                                     NA
## `SourceThe Southern`                                                                                   NA
## `SourceThe Southland Times`                                                                            NA
## `SourceThe Spinoff`                                                                                    NA
## `SourceThe Spokesman-Review`                                                                           NA
## `SourceThe Spokesman Review (registration)`                                                            NA
## `SourceThe Stack`                                                                                      NA
## `SourceThe Standard`                                                                                   NA
## `SourceThe Standard Digital News (press release) (blog)`                                               NA
## `SourceThe Standard Digital News (satire) (press release) (registration) (blog)`                       NA
## `Sourcethe star`                                                                                       NA
## `SourceThe Star`                                                                                       NA
## `SourceThe Star-Ledger`                                                                                NA
## `SourceThe Star Online`                                                                                NA
## `SourceThe Star, Kenya`                                                                                NA
## `SourceThe State`                                                                                      NA
## `SourceThe State (blog)`                                                                               NA
## `SourceThe State Journal-Register`                                                                     NA
## `SourceThe State News`                                                                                 NA
## `SourceThe Statesman`                                                                                  NA
## `SourceThe Straits Times`                                                                              NA
## `SourceThe Sudbury Star`                                                                               NA
## `SourceThe Sun`                                                                                        NA
## `SourceThe Sun Daily`                                                                                  NA
## `SourceThe Sun Herald`                                                                                 NA
## `SourceThe Sunday Business Post`                                                                       NA
## `SourceThe Sunday Post`                                                                                NA
## `SourceThe Sunday Times`                                                                               NA
## `SourceThe Sunday Times Sri Lanka`                                                                     NA
## `SourceThe Sunshine Coast Daily`                                                                       NA
## `SourceThe Swedish Wire`                                                                               NA
## `SourceThe Sydney Morning Herald`                                                                      NA
## `SourceThe Tablet`                                                                                     NA
## `SourceThe Takeaway (blog)`                                                                            NA
## `SourceThe Tampa  Tribune`                                                                             NA
## `SourceThe Tand D.com`                                                                                 NA
## `SourceThe Tech Portal`                                                                                NA
## `SourceThe Tech Report, LLC`                                                                           NA
## `SourceThe Tech Report, LLC (blog)`                                                                    NA
## `SourceThe TechNews`                                                                                   NA
## `SourceThe Telegram`                                                                                   NA
## `SourceThe Telegraph`                                                                                  NA
## `SourceThe Temple News`                                                                                NA
## `SourceThe Tennessean`                                                                                 NA
## `SourceThe Tico Times`                                                                                 NA
## `SourceThe Tidings`                                                                                    NA
## `SourceThe Times (subscription)`                                                                       NA
## `SourceThe Times and Democrat`                                                                         NA
## `SourceThe Times of India`                                                                             NA
## `SourceThe Times of Isra\\u009d\\u009dl`                                                               NA
## `SourceThe Times of Israel`                                                                            NA
## `SourceThe Times of Israël`                                                                            NA
## `SourceThe Times of Israel (blog)`                                                                     NA
## `SourceThe Toledo Blade`                                                                               NA
## `SourceThe Trace`                                                                                      NA
## `SourceThe Tribune`                                                                                    NA
## `SourceThe Trinidad Guardian`                                                                          NA
## `SourceThe Truro Daily News`                                                                           NA
## `SourceThe Tuscaloosa News`                                                                            NA
## `SourceThe Tyee`                                                                                       NA
## `SourceThe UCSD Guardian Online`                                                                       NA
## `SourceThe Ulster Herald`                                                                              NA
## `SourceThe Undefeated`                                                                                 NA
## `SourceThe Union Leader`                                                                               NA
## `SourceThe Union of Grass Valley`                                                                      NA
## `SourceThe Uniontown Herald Standard`                                                                  NA
## `SourceThe University of Hawaii Kaleo`                                                                 NA
## `SourceThe Unofficial Apple Weblog`                                                                    NA
## `SourceThe VAR Guy`                                                                                    NA
## `SourceThe Verge`                                                                                      NA
## `SourceThe Verge via Yahoo Canada News`                                                                NA
## `SourceThe Verge via Yahoo! News`                                                                   1.000
## `SourceThe Vermilion`                                                                                  NA
## `SourceThe Vermont Standard`                                                                           NA
## `SourceThe Victoria Advocate`                                                                          NA
## `SourceThe Vista Voice`                                                                                NA
## `SourceThe Voice Herald (blog)`                                                                        NA
## `SourceThe Voice Observer (blog)`                                                                      NA
## `SourceThe Voice of Millions`                                                                          NA
## `SourceThe Wahpeton Daily News`                                                                        NA
## `SourceThe Wall Street Journal`                                                                    <2e-16
## `SourceThe Wall Street Journal via Yahoo Canada Finance`                                               NA
## `SourceThe Wall Street Journal via Yahoo UK & Ireland Finance`                                         NA
## `SourceThe Wall Street Journal via Yahoo! Finance`                                                     NA
## `SourceThe Wall Street Journal via Yahoo! Finance India`                                               NA
## `SourceThe Wall Street Journal via Yahoo! New Zealand Finance`                                         NA
## `SourceThe Wall Street Journal via Yahoo! News`                                                        NA
## `SourceThe Wall Street Journal via Yahoo!7 Finance`                                                    NA
## `SourceThe Washington Times`                                                                           NA
## `SourceThe Wayne Independent`                                                                          NA
## `SourceThe Weather Channel`                                                                            NA
## `SourceThe Weather Network`                                                                            NA
## `SourceThe Weed Blog (blog)`                                                                           NA
## `SourceThe Week Magazine`                                                                              NA
## `SourceThe Week UK`                                                                                    NA
## `SourceThe Weekly Standard`                                                                            NA
## `SourceThe Weekly Standard (blog)`                                                                     NA
## `SourceThe Wesleyan Argus`                                                                             NA
## `SourceThe West Australian`                                                                            NA
## `SourceThe West Australian via Yahoo!7 News`                                                           NA
## `SourceThe Westerly Sun`                                                                               NA
## `SourceThe Whistler`                                                                                   NA
## `SourceThe White House`                                                                                NA
## `SourceThe White House (blog)`                                                                         NA
## `SourceThe Wire`                                                                                       NA
## `SourceThe Worldfolio`                                                                                 NA
## `SourceThe Wrap via Yahoo Celebrity`                                                                   NA
## `SourceThe Youngstown Vindicator`                                                                      NA
## `SourceThe Yucatan Times`                                                                              NA
## `SourceThe Zimbabwe Standard`                                                                          NA
## `SourceThe Zimbabwean`                                                                                 NA
## SourceTheBlaze.com                                                                                     NA
## SourceTheCable                                                                                         NA
## SourceTheChronicleHerald.ca                                                                            NA
## SourceTheCork.ie                                                                                       NA
## SourceThefairfieldrecorder                                                                             NA
## SourceThegardenisland.com                                                                              NA
## SourceTheHorse.com                                                                                     NA
## `SourceTheHostingNews.com (press release) (blog)`                                                      NA
## SourceThehour.com                                                                                      NA
## Sourcetheifp.ca                                                                                        NA
## Sourcethejournal.ie                                                                                    NA
## `SourceTheJournal.ie via Yahoo UK & Ireland Finance`                                                   NA
## `SourceTheJournal.ie via Yahoo UK & Ireland News`                                                      NA
## SourceThelakeandeswave                                                                                 NA
## Sourcethenews.pl                                                                                       NA
## SourceTheParliamentMagazine.eu                                                                         NA
## SourceThePoultrySite.com                                                                               NA
## Sourcethepridela.com                                                                                   NA
## SourceTheSouthAfrican                                                                                  NA
## SourceTheSportsCampus.com                                                                              NA
## SourceTheStranger.com                                                                                  NA
## `SourceTheStranger.com (blog)`                                                                         NA
## SourceTheStreet.com                                                                                 1.000
## SourceTheTower.org                                                                                     NA
## SourcetheTrumpet.com                                                                                   NA
## SourceTheTyee.ca                                                                                       NA
## SourceThevillagessuntimes                                                                              NA
## SourceTheWrap                                                                                          NA
## SourceThinkAdvisor                                                                                     NA
## SourceThinkProgress                                                                                    NA
## `SourceThird Sector`                                                                                   NA
## `SourceThis is Bristol`                                                                                NA
## `SourceThis is Money`                                                                                  NA
## `SourceThis Is Money`                                                                                  NA
## `SourceThis is Oxfordshire`                                                                            NA
## `SourceTHISDAY Live`                                                                                   NA
## `SourceThomas Reuters Fondation`                                                                       NA
## SourceThomasNet                                                                                    <2e-16
## `SourceThomson Reuters Foundation`                                                                     NA
## `SourceThomson Reuters StreetEvents via Yahoo! Finance`                                                NA
## SourceThreatpost                                                                                       NA
## `SourceThurrott.com (blog)`                                                                            NA
## SourceTHV11.com                                                                                        NA
## `SourceTickerTV News (press release)`                                                                  NA
## SourceTidBITS                                                                                          NA
## `SourceTimaru Herald`                                                                                  NA
## SourceTIME                                                                                             NA
## `SourceTime Magazine`                                                                               1.000
## `SourceTimes Colonist`                                                                                 NA
## `SourceTimes Daily`                                                                                    NA
## `SourceTimes Higher Education (THE)`                                                                   NA
## `SourceTimes Leader`                                                                                   NA
## `SourceTimes LIVE`                                                                                     NA
## `SourceTimes News`                                                                                     NA
## `SourceTimes Now.tv`                                                                                   NA
## `SourceTimes of India`                                                                                 NA
## `SourceTimes of India (blog)`                                                                          NA
## `SourceTimes of Malta`                                                                                 NA
## `SourceTimes of Malta (blog)`                                                                          NA
## `SourceTimes of Oman`                                                                                  NA
## `SourceTimes Record`                                                                                   NA
## `SourceTimes Record (subscription)`                                                                    NA
## `SourceTimes Record News`                                                                              NA
## SourceTimesonline.com                                                                                  NA
## `SourceTimmins Press`                                                                                  NA
## SourceTMZ.com                                                                                          NA
## SourceTnooz                                                                                            NA
## `SourceToday's Zaman`                                                                                  NA
## `SourceToday in Bermuda`                                                                               NA
## SourceToday.com                                                                                        NA
## SourceTODAY.ng                                                                                         NA
## SourceTODAYonline                                                                                      NA
## `SourceToledo Blade`                                                                                   NA
## `SourceToledo News Now`                                                                                NA
## `SourceTom's Guide`                                                                                    NA
## `SourceTom's Hardware`                                                                                 NA
## `SourceToowoomba Chronicle`                                                                            NA
## `SourceTop Tech News`                                                                                  NA
## `SourceTopeka Capital Journal`                                                                         NA
## `SourceTopsail Voice`                                                                                  NA
## `SourceToronto Star`                                                                                   NA
## `SourceToronto Sun`                                                                                    NA
## `SourceTorque News`                                                                                    NA
## SourceTorrentFreak                                                                                     NA
## `SourceTouch Arcade`                                                                                   NA
## `SourceToward Freedom`                                                                                 NA
## SourceTowleroad                                                                                        NA
## `SourceTown Hall`                                                                                      NA
## `SourceTownsville Bulletin`                                                                            NA
## SourceTPM                                                                                              NA
## `SourceTPM (blog)`                                                                                     NA
## `SourceTrade Arabia`                                                                                   NA
## `SourceTrade Calls`                                                                                    NA
## `SourceTrades Union Congress`                                                                          NA
## SourceTradingFloor.com                                                                                 NA
## `SourceTrak.in (blog)`                                                                                 NA
## `SourceTransport Topics Online`                                                                        NA
## `SourceTravel Daily News International`                                                                NA
## `SourceTravel Weekly`                                                                                  NA
## `SourceTravel+Leisure`                                                                                 NA
## SourceTravelersToday                                                                                   NA
## `SourceTravelGBI (press release) (blog)`                                                               NA
## SourceTraveller                                                                                        NA
## `SourceTraverse City Record Eagle`                                                                     NA
## SourceTravolution                                                                                      NA
## SourceTreehugger                                                                                       NA
## SourceTrefis                                                                                           NA
## `SourceTrend News Agency`                                                                              NA
## `SourceTri-City Herald`                                                                                NA
## `SourceTri County Leader`                                                                              NA
## `SourceTriad Business Journal (blog)`                                                                  NA
## `SourceTriangle Business Journal`                                                                      NA
## `SourceTribune-Review`                                                                                 NA
## SourceTrinicenter.com                                                                                  NA
## `SourceTrinidad & Tobago Express`                                                                      NA
## `SourceTrinidad Guardian`                                                                              NA
## `SourceTriple Pundit (registration) (blog)`                                                            NA
## SourceTristatehomepage.com                                                                             NA
## `SourceTriValley Central`                                                                              NA
## `SourceTRT World`                                                                                      NA
## SourceTruckingInfo.com                                                                                 NA
## SourceTrueAchievements                                                                                 NA
## SourceTRUNEWS                                                                                          NA
## SourceTrustedReviews                                                                                   NA
## `SourceTruth-Out`                                                                                      NA
## `SourceTruth In Media`                                                                                 NA
## SourceTruthdig                                                                                         NA
## `SourceTSA - Tout Sur l'Alg\\u009d\\u009drie`                                                          NA
## `SourceTucson News Now`                                                                                NA
## `SourceTucson Weekly`                                                                                  NA
## SourceTudocelular.com                                                                                  NA
## `SourceTufts Daily`                                                                                    NA
## `SourceTulsa World`                                                                                    NA
## `SourceTunisia Live`                                                                                   NA
## `SourceTuoitrenews (press release)`                                                                    NA
## `SourceTurkish Review`                                                                                 NA
## `SourceTuscaloosa News (subscription)`                                                                 NA
## `SourceTV Guide (blog)`                                                                                NA
## `SourceTV Newsroom`                                                                                    NA
## `SourceTV Technology`                                                                                  NA
## SourceTVbytheNumbers                                                                                   NA
## SourceTVLine                                                                                           NA
## SourceTVNewser                                                                                         NA
## SourceTVNZ                                                                                             NA
## SourceTVPredictions.com                                                                                NA
## `SourceTWC News`                                                                                       NA
## `SourceTWCN Tech News (blog)`                                                                          NA
## SourceTweakTown                                                                                        NA
## SourceTwice                                                                                            NA
## `SourceTwin Falls Times-News`                                                                          NA
## `SourceTwinCities.com-Pioneer Press`                                                                   NA
## SourceTwinfinite                                                                                       NA
## `SourceTwitchFilm (blog)`                                                                              NA
## SourceTwitchy                                                                                          NA
## SourceTwoCircles.net                                                                                   NA
## `SourceTyler Morning Telegraph`                                                                        NA
## `SourceU-T San Diego`                                                                                  NA
## `SourceU of M News Service`                                                                            NA
## `SourceU.S. Department of Education (press release)`                                                   NA
## `SourceU.S. Department of Education (press release) (blog)`                                            NA
## `SourceU.S. EPA.gov (press release)`                                                                   NA
## `SourceU.S. News & World Report`                                                                       NA
## `SourceU.S. News & World Report (blog)`                                                                NA
## `SourceU.S.News & World Report via Yahoo! News`                                                        NA
## SourceU.TV                                                                                             NA
## SourceUbergizmo                                                                                        NA
## `SourceUC Davis`                                                                                       NA
## `SourceUC Los Angeles`                                                                                 NA
## `SourceUC Merced University News`                                                                      NA
## `SourceUCalgary News`                                                                                  NA
## `SourceUChicago News`                                                                                  NA
## `SourceUD Daily`                                                                                       NA
## `SourceUGA Today`                                                                                      NA
## `SourceUK Fundraising`                                                                                 NA
## `SourceUKNow (press release)`                                                                          NA
## `SourceUkraine Today`                                                                                  NA
## `SourceUloop News`                                                                                     NA
## `SourceUltimate-Guitar.Com`                                                                            NA
## Sourceummid.com                                                                                        NA
## `SourceUN Dispatch`                                                                                    NA
## `SourceUN News Centre`                                                                                 NA
## `SourceUncover California`                                                                             NA
## SourceUNCTAD                                                                                           NA
## `SourceUND The Dakota Student`                                                                         NA
## `SourceUndercurrent News`                                                                              NA
## `SourceUnion of Concerned Scientists`                                                                  NA
## `SourceUnionOracle.com (blog)`                                                                         NA
## `SourceUniontown Herald Standard`                                                                      NA
## `SourceUnited Nations`                                                                                 NA
## `SourceUniverse Today`                                                                                 NA
## `SourceUniversity Herald`                                                                              NA
## `SourceUniversity of Delaware`                                                                         NA
## `SourceUniversity of Delaware Review`                                                                  NA
## `SourceUniversity of St. Thomas Newsroom`                                                              NA
## `SourceUniversity of Virginia`                                                                         NA
## `SourceUniversity of Virginia The Cavalier Daily`                                                      NA
## `SourceUniversity World News`                                                                          NA
## `SourceUNM Newsroom`                                                                                   NA
## SourceUPI                                                                                              NA
## SourceUPI.com                                                                                          NA
## SourceUpperMichigansSource.com                                                                         NA
## SourceUPROXX                                                                                           NA
## `SourceUPROXX via Yahoo! News`                                                                         NA
## `SourceUPROXX via Yahoo! Sports`                                                                       NA
## SourceUpstart                                                                                          NA
## `SourceUpstate Business Journal`                                                                       NA
## `SourceUpstream Online`                                                                                NA
## SourceUpvoted                                                                                          NA
## SourceUpworthy                                                                                         NA
## `SourceUQ News`                                                                                        NA
## `SourceUrban Land`                                                                                     NA
## `SourceUrgent Communications`                                                                          NA
## `SourceUS 99.5`                                                                                        NA
## `SourceUS News & World Report`                                                                         NA
## `SourceUs Weekly`                                                                                      NA
## `SourceUS Weekly`                                                                                      NA
## `SourceUSA Today`                                                                                      NA
## `SourceUSA TODAY`                                                                                  <2e-16
## `SourceUSA TODAY College`                                                                              NA
## `SourceUSA TODAY High School Sports`                                                                   NA
## `SourceUSAPP American Politics and Policy (blog)`                                                      NA
## `SourceUSDA.gov (press release)`                                                                       NA
## `SourceUSDA.gov (press release) (blog)`                                                                NA
## `SourceUSgamer (satire) (registration) (blog)`                                                         NA
## `SourceUSNI News`                                                                                      NA
## `SourceuSwitch.com (Tech)`                                                                             NA
## `SourceUT The Daily Texan`                                                                             NA
## `SourceUTA The Shorthorn`                                                                              NA
## `SourceUtah Business`                                                                                  NA
## SourceUTDailyBeacon.com                                                                                NA
## `SourceUtility Dive`                                                                                   NA
## `SourceUtne Reader Online`                                                                             NA
## `SourceUTV Ireland`                                                                                    NA
## `SourceUTV Ireland (blog)`                                                                             NA
## Sourceuuworld.org                                                                                      NA
## `SourceUW Badger Herald`                                                                               NA
## `SourceUW Today`                                                                                       NA
## SourceV3.co.uk                                                                                         NA
## `SourceValdosta Daily Times`                                                                           NA
## `SourceValley Advocate`                                                                                NA
## `SourceValley morning Star`                                                                            NA
## `SourceValley News`                                                                                    NA
## `SourceValley News Live`                                                                               NA
## SourceValueWalk                                                                                        NA
## `SourceVancity Buzz`                                                                                   NA
## `SourceVancouver Sun`                                                                                  NA
## `SourceVancouver Sun (blog)`                                                                           NA
## SourceVanguard                                                                                         NA
## `SourceVanity Fair`                                                                                    NA
## SourceVariety                                                                                          NA
## `SourceVariety via Yahoo! Finance`                                                                  1.000
## `SourceVatican Radio`                                                                                  NA
## SourceVatorNews                                                                                        NA
## SourceVEJA.com                                                                                         NA
## SourceVenezuelanalysis.com                                                                             NA
## `SourceVentura County Star`                                                                            NA
## `SourceVenture Capital Post`                                                                           NA
## SourceVentureBeat                                                                                      NA
## `SourceVentures Africa`                                                                                NA
## SourceVentureVillage                                                                                   NA
## `SourceVenues Today`                                                                                   NA
## `SourceVera Files`                                                                                     NA
## `SourceVermont Public Radio`                                                                           NA
## SourceVG247                                                                                            NA
## SourceVibe                                                                                             NA
## `SourceVibe Magazine`                                                                                  NA
## SourceVICE                                                                                             NA
## `SourceVICE (blog)`                                                                                    NA
## `SourceVICE News`                                                                                      NA
## `SourceVictor Post`                                                                                    NA
## SourceVideogamer.com                                                                                   NA
## SourceVideoNewsUs                                                                                      NA
## `SourceViet Nam News`                                                                                  NA
## `SourceVietnam Plus`                                                                                   NA
## `SourceVietNamNet Bridge`                                                                              NA
## `SourceVillage Voice`                                                                                  NA
## `SourceVine Report`                                                                                    NA
## `SourceVineland Daily Journal`                                                                         NA
## `SourceVineyard Gazette`                                                                               NA
## `SourceVirgin Islands Daily News`                                                                      NA
## `SourceVirginia Gazette`                                                                               NA
## `SourceVirginian-Pilot`                                                                                NA
## `SourceVirtualization Review`                                                                          NA
## `SourceVirtualization Review (blog)`                                                                   NA
## `SourceVisionMobile (blog)`                                                                            NA
## SourceVnExpress                                                                                        NA
## `SourceVOA Khmer (English)`                                                                            NA
## `SourceVOA Learning English`                                                                           NA
## `SourceVOA News`                                                                                       NA
## `SourceVOA Ting Vit`                                                                                   NA
## `SourceVOA Zimbabwe`                                                                                   NA
## SourceVocativ                                                                                          NA
## SourceVOCM                                                                                             NA
## SourceVogue.co.uk                                                                                      NA
## SourceVogue.com                                                                                        NA
## `SourceVoice & Data Online`                                                                            NA
## `SourceVoice Chronicle`                                                                                NA
## `SourceVoice of America`                                                                               NA
## `SourceVoice of America (blog)`                                                                        NA
## `SourceVoice of San Diego`                                                                             NA
## Sourcevoiceofdetroit                                                                                   NA
## `SourceVoltaire Network`                                                                               NA
## SourceVox                                                                                              NA
## `SourceVR-Zone`                                                                                        NA
## `SourceVR World`                                                                                       NA
## SourceVRFocus                                                                                          NA
## Sourcevtdigger.org                                                                                     NA
## `SourceVulcan Post (press release)`                                                                    NA
## SourceVulture                                                                                          NA
## `SourceW*USA 9`                                                                                        NA
## `SourceWA today`                                                                                       NA
## `SourceWABC-TV`                                                                                        NA
## `SourceWABC-TV New York`                                                                               NA
## `SourceWABE 90.1 FM`                                                                                   NA
## SourceWACH.com                                                                                         NA
## `SourceWaco Tribune-Herald`                                                                            NA
## `SourceWAFA - Palestine News Agency`                                                                   NA
## SourceWAFF                                                                                             NA
## `SourceWAFF 48 News Huntsville`                                                                        NA
## `SourceWaging Nonviolence`                                                                             NA
## SourceWAGM                                                                                             NA
## `SourceWaikato Times`                                                                                  NA
## Sourcewajr                                                                                             NA
## `SourceWakefield Express`                                                                              NA
## `SourceWakey Wakey News`                                                                               NA
## `SourceWALB Albany`                                                                                    NA
## SourceWalesOnline                                                                                      NA
## `SourceWall Street 24`                                                                                 NA
## `SourceWall Street Daily`                                                                              NA
## `SourceWall Street Journal`                                                                            NA
## `SourceWall Street Journal (blog)`                                                                     NA
## `SourceWall Street Journal (subscription)`                                                             NA
## `SourceWall Street Journal (subscription) (blog)`                                                      NA
## `SourceWall Street Journal Blogs`                                                                      NA
## `SourceWall Street Pit`                                                                                NA
## `SourceWalla Walla Union-Bulletin`                                                                     NA
## SourceWaltonian                                                                                        NA
## SourceWAMC                                                                                             NA
## SourceWamda                                                                                            NA
## SourceWAND                                                                                             NA
## `SourceWandsworth Guardian`                                                                            NA
## SourceWANE                                                                                             NA
## SourceWAOW                                                                                             NA
## `SourceWAPT Jackson`                                                                                   NA
## SourceWarc                                                                                             NA
## `SourceWard's Auto`                                                                                    NA
## SourceWareable                                                                                         NA
## `SourceWarsaw Business Journal`                                                                        NA
## `SourceWashington Blade`                                                                               NA
## `SourceWashington Business Journal`                                                                    NA
## `SourceWashington City Paper`                                                                          NA
## `SourceWashington City Paper (blog)`                                                                   NA
## `SourceWashington Examiner`                                                                            NA
## `SourceWashington Free Beacon`                                                                         NA
## `SourceWashington Free Beacon (blog)`                                                                  NA
## `SourceWashington News Wire`                                                                           NA
## `SourceWashington Post`                                                                             1.000
## `SourceWashington Post (blog)`                                                                         NA
## `SourceWashington Times`                                                                               NA
## SourceWashingtonian.com                                                                                NA
## `SourceWaste Management World`                                                                         NA
## Sourcewaste360                                                                                         NA
## SourceWatchdog.org                                                                                     NA
## `SourceWATE 6 On Your Side`                                                                            NA
## `SourceWaterbury Republican American`                                                                  NA
## `SourceWaterloo Cedar Falls Courier`                                                                   NA
## `SourceWaterloo Record`                                                                                NA
## `SourceWatertown Daily Times`                                                                          NA
## SourceWatertownDailyTimes.com                                                                          NA
## `SourceWausau Daily Herald`                                                                            NA
## `SourceWAVE 3`                                                                                         NA
## `SourceWAVE 3 Louisville`                                                                              NA
## `SourceWAVY-TV`                                                                                        NA
## `SourceWaxahachie Daily Light`                                                                         NA
## `SourceWaynesville Daily Guide`                                                                        NA
## `SourceWBAL-TV Baltimore`                                                                              NA
## `SourceWBAL Baltimore`                                                                                 NA
## `SourceWBAL Radio`                                                                                     NA
## SourceWBAY                                                                                             NA
## SourceWBEZ                                                                                             NA
## `SourceWBEZ 91.5 Chicago`                                                                              NA
## SourceWBFO                                                                                             NA
## `SourceWBIR-TV`                                                                                        NA
## SourceWBIR.com                                                                                         NA
## `SourceWBNS-10TV Columbus`                                                                             NA
## `SourceWBOC TV 16`                                                                                     NA
## `SourceWBOY-TV`                                                                                        NA
## `SourceWBRC FOX6 News - WBRC.com`                                                                      NA
## SourceWBT                                                                                              NA
## SourceWBTV                                                                                             NA
## `SourceWBTV Charlotte`                                                                                 NA
## SourceWBUR                                                                                             NA
## `SourceWBUR Boston`                                                                                    NA
## SourceWBXH                                                                                             NA
## `SourceWCAV Charlottesville`                                                                           NA
## SourceWCAX                                                                                             NA
## `SourceWCAX-TV Vermont`                                                                                NA
## `SourceWCBD News 2`                                                                                    NA
## SourceWCCFtech                                                                                         NA
## `SourceWCCFtech (blog)`                                                                                NA
## SourceWCPO                                                                                             NA
## `SourceWCSH-TV`                                                                                        NA
## SourceWCSH6.com                                                                                        NA
## `SourceWCSM Radio`                                                                                     NA
## SourceWCTV                                                                                             NA
## `SourceWCVB Boston`                                                                                <2e-16
## SourceWCYB                                                                                             NA
## `SourceWDAM-TV`                                                                                        NA
## SourceWDAY                                                                                             NA
## SourceWDBJ7                                                                                            NA
## `SourceWDIV Detroit`                                                                                   NA
## SourceWDRB                                                                                             NA
## `SourceWDSU New Orleans`                                                                               NA
## SourceWDTN                                                                                             NA
## SourceWDTV                                                                                             NA
## `SourceWe Got This Covered`                                                                            NA
## `SourceWe Live Security (blog)`                                                                        NA
## `SourceWe Up It`                                                                                       NA
## SourceWeAreGreenBay.com                                                                                NA
## `SourceWeAreTheCity (press release) (blog)`                                                            NA
## SourceWeatherWatch.co.nz                                                                               NA
## SourceWEAU                                                                                             NA
## `SourceWEAU Eau Claire`                                                                                NA
## `SourceWeb Host Industry Review`                                                                       NA
## `SourceWeb India`                                                                                      NA
## SourceWebMD                                                                                            NA
## SourceWebProNews                                                                                       NA
## `SourceWebster Journal`                                                                                NA
## `SourceWECT-TV6`                                                                                       NA
## `SourceWECT 6 Wilmington`                                                                              NA
## `SourceWeekly Times Now`                                                                               NA
## `SourceWESH 2 Orlando`                                                                                 NA
## `SourceWESH Orlando`                                                                                   NA
## `SourceWest Central Tribune`                                                                           NA
## `SourceWest Virginia MetroNews`                                                                        NA
## `SourceWestern Advocate`                                                                               NA
## `SourceWestern Journalism`                                                                             NA
## `SourceWestern Morning News`                                                                           NA
## `SourceWestern Producer (subscription)`                                                                NA
## `SourceWestern Star`                                                                                   NA
## `SourceWestern Telegraph`                                                                              NA
## SourceWesternSlopeNow                                                                                  NA
## `SourceWestfair Online`                                                                                NA
## `SourceWestlaw Insider (blog)`                                                                         NA
## `SourceWestside Gazette`                                                                               NA
## `SourceWestside Today`                                                                                 NA
## `SourceWeyburn Review`                                                                                 NA
## SourceWFAA                                                                                             NA
## SourceWFAA.com                                                                                         NA
## SourceWFDD                                                                                             NA
## `SourceWFLX FOX 29`                                                                                    NA
## SourceWFMJ                                                                                             NA
## `SourceWFMJ Youngstown`                                                                                NA
## SourceWFMYNews2.com                                                                                    NA
## `SourceWFMZ Allentown`                                                                                 NA
## `SourceWFMZ Eastern Pennsylvania and Western New Jersey`                                               NA
## SourceWFSB                                                                                             NA
## `SourceWFTV Orlando`                                                                                   NA
## SourceWFXG.com                                                                                         NA
## `SourceWGAL 8 Susquehanna Valley`                                                                      NA
## `SourceWGBA-TV`                                                                                        NA
## SourceWGEM                                                                                             NA
## `SourceWGEM Quincy`                                                                                    NA
## SourceWGME                                                                                             NA
## `SourceWGN-TV`                                                                                         NA
## `SourceWGN Radio`                                                                                      NA
## `SourceWGN TV Chicago`                                                                                 NA
## SourceWGNO                                                                                             NA
## SourceWGRZ.com                                                                                         NA
## `SourceWHAS 11.com (subscription)`                                                                     NA
## SourceWHAS11.com                                                                                       NA
## SourceWhatCulture                                                                                      NA
## SourceWhaTech                                                                                          NA
## `SourceWHDH-TV`                                                                                        NA
## SourceWheels.ca                                                                                        NA
## `SourceWhich-50 (blog)`                                                                                NA
## `SourceWHIO-TV 7 Dayton`                                                                               NA
## `SourceWhite House Dossier`                                                                            NA
## `SourceWhitehorse Star (subscription)`                                                                 NA
## `SourceWhitehouse.gov (press release)`                                                                 NA
## `SourceWHNT-TV Huntsville`                                                                             NA
## Sourcewhnt.com                                                                                         NA
## `SourceWHO-TV 13 Des Moines`                                                                           NA
## Sourcewhotv.com                                                                                        NA
## `SourceWhoWhatWhy / RealNewsProject (blog)`                                                            NA
## SourceWHSV                                                                                             NA
## `SourceWhyalla News`                                                                                   NA
## `SourceWIAT 42`                                                                                        NA
## SourceWIBW                                                                                             NA
## `SourceWichita Eagle`                                                                                  NA
## `SourceWicked Local`                                                                                   NA
## `SourceWicked Local Natick`                                                                            NA
## `SourceWicked Local Wellesley`                                                                         NA
## SourceWIFR                                                                                             NA
## `SourceWIFR Rockford`                                                                                  NA
## Sourcewigantoday.net                                                                                   NA
## `SourceWii U Daily`                                                                                    NA
## SourceWikinews                                                                                         NA
## `SourceWillamette Week`                                                                                NA
## `SourceWilts and Gloucestershire Standard`                                                             NA
## `SourceWILX-TV`                                                                                        NA
## `SourceWILX 10 Lansing`                                                                                NA
## `SourceWINA AM 1070 (press release)`                                                                   NA
## SourceWinBeta                                                                                          NA
## `SourceWindows Central`                                                                                NA
## `SourceWindows IT Pro`                                                                                 NA
## `SourceWindows IT Pro (blog)`                                                                          NA
## `SourceWindows Report`                                                                                 NA
## `SourceWindowsItPro (subscription)`                                                                    NA
## `SourceWindowsItPro (subscription) (blog)`                                                             NA
## `SourceWindpower Engineering (press release)`                                                          NA
## `SourceWindsor Star`                                                                                   NA
## `SourceWink News`                                                                                      NA
## `SourceWinnipeg Free Press`                                                                            NA
## `SourceWinnipeg Sun`                                                                                   NA
## `SourceWinona Daily News`                                                                              NA
## `SourceWinston-Salem Chronicle`                                                                        NA
## `SourceWinston-Salem Journal`                                                                          NA
## SourceWIRED                                                                                            NA
## `SourceWired News`                                                                                  1.000
## `SourceWired UK`                                                                                       NA
## SourceWired.co.uk                                                                                      NA
## `SourceWireless Week`                                                                                  NA
## SourceWirtschaftsWoche                                                                                 NA
## `SourceWIS News 10 Columbia`                                                                           NA
## `SourceWISC-TV Madison`                                                                                NA
## `SourceWisconsin Gazette`                                                                              NA
## `SourceWisconsin Public Radio News`                                                                    NA
## `SourceWISH-TV`                                                                                        NA
## `SourceWISH-TV Indianapolis`                                                                           NA
## `SourceWISN 12 Milwaukee`                                                                              NA
## `SourceWISN Milwaukee`                                                                                 NA
## SourceWITN                                                                                             NA
## Sourcewivb.com                                                                                         NA
## `SourceWJBF-TV`                                                                                        NA
## SourceWJLA                                                                                             NA
## SourceWJTV                                                                                             NA
## `SourceWJXT Jacksonville`                                                                          <2e-16
## SourceWKBN.com                                                                                         NA
## `SourceWKBW-TV`                                                                                        NA
## SourceWKOW                                                                                             NA
## SourceWKRG                                                                                             NA
## `SourceWKRG News 5 Mobile`                                                                             NA
## `SourceWKSU News`                                                                                      NA
## `SourceWKYC-TV`                                                                                        NA
## SourceWKYT                                                                                             NA
## `SourceWLBT 3 Jackson`                                                                                 NA
## SourceWLBZ2.com                                                                                        NA
## Sourcewlfi.com                                                                                         NA
## `SourceWLKY Louisville`                                                                                NA
## SourceWLNS                                                                                             NA
## `SourceWLOX-TV Biloxi`                                                                                 NA
## SourceWLRN                                                                                             NA
## `SourceWLS-TV`                                                                                         NA
## `SourceWLWT-TV Cincinnati`                                                                             NA
## `SourceWLWT Cincinnati`                                                                                NA
## `SourceWMBD - FOX 43 Peoria`                                                                           NA
## `SourceWMBF News Myrtle Beach`                                                                         NA
## `SourceWMC Action News 5`                                                                              NA
## `SourceWMCTV Memphis`                                                                                  NA
## SourceWMPoweruser.com                                                                                  NA
## SourceWMTV                                                                                             NA
## `SourceWMTW Portland`                                                                                  NA
## `SourceWMUR Manchester`                                                                                NA
## `SourceWN Philippines`                                                                                 NA
## SourceWNAX                                                                                             NA
## SourceWNBA.com                                                                                         NA
## SourceWNCN                                                                                             NA
## SourceWNCT                                                                                             NA
## SourceWND.com                                                                                          NA
## `SourceWNDU-TV`                                                                                        NA
## `SourceWNEP 16 Pennsylvania`                                                                           NA
## Sourcewnep.com                                                                                         NA
## `SourceWNIJ and WNIU`                                                                                  NA
## SourceWNYC                                                                                             NA
## `SourceWNYC New York Public Radio`                                                                     NA
## SourceWNYT                                                                                             NA
## SourceWOAI                                                                                             NA
## SourceWOAI.com                                                                                         NA
## `SourceWonkette (satire) (blog)`                                                                       NA
## `SourceWoodstock Sentinel-Review`                                                                      NA
## SourceWOODTV.com                                                                                       NA
## `SourceWorcester Telegram`                                                                             NA
## `SourceWorkers World`                                                                                  NA
## SourceWorkpermit.com                                                                                   NA
## `SourceWorld Affairs (blog)`                                                                           NA
## `SourceWorld Bank Group`                                                                               NA
## `SourceWorld Bank Group (blog)`                                                                        NA
## `SourceWorld Fishing`                                                                                  NA
## `SourceWorld Highways`                                                                                 NA
## `SourceWorld Intellectual Property Review (subscription)`                                              NA
## `SourceWorld Nuclear News`                                                                             NA
## `SourceWorld Policy Institute (blog)`                                                                  NA
## `SourceWorld Politics Review`                                                                          NA
## `SourceWorld Socialist Web Site`                                                                       NA
## `SourceWorld Tribune`                                                                                  NA
## SourceWorldcrunch                                                                                      NA
## `SourceWorthing Herald`                                                                                NA
## `SourceWorthington Daily Globe`                                                                        NA
## `SourceWOWK-TV West Virginia`                                                                          NA
## SourceWOWT                                                                                             NA
## `SourceWPBF West Palm Beach`                                                                           NA
## SourceWPEC                                                                                             NA
## `SourceWPIX 11 New York`                                                                               NA
## `SourceWPRI 12 Eyewitness News`                                                                        NA
## SourceWPRO                                                                                             NA
## SourceWPTV.com                                                                                         NA
## SourceWPTZ                                                                                             NA
## `SourceWPTZ Burlington`                                                                                NA
## `SourceWPTZ The Champlain Valley`                                                                      NA
## `SourceWPVI-TV`                                                                                        NA
## `SourceWPVI – Philadelphia via Yahoo! News`                                                            NA
## `SourceWPVI 6abc Philadelphia`                                                                         NA
## `SourceWPXI Pittsburgh`                                                                                NA
## `SourceWQAD Moline`                                                                                    NA
## SourceWQAD.com                                                                                         NA
## `SourceWQOW Eau Claire`                                                                                NA
## `SourceWRAL Tech Wire`                                                                                 NA
## SourceWRAL.com                                                                                         NA
## SourceWRBL                                                                                             NA
## `SourceWRCB-TV`                                                                                        NA
## `SourceWRDW-TV`                                                                                        NA
## `SourceWREG-TV Memphis`                                                                                NA
## Sourcewreg.com                                                                                         NA
## SourceWrestlezone                                                                                      NA
## `SourceWREX-TV`                                                                                        NA
## SourceWRGB                                                                                             NA
## SourceWRIC                                                                                             NA
## `SourceWRTV Indianapolis`                                                                              NA
## `SourceWSAZ-TV`                                                                                        NA
## `SourceWSB Atlanta`                                                                                    NA
## `SourceWSBT-TV`                                                                                        NA
## SourceWSET                                                                                             NA
## `SourceWSFA 12 Montgomery`                                                                             NA
## SourceWSLS                                                                                             NA
## `SourceWSOC Charlotte`                                                                                 NA
## `SourceWSYM-TV`                                                                                        NA
## SourceWSYR                                                                                             NA
## `SourceWT VOX`                                                                                         NA
## `SourceWTAE-TV Pittsburgh`                                                                             NA
## `SourceWTAE Pittsburgh`                                                                                NA
## SourceWTAJ                                                                                             NA
## SourceWTAW                                                                                             NA
## SourceWTHR                                                                                             NA
## `SourceWTHR Indianapolis`                                                                           1.000
## `SourceWTKR Norfolk`                                                                                   NA
## Sourcewtkr.com                                                                                         NA
## SourceWTMA                                                                                             NA
## `SourceWTMJ-TV (press release) (registration) (blog)`                                                  NA
## `SourceWTMJ (press release) (subscription) (blog)`                                                     NA
## `SourceWTNH Connecticut News (press release)`                                                          NA
## SourceWTOC                                                                                             NA
## `SourceWTOC 11 Savannah`                                                                               NA
## SourceWTOK                                                                                             NA
## SourceWTOL.com                                                                                         NA
## SourceWTOP                                                                                             NA
## `SourceWTOV Steubenville`                                                                              NA
## `SourceWTSP 10 News`                                                                                   NA
## SourceWTSP.com                                                                                         NA
## `SourceWTTV CBS4Indy`                                                                                  NA
## SourceWTVA                                                                                             NA
## SourceWTVC                                                                                             NA
## `SourceWTVD-TV`                                                                                        NA
## SourceWTVM                                                                                             NA
## `SourceWTXL ABC 27`                                                                                    NA
## `SourceWUIS 91.9`                                                                                      NA
## SourceWUSA9.com                                                                                        NA
## SourceWVLT                                                                                             NA
## SourceWVTM13                                                                                           NA
## `SourceWVVA Bluefield`                                                                                 NA
## `SourceWVVA TV (registration)`                                                                         NA
## `SourceWWAY NewsChannel 3`                                                                             NA
## `SourceWWBT NBC12 News`                                                                                NA
## SourceWWD                                                                                              NA
## SourceWWL                                                                                              NA
## Sourcewwlp.com                                                                                         NA
## `SourceWWMT-TV`                                                                                        NA
## `SourceWWNY TV 7`                                                                                      NA
## `SourceWWSB ABC 7`                                                                                     NA
## Sourcewww.breakbulk.com                                                                                NA
## `Sourcewww.kingstonregion.com/`                                                                        NA
## Sourcewww.worldbulletin.net                                                                            NA
## `SourceWXIA-TV`                                                                                        NA
## `SourceWXII-TV Winston-Salem`                                                                          NA
## SourceWXIX                                                                                             NA
## `SourceWXOW 19 La Crosse`                                                                              NA
## `SourceWXXI News`                                                                                      NA
## SourceWXYZ                                                                                             NA
## `SourceWXYZ-TV Detroit`                                                                                NA
## `SourceWYFF 4 Greenville`                                                                              NA
## `SourceWyoming Business Report`                                                                        NA
## `SourceWyoming Tribune`                                                                                NA
## SourceWYTV                                                                                             NA
## `SourceWZZM 13 Grand Rapids`                                                                           NA
## SourceWZZM13.com                                                                                       NA
## `SourceXãLun.com tin tc vit nam 24h cp nht`                                                            NA
## SourceXconomy                                                                                          NA
## `SourceXDA Developers (blog)`                                                                          NA
## SourceXinhua                                                                                           NA
## SourceXXLMAG.COM                                                                                       NA
## `SourceYa Libnan`                                                                                      NA
## `SourceYahoo Autos`                                                                                    NA
## `SourceYahoo Canada Finance - Insight (blog)`                                                          NA
## `SourceYahoo Canada Sports (blog)`                                                                     NA
## `SourceYahoo Celebrity UK`                                                                             NA
## `SourceYahoo Finance`                                                                                  NA
## `SourceYahoo Finance UK`                                                                               NA
## `SourceYahoo Finance via Yahoo! Finance`                                                               NA
## `SourceYahoo Finance via Yahoo! News`                                                                  NA
## `SourceYahoo Food`                                                                                     NA
## `SourceYahoo Health`                                                                                   NA
## `SourceYahoo Katie Couric`                                                                             NA
## `SourceYahoo Movies (blog)`                                                                            NA
## `SourceYahoo Music`                                                                                    NA
## `SourceYahoo New Zealand via Yahoo! New Zealand News`                                                  NA
## `SourceYahoo New Zealand via Yahoo!7 News`                                                             NA
## `SourceYahoo News`                                                                                     NA
## `SourceYahoo News Canada (blog)`                                                                       NA
## `SourceYahoo News Digest`                                                                              NA
## `SourceYahoo News UK`                                                                                  NA
## `SourceYahoo News via Yahoo Canada News`                                                               NA
## `SourceYahoo News via Yahoo UK & Ireland News`                                                         NA
## `SourceYahoo News via Yahoo! News`                                                                     NA
## `SourceYahoo Parenting`                                                                                NA
## `SourceYahoo Politics`                                                                                 NA
## `SourceYahoo Singapore News`                                                                           NA
## `SourceYahoo Singapore on Tumblr via Yahoo! Singapore News`                                            NA
## `SourceYahoo Sports`                                                                                   NA
## `SourceYahoo Sports (blog)`                                                                            NA
## `SourceYahoo Tech`                                                                                     NA
## `SourceYahoo Tech via Yahoo! News`                                                                     NA
## `SourceYahoo Travel`                                                                                   NA
## `SourceYahoo TV (blog)`                                                                                NA
## `SourceYahoo! Maktoob News`                                                                            NA
## `SourceYahoo7 and Agencies via Yahoo! New Zealand News`                                                NA
## `SourceYahoo7 and Agencies via Yahoo!7 News`                                                           NA
## `SourceYahoo7 Finance via Yahoo!7 Finance`                                                             NA
## `SourceYahoo7 News`                                                                                    NA
## `SourceYakima Herald-Republic`                                                                         NA
## `SourceYale Environment 360`                                                                           NA
## `SourceYaleGlobal Online`                                                                              NA
## `SourceYarmouth County Vanguard`                                                                       NA
## `SourceYellowhammer News`                                                                              NA
## `SourceYeni \\u009d\\u009dafak English (press release)`                                                NA
## `SourceYES! Magazine`                                                                                  NA
## `SourceYeshiva World News`                                                                             NA
## `SourceYibada (English Edition)`                                                                       NA
## `SourceYIBADA English`                                                                                 NA
## `SourceYLE News`                                                                                       NA
## SourceYNaija                                                                                           NA
## SourceYnetnews                                                                                         NA
## `SourceYonhap News`                                                                                    NA
## `SourceYork Daily Record/Sunday News`                                                                  NA
## `SourceYork Dispatch`                                                                                  NA
## `SourceYork Press`                                                                                     NA
## SourceYorkRegion.com                                                                                   NA
## `SourceYorkshire Evening Post`                                                                         NA
## `SourceYorkshire Post`                                                                                 NA
## `SourceYorkton News Review`                                                                            NA
## `SourceYorkton This Week`                                                                              NA
## `SourceYorkton This Week (press release)`                                                              NA
## `SourceYouGov US`                                                                                      NA
## `SourceYoungstown Vindicator`                                                                          NA
## `SourceYour EDM`                                                                                       NA
## `SourceYour Hometown Lima Stations`                                                                    NA
## `SourceYour Houston News`                                                                              NA
## `SourceYour Houston News (blog)`                                                                       NA
## `SourceYour Middle East`                                                                               NA
## `SourceYour News Now`                                                                                  NA
## Sourceyourcentralvalley.com                                                                            NA
## SourceYourErie                                                                                         NA
## SourceYourStory.com                                                                                    NA
## SourceYourWestValley.com                                                                               NA
## `SourceYouth Health Magzine`                                                                           NA
## `SourceYouth Ki Awaaz`                                                                                 NA
## SourceYubaNet                                                                                          NA
## SourceYugaTech                                                                                         NA
## `SourceYuma Sun`                                                                                       NA
## `SourceZacks via Yahoo Canada Finance`                                                                 NA
## `SourceZacks via Yahoo UK & Ireland Finance`                                                           NA
## `SourceZacks via Yahoo! Finance`                                                                       NA
## `SourceZacks via Yahoo! Finance India`                                                                 NA
## `SourceZacks via Yahoo! New Zealand Finance`                                                           NA
## `SourceZacks via Yahoo!7 Finance`                                                                      NA
## SourceZacks.com                                                                                        NA
## SourceZap2It                                                                                           NA
## `SourceZawya (registration)`                                                                           NA
## SourceZDNet                                                                                            NA
## `SourceZDNet (blog)`                                                                                   NA
## `SourceZDNet UK`                                                                                       NA
## `SourceZee News`                                                                                       NA
## SourceZergwatch                                                                                        NA
## `SourceZero Hedge`                                                                                     NA
## SourceZIK                                                                                              NA
## `SourceZimbabwe Independent`                                                                           NA
## `SourceZimEye - Zimbabwe News`                                                                         NA
## `SourceZME Science`                                                                                    NA
## SourceZNBC                                                                                             NA
## SourceZolmax                                                                                           NA
##                                                                                                     
## (Intercept)                                                                                         
## Topiceconomy                                                                                        
## Topicmicrosoft                                                                                      
## Topicobama                                                                                       ***
## Topicpalestine                                                                                      
## `Source `                                                                                           
## `Source/FILM`                                                                                       
## `Source+972 Magazine`                                                                               
## `Source\\u009d\\u009d \\u009d\\u009d`                                                               
## Source10News                                                                                        
## Source10TV                                                                                          
## Source11alive.com                                                                                   
## `Source12 News Phoenix`                                                                             
## Source12news.com                                                                                    
## Source12NewsNow.Com                                                                                 
## `Source1340 WJOL`                                                                                   
## `Source13abc Action News`                                                                           
## Source13newsnow.com                                                                                 
## Source13WMAZ                                                                                        
## Source13WMAZ.com                                                                                    
## `Source14 News WFIE Evansville`                                                                     
## `Source14 WFIE Evansville`                                                                          
## `Source19 Action News Cleveland`                                                                    
## Source20minutes.fr                                                                                  
## Source21Alive                                                                                       
## `Source24/7 Wall St.`                                                                               
## `Source24/7 Wall St. via Yahoo! Finance`                                                            
## Source247Sports                                                                                     
## Source2paragraphs.com                                                                               
## `Source3ders.org (blog)`                                                                            
## Source3DPrint.com                                                                                   
## Source3news                                                                                         
## `Source3News NZ`                                                                                    
## `Source41 NBC News`                                                                                 
## Source4k                                                                                            
## Source4NI                                                                                           
## `Source5 Eyewitness News St. Paul`                                                                  
## `Source550 KTSA`                                                                                    
## `Source570 News`                                                                                    
## `Source580 CFRA Radio`                                                                              
## Source5newsonline.com                                                                               
## `Source6 On Your Side`                                                                              
## Source630ched.com                                                                                   
## `Source660 News`                                                                                    
## `Source680 News`                                                                                    
## Source6abc.com                                                                                      
## `Source7Online WSVN-TV`                                                                             
## Source7sur7                                                                                         
## `Source88Nine Radio Milwaukee (blog)`                                                               
## `Source89.3 KPCC`                                                                                   
## `Source89.3 WFPL`                                                                                   
## `Source9 News Denver`                                                                               
## `Source9 to 5 Google`                                                                               
## `Source9 to 5 Mac`                                                                                  
## `Source9 to 5 Mac (press release)`                                                                  
## `Source9&10 News`                                                                                   
## `Source93.1 WIBC Indianapolis`                                                                      
## Source9NEWS.com                                                                                     
## Source9news.com.au                                                                                  
## `SourceA.V. Club`                                                                                   
## `SourceA.V. Club (blog)`                                                                            
## `SourceA.V. Club Denver/Boulder`                                                                    
## `SourceAaj Tv (press release) (blog)`                                                               
## `SourceAAP via Yahoo! New Zealand Finance`                                                          
## `SourceAAP via Yahoo! New Zealand News`                                                             
## `SourceAAP via Yahoo!7 Finance`                                                                     
## `SourceAAP via Yahoo!7 News`                                                                        
## `SourceAbbotsford News (registration) (blog)`                                                       
## `SourceABC 13 Houston`                                                                              
## `SourceABC 15 Phoenix`                                                                              
## `SourceABC 26 New Orleans`                                                                          
## `SourceABC 6 Providence`                                                                            
## `SourceABC 7 Chicago`                                                                               
## `SourceABC 7 Gulfshore News`                                                                        
## `SourceABC Action News Tampa Bay`                                                                   
## `SourceABC FOX Montana News`                                                                        
## `SourceABC Local`                                                                                   
## `SourceABC Montana`                                                                                 
## `SourceABC News`                                                                                    
## `SourceABC NEWS 4`                                                                                  
## `SourceABC News via Yahoo! News`                                                                    
## `SourceABC Online`                                                                                  
## `SourceABC Online (blog)`                                                                           
## SourceABC10.com                                                                                     
## `SourceABC11 Raleigh-Durham-Fayetteville`                                                           
## `SourceABC12 Mid-Michigan`                                                                          
## `SourceABC15 Arizona`                                                                               
## SourceABC17News.com                                                                                 
## `SourceABC2 News`                                                                                   
## Sourceabc27                                                                                         
## SourceABC6OnYourSide.com                                                                            
## Sourceabc7news.com                                                                                  
## `SourceAberdeen Press and Journal`                                                                  
## `SourceABI Research (press release) (subscription) (blog)`                                          
## `SourceAbove the Law`                                                                               
## `SourceABP Live`                                                                                    
## `SourceABS-CBNNEWS.com`                                                                             
## `SourceABS CBN News`                                                                                
## `SourceAccess Hollywood`                                                                            
## `SourceAccess Washington`                                                                           
## `SourceAccesswire via Yahoo! Finance`                                                               
## `SourceAccounting Today`                                                                            
## `SourceAccuracy in Academia`                                                                        
## `SourceAccuracy In Media`                                                                           
## `SourceAccuracy In Media (blog)`                                                                    
## `SourceACN Newswire via Yahoo! New Zealand Finance`                                                 
## `SourceACN Newswire via Yahoo!7 Finance`                                                            
## `SourceAction Forex`                                                                                
## SourceActionNewsJax.com                                                                             
## SourceACTmedia                                                                                      
## `SourceActon Institute (blog)`                                                                      
## SourceAdAge.com                                                                                     
## `SourceAdAge.com (blog)`                                                                            
## SourceAdExchanger                                                                                   
## SourceAdNews                                                                                        
## `SourceADT Magazine`                                                                                
## `SourceAdvanced Television`                                                                         
## SourceAdvisor.ca                                                                                    
## SourceAdvocate.com                                                                                  
## SourceAdweek                                                                                        
## SourceAdWeek                                                                                        
## Sourceafaqs                                                                                         
## SourceAFKInsider                                                                                    
## `SourceAFL-CIO (blog)`                                                                              
## `SourceAFP News via Yahoo! Philippines News`                                                        
## `SourceAFP News via Yahoo! Singapore News`                                                          
## `SourceAFP Relax News via Yahoo! News`                                                              
## `SourceAFP Relax via Yahoo! Philippines News`                                                       
## `SourceAFP Relax via Yahoo! Singapore News`                                                         
## `SourceAFP via Yahoo Maktoob News`                                                                  
## `SourceAFP via Yahoo UK & Ireland Finance`                                                          
## `SourceAFP via Yahoo UK & Ireland News`                                                             
## `SourceAFP via Yahoo! Finance`                                                                      
## `SourceAFP via Yahoo! India News`                                                                   
## `SourceAFP via Yahoo! New Zealand News`                                                             
## `SourceAFP via Yahoo! News`                                                                         
## `SourceAFP via Yahoo! Sports`                                                                       
## `SourceAFP via Yahoo!7 Finance`                                                                     
## `SourceAFP via Yahoo!7 News`                                                                        
## `SourceAfrica Middle East`                                                                          
## `SourceAfrican Arguments (registration)`                                                            
## `SourceAfrican Manager (press release) (registration) (blog)`                                       
## SourceAfricanews                                                                                    
## SourceAfricaNews                                                                                    
## `SourceAfricanews (press release)`                                                                  
## SourceAfrik.com                                                                                     
## SourceAfterDawn                                                                                     
## `SourceAG Week`                                                                                     
## `SourceAgence France-Presse via Yahoo Canada News`                                                  
## SourceAgencySpy                                                                                     
## SourceAgenda.ge                                                                                     
## SourceAGERPRES                                                                                      
## SourceAgoraVox                                                                                      
## SourceAgriculture.com                                                                               
## SourceAgriland                                                                                      
## SourceAgWeb                                                                                         
## `SourceAhlul Bayt News Agency (press release)`                                                      
## `SourceAhram Online`                                                                                
## `SourceAir Force Link`                                                                              
## `SourceAir Transport World`                                                                         
## `SourceAircraft Maintenance Technology`                                                             
## SourceAirForceTimes.com                                                                             
## `SourceAirline Reporter`                                                                            
## `SourceAJIB.fr L'actualit\\u009d\\u009d de l'Islam et des musulmans en France`                      
## `SourceAkron Beacon Journal`                                                                        
## `SourceAl-Ahram Weekly`                                                                             
## `SourceAl-Arabiya`                                                                                  
## `SourceAl-Arabiya (blog)`                                                                           
## `SourceAl-Bawaba`                                                                                   
## `SourceAl-Fanar Media`                                                                              
## `SourceAl-Jazeerah.info`                                                                            
## `SourceAl-Manar TV`                                                                                 
## `SourceAl-Monitor`                                                                                  
## `SourceAl-Resalah`                                                                                  
## `SourceAl Bawaba`                                                                                   
## `SourceAl Huffington Post`                                                                          
## `SourceAl Jazeera America`                                                                          
## `SourceAl Jazeera via Yahoo Maktoob News`                                                           
## `SourceAl Jazeera via Yahoo UK & Ireland News`                                                      
## SourceAL.com                                                                                        
## `SourceAlabama's News Leader`                                                                       
## `SourceAlabama NewsCenter`                                                                          
## `SourceAlaska Dispatch News`                                                                        
## `SourceAlaska Public Radio Network`                                                                 
## `SourceAlbanian Daily News`                                                                         
## `SourceAlbany Business Review`                                                                      
## `SourceAlbany Democrat Herald`                                                                      
## `SourceAlbany Times Union`                                                                          
## `SourceAlbany Times Union (blog)`                                                                   
## `SourceAlberni Valley News`                                                                         
## `SourceAlberta Daily Herald Tribune`                                                                
## `SourceAlbuquerque Business First (blog)`                                                           
## `SourceAlbuquerque Journal`                                                                         
## `SourceAlex News (blog)`                                                                            
## `SourceAlexandria Town Talk`                                                                        
## `SourceAlg\\u009d\\u009drie Presse Service`                                                         
## SourceAlgemeiner                                                                                    
## `Sourcealgerie-focus.com`                                                                           
## `SourceAlgérie Presse Service`                                                                      
## `SourceAliran Monthly`                                                                              
## `SourceAliran Online`                                                                               
## SourceAljazeera.com                                                                                 
## `SourceAljazeera.com (blog)`                                                                        
## `SourceAll About Hawke's Bay`                                                                       
## SourceAllAfrica.com                                                                                 
## `SourceAllCoinsNews.com (blog)`                                                                     
## `SourceAllentown Morning Call`                                                                      
## SourceAllGov                                                                                        
## `SourceAllure Magazine (blog)`                                                                      
## SourceAlphr                                                                                         
## `SourceAltEnergyMag (press release)`                                                                
## `SourceAlternative Information Center (AIC)`                                                        
## `SourceAlternative Information Center (AIC) (blog)`                                                 
## SourceAlterNet                                                                                      
## `SourceAlton Telegraph`                                                                             
## `SourceAlyaexpress-News`                                                                            
## `SourceAmarillo Globe-News`                                                                         
## SourceAmarillo.com                                                                                  
## `SourceAmazinessNet (blog)`                                                                         
## SourceAMEinfo                                                                                       
## `SourceAmerica Magazine`                                                                            
## `SourceAmerican Action Forum (blog)`                                                                
## `SourceAmerican Banker`                                                                             
## `SourceAmerican Center for Law and Justice (blog)`                                                  
## `SourceAmerican Enterprise Institute`                                                               
## `SourceAmerican Free Press`                                                                         
## `SourceAmerican Journal of Transportation`                                                          
## `SourceAmerican Kennel Club (blog)`                                                                 
## `SourceAmerican Libraries (blog)`                                                                   
## `SourceAmerican Spectator`                                                                          
## `SourceAmerican Spectator (blog)`                                                                   
## `SourceAmerican Thinker`                                                                            
## `SourceAmerican Thinker (blog)`                                                                     
## `SourceAmerican Trade Journal`                                                                      
## `SourceAmericans for Tax Reform (blog)`                                                             
## `SourceAmericas Quarterly`                                                                          
## `SourceAmericas Quarterly (blog)`                                                                   
## SourceAmeriPublications                                                                             
## `SourceAmes Tribune`                                                                                
## SourceAmigobulls                                                                                    
## `SourceAmmoLand Shooting Sports News`                                                               
## SourceamNewYork                                                                                     
## SourceamNY                                                                                          
## `SourceAn Phoblacht`                                                                                
## `SourceAnadolu Agency`                                                                              
## SourceAnandTech                                                                                     
## SourceAnarkismo.net                                                                                 
## `SourceAnchorage Daily News`                                                                        
## `SourceAndean Airmail & PERUVIAN TIMES`                                                             
## `SourceAnderson Independent Mail`                                                                   
## `SourceAndroid Authority (blog)`                                                                    
## `SourceAndroid Central`                                                                             
## `SourceAndroid Community`                                                                           
## `SourceAndroid Headlines - Android News`                                                            
## `SourceAndroid Police`                                                                              
## SourceAndroidOrigin                                                                                 
## `SourceAndroidPIT US (blog)`                                                                        
## SourceAngolaPress                                                                                   
## `SourceANI via Yahoo! India News`                                                                   
## `SourceAnimation World Network`                                                                     
## `SourceAnime News Network`                                                                          
## SourceANINEWS                                                                                       
## SourceAnorak                                                                                        
## `SourceANSA (registration)`                                                                         
## SourceANSAmed                                                                                       
## SourceANTARA                                                                                        
## `SourceAntigua Observer`                                                                            
## SourceAntiwar.com                                                                                   
## `SourceAntiwar.com (blog)`                                                                          
## `SourceAOL Money UK`                                                                                
## `SourceAOL News`                                                                                    
## `SourceAP S\\u009d\\u009dn\\u009d\\u009dgalaise`                                                    
## `SourceAP via Yahoo! New Zealand News`                                                              
## `SourceAP via Yahoo!7 News`                                                                         
## SourceAPA                                                                                           
## `SourceAPEX Media`                                                                                  
## SourceAppAdvice                                                                                     
## `SourceAppeal-Democrat`                                                                             
## `SourceApple Insider`                                                                               
## `SourceAppleInsider (press release) (blog)`                                                         
## `SourceAppleton Post Crescent`                                                                      
## `SourceArab American News`                                                                          
## `SourceArab News`                                                                                   
## `SourceArab News via Yahoo Maktoob News`                                                            
## `SourceArab Times Kuwait English Daily`                                                             
## SourceArabianBusiness.com                                                                           
## SourceARC                                                                                           
## SourceArchinect                                                                                     
## `SourceArchitectural Digest`                                                                        
## SourceArcticStartup                                                                                 
## `SourceArizona Capitol Times`                                                                       
## `SourceArizona Daily Star`                                                                          
## `SourceArizona Daily Sun`                                                                           
## `SourceArkansas Business`                                                                           
## `SourceArkansas Democrat-Gazette`                                                                   
## `SourceArkansas News`                                                                               
## `SourceArkansas Online`                                                                             
## SourceArmeniaNow.com                                                                                
## SourceArmenpress.am                                                                                 
## SourceArmyTimes.com                                                                                 
## SourceARNnet                                                                                        
## `SourceAround the Rings (subscription)`                                                             
## `SourceArs Technica`                                                                                
## `SourceArs Technica UK`                                                                             
## `SourceArt Newspaper`                                                                               
## `SourceArtesia Daily Press`                                                                         
## SourceArtforum                                                                                      
## SourceArtLyst                                                                                       
## `Sourceartnet News`                                                                                 
## `SourceArtslink.co.za News (press release)`                                                         
## `SourceArutz Sheva`                                                                                 
## `SourceAS/COA Online`                                                                               
## `SourceAsahi Shimbun`                                                                               
## SourceAsahi.com                                                                                     
## `SourceAsbarez Armenian News`                                                                       
## `SourceAsbury Park Press`                                                                           
## `SourceAsharq Al-awsat (blog)`                                                                      
## `SourceAsharq Al-awsat English`                                                                     
## `SourceAsharq Alawsat`                                                                              
## `SourceAsheboro Courier Tribune`                                                                    
## `SourceAsheville Citizen-Times`                                                                     
## `SourceAsia Pacific Report`                                                                         
## `SourceAsia Society`                                                                                
## `SourceAsia Society (blog)`                                                                         
## `SourceAsia Times`                                                                                  
## `SourceAsian Correspondent`                                                                         
## `SourceAsian Image`                                                                                 
## `SourceAsian Tribune`                                                                               
## SourceAsiaNews.it                                                                                   
## SourceAsiaOne                                                                                       
## `SourceAspen Times`                                                                                 
## `SourceAssociated Press of Pakistan`                                                                
## `SourceAssociated Press via Yahoo Maktoob News`                                                     
## `SourceAssociated Press via Yahoo UK & Ireland Finance`                                             
## `SourceAssociated Press via Yahoo UK & Ireland News`                                                
## `SourceAssociated Press via Yahoo! Finance`                                                         
## `SourceAssociated Press via Yahoo! Finance India`                                                   
## `SourceAssociated Press via Yahoo! India News`                                                      
## `SourceAssociated Press via Yahoo! New Zealand Finance`                                             
## `SourceAssociated Press via Yahoo! News`                                                            
## `SourceAssociated Press via Yahoo! Philippines News`                                                
## `SourceAssociated Press via Yahoo! Philippines Sports`                                              
## `SourceAssociated Press via Yahoo! Singapore News`                                                  
## `SourceAssociated Press via Yahoo! Singapore Sports`                                                
## `SourceAssociated Press via Yahoo!7 Finance`                                                        
## `SourceAssociation France Palestine Solidarit\\u009d\\u009d`                                        
## `SourceAssociation France Palestine Solidarité`                                                     
## `SourceAstana Times`                                                                                
## `SourceAstro Awani`                                                                                 
## `SourceAthens Banner-Herald`                                                                        
## `SourceAthens Daily Review`                                                                         
## `SourceAtlanta Black Star`                                                                          
## `SourceAtlanta Business Chronicle`                                                                  
## `SourceAtlanta Intown`                                                                              
## `SourceAtlanta Journal-Constitution`                                                                
## `SourceAtlanta Journal Constitution`                                                                
## `SourceAtlanta Journal Constitution (blog)`                                                         
## `SourceAtlas Obscura`                                                                               
## `SourceAttack of the Fanboy`                                                                        
## SourceATTN                                                                                          
## SourceATWOnline                                                                                     
## `SourceAuburn Citizen`                                                                              
## `SourceAuburn Citizen (blog)`                                                                       
## `SourceAuckland stuff.co.nz`                                                                        
## `SourceAugusta Free Press`                                                                          
## SourceAusdroid                                                                                      
## `SourceAustin American-Statesman`                                                                   
## `SourceAustin Business Journal`                                                                     
## `SourceAustin Chronicle`                                                                            
## `SourceAustin Inno`                                                                                 
## `SourceAustralia-Israel Jewish Affairs Council`                                                     
## `SourceAustralia Network News`                                                                      
## `SourceAustralian Aviation`                                                                         
## `SourceAustralian Broadcasting Corporation`                                                         
## `SourceAustralian Business Traveller`                                                               
## `SourceAustralian FourFourTwo`                                                                      
## `SourceAustralian Jewish News`                                                                      
## `SourceAustralian Policy Online`                                                                    
## `SourceAutoblog (blog)`                                                                             
## SourceAutocar                                                                                       
## `SourceAutocar India`                                                                               
## Sourceautoevolution                                                                                 
## SourceAutoExpress                                                                                   
## SourceAutoGuide.com                                                                                 
## `SourceAutomation World`                                                                            
## `SourceAutomotive News`                                                                             
## `SourceAutomotive News Europe (registration)`                                                       
## `SourceAutomotiveIT International`                                                                  
## SourceAutooMobile.com                                                                               
## SourceAutoweek                                                                                      
## `SourceAviation Week`                                                                               
## SourceAviationPros.com                                                                              
## `SourceAwful Announcing`                                                                            
## `SourceAxis of Logic`                                                                               
## Sourceazcentral.com                                                                                 
## SourceAzerNews                                                                                      
## SourceAZFamily                                                                                      
## `SourceB\\u009d\\u009do D\\u009d\\u009dn Vit`                                                       
## `SourceB2B Marketing Online`                                                                        
## SourceB92                                                                                           
## `SourceBABW News`                                                                                   
## `SourceBahamas Tribune`                                                                             
## `SourceBahrain News Agency`                                                                         
## `SourceBalitang America`                                                                            
## `SourceBalkan Insight`                                                                              
## `SourceBalkans.com Business News`                                                                   
## `SourceBaltic Times`                                                                                
## `SourceBaltimore Business Journal (blog)`                                                           
## `SourceBaltimore Sun`                                                                               
## `SourceBaltimore Sun (blog)`                                                                        
## SourceBaltimoreRavens.com                                                                           
## `SourceBangalore Mirror`                                                                            
## `SourceBangkok Post`                                                                                
## `SourceBangladesh News 24 hours`                                                                    
## `SourceBangor Daily News`                                                                           
## `SourceBank of Canada`                                                                              
## `SourceBanking Technology`                                                                          
## SourceBankrate.com                                                                                  
## `SourceBankrate.com via Yahoo Canada Finance`                                                       
## `SourceBankrate.com via Yahoo! Finance`                                                             
## `SourceBarbados Advocate`                                                                           
## `SourceBarca Blaugranes (blog)`                                                                     
## `SourceBarre Montpelier Times Argus`                                                                
## `SourceBarron's`                                                                                    
## `SourceBarron's (blog)`                                                                             
## `SourceBarron&#39;s Online`                                                                         
## SourceBaseline                                                                                      
## `SourceBaseline (blog)`                                                                             
## `SourceBasic Income News`                                                                           
## `SourceBasingstoke Gazette`                                                                         
## `SourceBasta !`                                                                                     
## `SourceBath Chronicle`                                                                              
## `SourceBattle Creek Enquirer`                                                                       
## `SourceBaxter Bulletin`                                                                             
## `SourceBay Area Indymedia`                                                                          
## `SourceBay News 9`                                                                                  
## `SourceBay Today`                                                                                   
## `SourceBaytown Sun`                                                                                 
## `SourceBBC News`                                                                                    
## `SourceBBC NI`                                                                                      
## `SourceBBC Sport`                                                                                   
## `SourceBBC world`                                                                                   
## SourceBCBusiness                                                                                    
## SourceBDlive                                                                                        
## `SourceBeacon Examiner`                                                                             
## SourceBeanstockd                                                                                    
## `SourceBearing Arms`                                                                                
## `SourceBeatrice Daily Sun`                                                                          
## `SourceBeaumont Enterprise`                                                                         
## `SourceBecker's Hospital Review`                                                                    
## `SourceBecker's Orthopedic & Spine`                                                                 
## `SourceBeckley Register-Herald`                                                                     
## `SourceBedford Today`                                                                               
## `SourceBeef Magazine (blog)`                                                                        
## `SourceBelarus Digest`                                                                              
## `SourceBelarus News (BelTA)`                                                                        
## `SourceBelfast Newsletter`                                                                          
## `SourceBelfast Telegraph`                                                                           
## `SourceBella Naija`                                                                                 
## SourceBellaciao                                                                                     
## `SourceBelleville News-Democrat`                                                                    
## `SourceBellevue Reporter`                                                                           
## `SourceBeloit Daily News`                                                                           
## `SourceBenchmark Monitor`                                                                           
## `SourceBend Bulletin`                                                                               
## `SourceBenefits Canada`                                                                             
## `SourceBenton Evening News`                                                                         
## SourceBenzinga                                                                                      
## `SourceBenzinga via Yahoo! Finance`                                                                 
## `SourceBerkshire Eagle (subscription)`                                                              
## SourceBernama                                                                                       
## SourceBernews                                                                                       
## `SourceBerwick Advertiser`                                                                          
## `SourceBerwick Today`                                                                               
## SourceBET                                                                                           
## `SourceBET (blog)`                                                                                  
## SourceBetaBoston                                                                                    
## SourceBetaKit                                                                                       
## SourceBetaNews                                                                                      
## SourceBGR                                                                                           
## `SourceBGR India`                                                                                   
## `SourceBGR News via Yahoo! News`                                                                    
## `SourceBharat Press`                                                                                
## `SourceBharat Times`                                                                                
## `SourceBi-College News`                                                                             
## `SourceBidness ETC`                                                                                 
## `SourceBig Island Now`                                                                              
## `SourceBig Issue`                                                                                   
## `SourceBig News Network.com`                                                                        
## `SourceBig Think`                                                                                   
## `SourceBig Think (blog)`                                                                            
## `SourceBigPond News`                                                                                
## `SourceBigPond Sport`                                                                               
## SourceBILD                                                                                          
## SourceBillboard                                                                                     
## `SourceBillings Gazette`                                                                            
## SourceBillMoyers.com                                                                                
## SourceBiography                                                                                     
## `SourceBiomass Magazine`                                                                            
## `SourceBiometric Update`                                                                            
## `SourceBirmingham Business Journal`                                                                 
## `SourceBirmingham Mail`                                                                             
## `SourceBirmingham Post`                                                                             
## `SourceBismarck Tribune`                                                                            
## SourceBisnow                                                                                        
## `Sourcebit-tech.net`                                                                                
## SourceBitbag                                                                                        
## `SourceBitcoin Magazine`                                                                            
## SourceBitcoinist.net                                                                                
## `SourcebizEDGE NZ`                                                                                  
## SourceBizNews                                                                                       
## `SourceBizPac Review`                                                                               
## SourceBizReport                                                                                     
## `SourceBizTech Magazine`                                                                            
## `SourceBizTimes.com (Milwaukee)`                                                                    
## SourceBLABBERMOUTH.NET                                                                              
## `SourceBlack Agenda Report`                                                                         
## `SourceBlack Enterprise`                                                                            
## `SourceBlack Mountain News`                                                                         
## SourceBlackburnNews.com                                                                             
## `SourceBlackmore Vale Magazine`                                                                     
## SourceBlackNews.com                                                                                 
## `SourceBlackNews.com (press release)`                                                               
## `SourceBlasting News`                                                                               
## SourceBlastr                                                                                        
## `SourceBleacher Report`                                                                             
## `SourceBleeding Cool News`                                                                          
## SourceBlic                                                                                          
## `SourceBlockchain News`                                                                             
## `SourceBlogging Censorship`                                                                         
## `SourceBloody Disgusting`                                                                           
## SourceBloomberg                                                                                     
## `SourceBloomberg Big Law Business`                                                                  
## `SourceBloomberg BNA`                                                                               
## `SourceBloomberg Government (blog)`                                                                 
## `SourceBloomberg via Yahoo UK & Ireland Finance`                                                    
## `SourceBloomberg via Yahoo! Finance`                                                                
## `SourceBloomberg via Yahoo! Finance India`                                                          
## `SourceBloomberg via Yahoo! New Zealand Finance`                                                    
## `SourceBloomberg via Yahoo!7 Finance`                                                               
## `SourceBloomberg View`                                                                              
## `SourceBloomer Advance (subscription)`                                                              
## `SourceBloomington Pantagraph`                                                                      
## SourceBlorge                                                                                        
## `SourceBlue Nation Review`                                                                          
## `SourceBluefield Daily Telegraph`                                                                   
## `SourceBluffton Today`                                                                              
## `SourceBMWBLOG (blog)`                                                                              
## SourceBnet.com.au                                                                                   
## Sourcebnn.ca                                                                                        
## `SourceBNO News`                                                                                    
## `SourceBob Sullivan.net`                                                                            
## `SourceBobsguide (press release)`                                                                   
## `SourceBoing Boing`                                                                                 
## `SourceBonham Journal`                                                                              
## `SourceBonner County Daily Bee`                                                                     
## `SourceBooks LIVE (blog)`                                                                           
## SourceBorderstan                                                                                    
## SourceBostInno                                                                                      
## `SourceBoston Business Journal`                                                                     
## `SourceBoston Business Journal (blog)`                                                              
## `SourceBoston Herald`                                                                               
## `SourceBoston Review`                                                                               
## SourceBoston.com                                                                                    
## `SourceBoulder Daily Camera`                                                                        
## `SourceBoulder Weekly`                                                                              
## `SourceBournemouth Echo`                                                                            
## `SourceBowling Green Daily News`                                                                    
## SourceBoxscore                                                                                      
## `SourceBrad Jones, Digital Trends via Yahoo! News`                                                  
## `SourceBradenton Herald`                                                                            
## `SourceBradford Telegraph`                                                                          
## `SourceBradford Telegraph and Argus`                                                                
## `SourceBrampton Guardian`                                                                           
## `SourceBrandon Sun`                                                                                 
## `SourceBrattleboro Reformer`                                                                        
## `SourceBrave New Coin`                                                                              
## `SourceBrazil-Arab News Agency (ANBA)`                                                              
## `SourceBreaking Belize News (blog)`                                                                 
## `SourceBreaking Israel News`                                                                        
## SourceBreakingNews.com                                                                              
## SourceBreakingNews.ie                                                                               
## SourceBreakingviews                                                                                 
## SourceBREATHEcast                                                                                   
## `SourceBreitbart News`                                                                              
## `SourceBretton Woods Observer`                                                                      
## `SourceBrian Madden (blog)`                                                                         
## `SourceBrides.com (blog)`                                                                           
## `SourceBriefing.com via Yahoo! Finance`                                                             
## SourceBright                                                                                        
## `SourceBright Green`                                                                                
## `SourceBrisbane Times`                                                                              
## `SourceBristol Herald Courier`                                                                      
## `SourceBristol Herald Courier (press release) (blog)`                                               
## `SourceBristol Post`                                                                                
## `SourceBristol Press`                                                                               
## `SourceBritish Journal of Photography`                                                              
## `SourceBroadband TV News`                                                                           
## SourceBroadcaster                                                                                   
## `SourceBroadcasting & Cable`                                                                        
## SourceBroadly                                                                                       
## `SourceBrookings Institution`                                                                       
## `SourceBrookings Institution (blog)`                                                                
## `SourceBrookson (press release) (blog)`                                                             
## `SourceBrown County Democrat`                                                                       
## `SourceBrownwood Bulletin`                                                                          
## SourceBruDirect.com                                                                                 
## `SourceBryan-College Station Eagle`                                                                 
## SourceBT.com                                                                                        
## `SourceBU Today`                                                                                    
## `SourceBuckingham Advertiser`                                                                       
## SourceBucks.com                                                                                     
## `SourceBudapest Business Journal`                                                                   
## `SourceBudapest Times`                                                                              
## `SourceBuenos Aires Herald`                                                                         
## `SourceBuffalo Business First`                                                                      
## `SourceBuffalo News`                                                                                
## `SourceBuilder Magazine`                                                                            
## `SourceBullard Banner News`                                                                         
## `SourceBulletin of the Atomic Scientists`                                                           
## `SourceBunbury Mail`                                                                                
## `SourceBundaberg News Mail`                                                                         
## `SourceBurlington County Times (subscription)`                                                      
## `SourceBurlington Times News`                                                                       
## SourceBurlingtonFreePress.com                                                                       
## `SourceBusiness 2 Community`                                                                        
## `SourceBusiness Cloud News`                                                                         
## `SourceBusiness Cornwall Magazine`                                                                  
## `SourceBusiness Finance News`                                                                       
## `SourceBusiness Green`                                                                              
## `SourceBusiness Green (blog)`                                                                       
## `SourceBusiness In Savannah`                                                                        
## `SourceBusiness in Vancouver`                                                                       
## `SourceBusiness Insider`                                                                            
## `SourceBusiness Insider Australia`                                                                  
## `SourceBusiness Insider Nordic`                                                                     
## `SourceBusiness Insider UK`                                                                         
## `SourceBusiness Insider UK Finance via Yahoo Canada Finance`                                        
## `SourceBusiness Insider UK Finance via Yahoo UK & Ireland Finance`                                  
## `SourceBusiness Insider UK Finance via Yahoo! Finance India`                                        
## `SourceBusiness Insider via Yahoo Canada Finance`                                                   
## `SourceBusiness Insider via Yahoo Maktoob News`                                                     
## `SourceBusiness Insider via Yahoo UK & Ireland Finance`                                             
## `SourceBusiness Insider via Yahoo! Finance`                                                      ***
## `SourceBusiness Insider via Yahoo! Finance India`                                                   
## `SourceBusiness Insider via Yahoo! India News`                                                      
## `SourceBusiness Insurance`                                                                          
## `SourceBusiness Management Daily`                                                                   
## `SourceBusiness MattersBusiness Matters`                                                            
## `SourceBusiness Mirror`                                                                             
## `SourceBusiness News`                                                                               
## `SourceBusiness News Americas`                                                                      
## `SourceBusiness News Americas (subscription)`                                                       
## `SourceBusiness News Daily`                                                                         
## `SourceBusiness News Wales (press release)`                                                         
## `SourceBusiness Recorder`                                                                           
## `SourceBusiness Recorder (press release) (registration) (blog)`                                     
## `SourceBusiness Reporter`                                                                           
## `SourceBusiness Review`                                                                             
## `SourceBusiness Solutions Magazine`                                                                 
## `SourceBusiness Spectator`                                                                          
## `SourceBusiness Standard`                                                                           
## `SourceBusiness Standard (press release) (registration) (blog)`                                     
## `SourceBusiness Standard India`                                                                     
## `SourceBusiness Times of Western Colorado`                                                          
## `SourceBusiness Today`                                                                              
## `SourceBusiness Travel News`                                                                        
## `SourceBusiness Traveller`                                                                          
## `SourceBusiness Weekly`                                                                             
## `SourceBusiness Wire`                                                                               
## `SourceBusiness Wire (press release)`                                                               
## `SourceBusiness Wire via Yahoo Canada Finance`                                                      
## `SourceBusiness Wire via Yahoo UK & Ireland Finance`                                                
## `SourceBusiness Wire via Yahoo! Finance`                                                            
## `SourceBusiness Wire via Yahoo! Finance India`                                                      
## `SourceBusiness Wire via Yahoo! New Zealand Finance`                                                
## SourceBusiness.com                                                                                  
## SourceBusinessBecause                                                                               
## SourceBusinessDay                                                                                   
## `SourceBusinessDesk via Yahoo! New Zealand Finance`                                                 
## `SourceBusinessinsider India`                                                                       
## SourceBusinessKorea                                                                                 
## SourceBusinessNorth.com                                                                             
## SourceBusinessTech                                                                                  
## `SourceBusinessWorld Online`                                                                        
## `SourceBusinessWorld Online Edition`                                                                
## SourceBustle                                                                                        
## `SourceBuying Business Travel`                                                                      
## `SourceBuzzFeed News`                                                                               
## SourceBwog                                                                                          
## `SourceByron Shire News`                                                                            
## SourceCainTV                                                                                        
## `SourceCaixin Media`                                                                                
## `SourceCalcutta News`                                                                               
## `SourceCalcutta Telegraph`                                                                          
## `SourceCalgary Herald`                                                                              
## `SourceCalgary Sun`                                                                                 
## `SourceCalifornia Economy Reporting`                                                                
## `SourceCambridge Community Television`                                                              
## `SourceCambridge Evening News`                                                                      
## `SourceCambridge News`                                                                              
## `SourceCampaign Asia-Pacific`                                                                       
## SourceCampaignLive                                                                                  
## `SourceCampus Reform`                                                                               
## `SourceCampus Technology`                                                                           
## `SourceCampus Watch`                                                                                
## `SourceCanada Free Press`                                                                           
## `SourceCanada NewsWire (press release)`                                                             
## `SourceCanada Politics via Yahoo Canada News`                                                       
## SourceCanada.com                                                                                    
## `SourceCanadian HR Reporter`                                                                        
## `SourceCanadian Jewish News`                                                                        
## `SourceCanadian Jewish News (blog)`                                                                 
## `SourceCanadian Mining Journal`                                                                     
## `SourceCanadian Mortgage Broker News`                                                               
## `SourceCanadian Reviewer`                                                                           
## SourceCanadianBusiness.com                                                                          
## `SourceCanadianBusiness.com (blog)`                                                                 
## `SourceCanberra Times`                                                                              
## SourceCanoe                                                                                         
## `SourceCAPA - Centre for Aviation`                                                                  
## `SourceCape Breton Post`                                                                            
## `SourceCape Business News`                                                                          
## `SourceCape Business News South Africa Business`                                                    
## SourceCapeTalk                                                                                      
## `SourceCapital City Weekly`                                                                         
## `SourceCapital FM Kenya (press release) (blog)`                                                     
## `SourceCapital Public Radio News`                                                                   
## `SourceCapital.gr (press release)`                                                                  
## SourceCapitalGazette.com                                                                            
## `SourceCar and Driver (blog)`                                                                       
## SourceCarAdvice                                                                                     
## `SourceCarbon Brief`                                                                                
## `SourceCarbonated.tv (blog)`                                                                        
## SourceCarBuzz                                                                                       
## SourceCardPlayer.com                                                                                
## SourceCare2.com                                                                                     
## `SourceCaribbean360.com (subscription)`                                                             
## `SourceCarlisle Sentinel`                                                                           
## `SourceCarlsbad Current-Argus`                                                                      
## `SourceCarnegie Endowment for International Peace`                                                  
## `SourceCarnegie Europe`                                                                             
## SourceCarolinacoastonline                                                                           
## `SourceCarroll County Times`                                                                        
## `SourceCarscoops (blog)`                                                                            
## `SourceCarteret County News-Times`                                                                  
## `SourceCasper Star-Tribune Online`                                                                  
## SourceCastanet.net                                                                                  
## `SourceCatch News`                                                                                  
## `SourceCatholic Culture`                                                                            
## `SourceCatholic Herald`                                                                             
## `SourceCatholic Herald Online`                                                                      
## `SourceCatholic New York`                                                                           
## `SourceCatholic News Agency`                                                                        
## `SourceCatholic News Service`                                                                       
## `SourceCatholic Online`                                                                             
## `SourceCatholic University of America The Tower`                                                    
## `SourceCato Institute`                                                                              
## `SourceCato Institute (blog)`                                                                       
## `SourceCayman Compass (press release) (registration)`                                               
## `SourceCayman News Service`                                                                         
## `SourceCBBC Newsround`                                                                              
## `SourceCBC Edmonton`                                                                                
## `SourceCBC Montreal`                                                                                
## `SourceCBC Newfoundland and Labrador`                                                               
## `SourceCBC via Yahoo Canada News`                                                                   
## SourceCBC.ca                                                                                        
## `SourceCBS 19 Tyler`                                                                                
## `SourceCBS 2 Los Angeles`                                                                           
## `SourceCBS 46 News Atlanta`                                                                         
## `SourceCBS 5 Phoenix`                                                                               
## `SourceCBS 6 Richmond`                                                                              
## `SourceCBS 8 San Diego`                                                                             
## `SourceCBS Baltimore`                                                                               
## `SourceCBS Chicago`                                                                                 
## `SourceCBS Dallas - Fort Worth`                                                                     
## `SourceCBS Denver`                                                                                  
## `SourceCBS Detroit`                                                                                 
## `SourceCBS Local`                                                                                   
## `SourceCBS Miami`                                                                                   
## `SourceCBS Minnesota`                                                                               
## `SourceCBS MoneyWatch`                                                                              
## `SourceCBS MoneyWatch via Yahoo! Finance`                                                           
## `SourceCBS New York`                                                                                
## `SourceCBS News`                                                                                    
## `SourceCBS Philadelphia`                                                                            
## `SourceCBS Pittsburgh`                                                                              
## `SourceCBS San Francisco`                                                                           
## `SourceCBS Sports`                                                                                  
## `SourceCBS sports.com (blog)`                                                                       
## SourceCBSSports.com                                                                                 
## SourceCCM                                                                                           
## SourceCCTV                                                                                          
## `SourceCCTV-America`                                                                                
## `SourceCDA News`                                                                                    
## `SourceCebu Daily News`                                                                             
## `SourceCebu Tech Blogger`                                                                           
## `SourceCecil Whig`                                                                                  
## SourceCedarCreekLake.com                                                                            
## `SourceCelebrating Progress Africa`                                                                 
## `SourceCellular News`                                                                               
## `SourceCentenary News`                                                                              
## `SourceCenter For American Progress`                                                                
## `SourceCenter for Research on Globalization`                                                        
## `SourceCenter for Strategic and International Studies`                                              
## `SourceCentral Chronicle`                                                                           
## `SourceCentral Florida Future`                                                                      
## `SourceCentral Penn Business Journal`                                                               
## `SourceCentral Washington University`                                                               
## `SourceCentre Daily Times`                                                                          
## `SourceCeylon Daily News`                                                                           
## `SourceCFA Institute Enterprising Investor (blog)`                                                  
## `SourceCFJC Today Kamloops`                                                                         
## SourceCFO                                                                                           
## `SourceCGMA Magazine`                                                                               
## `SourceChampaign/Urbana News-Gazette`                                                               
## SourceChampion                                                                                      
## `SourceChandigarh Tribune`                                                                          
## `SourceChannel 24`                                                                                  
## `SourceChannel 4 News`                                                                              
## `SourceChannel 4 News (blog)`                                                                       
## `SourceChannel 8 San Diego`                                                                         
## `SourceChannel Insider`                                                                             
## `SourceChannel News Asia`                                                                           
## `SourceChannel NewsAsia`                                                                            
## `SourceChannel Partners`                                                                            
## `SourceChannel Partners (blog)`                                                                     
## `SourceChannel Pro`                                                                                 
## `SourceChannel3000.com - WISC-TV3`                                                                  
## SourceChannel4000.com                                                                               
## SourceChannelBiz                                                                                    
## SourceChannelBuzz.ca                                                                                
## `SourceChannelLife Australia`                                                                       
## `SourceChannelLife NZ`                                                                              
## SourceChannelnomics                                                                                 
## `SourceChannelnomics EU (registration)`                                                             
## `SourceCHANNELS TELEVISION`                                                                         
## `SourceCharisma News`                                                                               
## `SourceCharleston Gazette-Mail (subscription)`                                                      
## `SourceCharleston Post Courier`                                                                     
## `SourceCharleston Post Courier (press release)`                                                     
## `SourceCharlotte Business Journal`                                                                  
## `SourceCharlotte Business Journal (blog)`                                                           
## `SourceCharlotte Observer`                                                                          
## SourceChartAttack                                                                                   
## `SourceCharter 97`                                                                                  
## `SourceChase News & Stories`                                                                        
## `SourceChattanooga Times Free Press`                                                                
## SourceChemicalOnline                                                                                
## `SourceCherry Hill Courier Post`                                                                    
## `SourceCherwell Online`                                                                             
## `SourceChicago Business Journal`                                                                    
## `SourceChicago Daily Herald`                                                                        
## `SourceChicago Inno`                                                                                
## `SourceChicago Reader`                                                                              
## `SourceChicago Sun-Times`                                                                           
## `SourceChicago Tonight | WTTW`                                                                      
## `SourceChicago Tribune`                                                                             
## SourceChicagoist                                                                                    
## `SourceChicagoNow (blog)`                                                                           
## `SourceChichester Observer`                                                                         
## `SourceChillicothe Gazette`                                                                         
## `SourceChilliwack Progress`                                                                         
## `SourceChina Daily`                                                                                 
## `SourceChina Daily HK Edition`                                                                      
## `SourceChina Digital Times`                                                                         
## `SourceChina Economic Net`                                                                          
## `SourceChina Economic Review`                                                                       
## `SourceChina Post`                                                                                  
## SourceChina.org.cn                                                                                  
## `SourceChinadaily USA`                                                                              
## SourceChinaFile                                                                                     
## SourceChinapost                                                                                     
## SourceChinatopix                                                                                    
## SourceChinaTopix                                                                                    
## `SourceChip Chick`                                                                                  
## SourceCHOICE                                                                                        
## `SourceChristian Broadcasting Network`                                                              
## `SourceChristian Daily`                                                                             
## `SourceChristian News Network`                                                                      
## `SourceChristian Post`                                                                              
## `SourceChristian Science Monitor`                                                                   
## `SourceChristian Science Monitor via Yahoo Canada News`                                             
## `SourceChristian Science Monitor via Yahoo UK & Ireland News`                                       
## `SourceChristian Science Monitor via Yahoo! News`                                                   
## `SourceChristian Today`                                                                             
## SourceChristianityToday.com                                                                         
## SourceChristianToday                                                                                
## SourceChron.com                                                                                     
## `SourceChron.com (blog)`                                                                            
## SourceChronicle                                                                                     
## `SourceChronicle of Higher Education (subscription)`                                                
## `SourceChronicle of Higher Education (subscription) (blog)`                                         
## `SourceChronicle of Philanthropy (subscription)`                                                    
## SourceChronicleLive                                                                                 
## `SourceChurch Militant`                                                                             
## `SourceChurch Times`                                                                                
## `SourceCihan News Agency`                                                                           
## SourceCILISOS.MY                                                                                    
## `SourceCincinnati Business Courier`                                                                 
## `SourceCincinnati Business Courier (blog)`                                                          
## SourceCincinnati.com                                                                                
## `SourceCincinnati.com (blog)`                                                                       
## `SourceCinema Blend`                                                                                
## SourceCInewsNow                                                                                     
## SourceCIO                                                                                           
## `SourceCIO Australia`                                                                               
## `SourceCIO Dive`                                                                                    
## `SourceCIO Insight`                                                                                 
## `SourceCIO New Zealand`                                                                             
## `SourceCIO Today`                                                                                   
## `SourceCIO UK`                                                                                      
## `SourceCIOReview (press release)`                                                                   
## SourceCirculate                                                                                     
## `SourceCities Today`                                                                                
## SourceCitifmonline                                                                                  
## SourceCitizen                                                                                       
## `SourceCitizen TV (press release)`                                                                  
## `SourceCitizens Voice`                                                                              
## `SourceCitrus County Chronicle`                                                                     
## `SourceCity & County of San Francisco (press release)`                                              
## `SourceCity A.M.`                                                                                   
## `SourceCity Limits`                                                                                 
## `SourceCity Pages`                                                                                  
## SourceCityLab                                                                                       
## SourceCityMetric                                                                                    
## SourceCityNews                                                                                      
## SourceCitywire.co.uk                                                                                
## `SourceCivil Society Media`                                                                         
## `SourceCIWM Journal Online`                                                                         
## SourceCJOB                                                                                          
## `SourceCKGSB Knowledge`                                                                             
## `SourceCKNW News Talk 980`                                                                          
## SourceClaimsJournal.com                                                                             
## SourceClapway                                                                                       
## `SourceClaremore Daily Progress`                                                                    
## `SourceClarence Valley Daily Examiner`                                                              
## `SourceClarksville Leaf Chronicle`                                                                  
## `SourceClay County Times-Democrat`                                                                  
## SourceCleanTechnica                                                                                 
## `SourceCleveland 19 News`                                                                           
## Sourcecleveland.com                                                                                 
## `SourceClick Green`                                                                                 
## SourceClickOnDetroit                                                                                
## `SourceClimate Central`                                                                             
## `SourceClimate Home`                                                                                
## `SourceClinton Herald`                                                                              
## `SourceCloud Computing Intelligence (registration)`                                                 
## `SourceCloud Pro`                                                                                   
## `SourceCloud Tech`                                                                                  
## SourceCloudTech                                                                                     
## SourceCloudWedge                                                                                    
## `SourceCLTV Chicago`                                                                                
## SourceCMSWire                                                                                       
## SourceCNBC                                                                                          
## `SourceCNBC (subscription)`                                                                         
## `SourceCNBC via Yahoo Canada Finance`                                                               
## `SourceCNBC via Yahoo! Finance`                                                                     
## `SourceCNBC via Yahoo! Finance India`                                                               
## `SourceCNBC via Yahoo! New Zealand Finance`                                                         
## `SourceCNBC via Yahoo!7 Finance`                                                                    
## SourceCNBCAfrica.com                                                                                
## SourceCNET                                                                                          
## `SourceCNET en español via Yahoo! News`                                                             
## `SourceCNET UK`                                                                                     
## `SourceCNET via Yahoo! Finance`                                                                     
## `SourceCNET via Yahoo! News`                                                                        
## SourceCNN                                                                                           
## `SourceCNN International`                                                                           
## `SourceCNN Money`                                                                                   
## `SourceCNN Philippines`                                                                             
## SourceCNN.com                                                                                       
## SourceCNNMoney                                                                                      
## SourceCNSNews.com                                                                                   
## `SourceCNSNews.com (blog)`                                                                          
## `SourceCNW Group via Yahoo Canada Finance`                                                          
## `SourceCNW Group via Yahoo! Finance`                                                                
## `SourceCo-operative News`                                                                           
## SourceCo.Create                                                                                     
## SourceCo.Design                                                                                     
## `SourceCo.Design (blog)`                                                                            
## SourceCo.Exist                                                                                      
## `SourceCoAssets via Yahoo! Singapore News`                                                          
## `SourceCoast Reporter`                                                                           ***
## `SourceCochrane Times`                                                                              
## `SourceCoconuts Bangkok`                                                                            
## `SourceCoconuts Hong Kong`                                                                          
## `SourceCoffs Coast Advocate`                                                                        
## SourceCoinDesk                                                                                      
## SourceCoinReport                                                                                    
## SourceCoinTelegraph                                                                                 
## `SourceColombia Reports`                                                                            
## `SourceColombo Gazette`                                                                             
## `SourceColorado Springs Gazette`                                                                    
## `SourceColorLines magazine`                                                                         
## `SourceColumbia Daily Herald`                                                                       
## `SourceColumbia Daily Tribune`                                                                      
## `SourceColumbia Journalism Review`                                                                  
## `SourceColumbia Missourian`                                                                         
## `SourceColumbus Business First`                                                                     
## `SourceColumbus Dispatch`                                                                           
## `SourceColumbus Dispatch (blog)`                                                                    
## `SourceColumbus Ledger-Enquirer`                                                                    
## `SourceComcast SportsNet Philadelphia`                                                              
## `SourceComet 24`                                                                                    
## SourceComicbook.com                                                                                 
## `SourceCommBank MyWealth`                                                                           
## `SourceCommentary Magazine`                                                                         
## `SourceCommercial Property Executive`                                                               
## `SourceCommittee for Accuracy in Middle East Reporting in America`                                  
## `SourceCommittee for Accuracy in Middle East Reporting in America (blog)`                           
## `SourceCommon Dreams (press release)`                                                               
## SourceCommonDreams.org                                                                              
## SourceCommonSpace                                                                                   
## `SourceCommonweal (blog)`                                                                           
## `SourceCommonWealth magazine`                                                                       
## `SourceCommunist Party USA`                                                                         
## `SourceCommunity Financial News`                                                                    
## `SourceComox Valley Record`                                                                         
## `SourceComplete Music Update`                                                                       
## SourceComplex                                                                                       
## `SourceComputer Business Review`                                                                    
## `SourceComputer Dealer News`                                                                        
## `SourceComputer Weekly`                                                                             
## `SourceComputer World Australia`                                                                    
## SourceComputerWeekly.com                                                                            
## `SourceComputerWeekly.com (blog)`                                                                   
## SourceComputerworld                                                                                 
## `SourceComputerworld Australia`                                                                     
## `SourceComputerworld New Zealand`                                                                   
## SourceComputerworldUK                                                                               
## SourceComputing                                                                                     
## SourceComputing.co.uk                                                                               
## `SourceConcord Monitor`                                                                             
## `SourceConcord Transcript`                                                                          
## `SourceCond\\u009d\\u009d Nast Traveler`                                                            
## `SourceCondé Nast Traveller`                                                                        
## `SourceConnecticut Jewish Ledger`                                                                   
## `SourceConnecticut Post`                                                                            
## `SourceConsequence of Sound (blog)`                                                                 
## `SourceConservative Home`                                                                           
## `SourceConsortium News`                                                                             
## Sourceconsortiumnews.com                                                                            
## `SourceConstitution Daily (blog)`                                                                   
## `SourceConstruction Week Online`                                                                    
## SourceConsultancy.uk                                                                                
## `SourceConsumer Reports via Yahoo Canada Finance`                                                   
## `SourceConsumer Reports via Yahoo! Finance`                                                         
## `SourceContra Costa Times`                                                                          
## `SourceContractor UK`                                                                               
## `SourceCoos Bay World`                                                                              
## `SourceCops 2.0`                                                                                    
## `SourceCordele Dispatch`                                                                            
## `SourceCorn and Soybean Digest (blog)`                                                              
## `SourceCornell Chronicle`                                                                           
## `SourceCornell University The Cornell Daily Sun`                                                    
## `SourceCornish Guardian`                                                                            
## `SourceCorpus Christi Caller-Times`                                                                 
## `SourceCorsicana Daily Sun`                                                                         
## `SourceCorvallis Gazette Times`                                                                     
## `SourceCorvus Business Newswire`                                                                    
## SourceCosmopolitan.com                                                                              
## `SourceCoStar Group`                                                                                
## `SourceCotswold Journal`                                                                            
## `SourceCouncil on Foreign Relations`                                                                
## `SourceCouncil on Foreign Relations (blog)`                                                         
## `SourceCounsel & Heal`                                                                              
## SourceCounterCurrents.org                                                                           
## SourceCounterPunch                                                                                  
## `SourceCourier Mail`                                                                                
## `SourceCoventry City FC`                                                                            
## `SourceCoventry Telegraph`                                                                          
## `SourceCP24 Toronto's Breaking News`                                                                
## `SourceCPI Financial`                                                                               
## `SourceCQ Politics`                                                                                 
## SourceCrackBerry.com                                                                                
## `SourceCrain's Chicago Business`                                                                    
## `SourceCrain's Chicago Business (blog)`                                                             
## `SourceCrain's Cleveland Business`                                                                  
## `SourceCrain's Detroit Business`                                                                    
## `SourceCrain's Detroit Business (blog)`                                                             
## `SourceCrain's New York Business`                                                                   
## `SourceCrain's New York Business (blog)`                                                            
## `SourceCrain&#39;s New York Business`                                                               
## `SourceCrave Online`                                                                                
## `SourceCreamer Media's Engineering News`                                                            
## `SourceCreamer Media's Mining Weekly`                                                               
## SourceCreativity                                                                                    
## `SourceCredit.com via Yahoo! Finance`                                                               
## SourceCRIENGLISH.com                                                                                
## SourceCrikey                                                                                        
## `SourceCrikey (registration)`                                                                       
## SourceCRN                                                                                           
## `SourceCRN - UK`                                                                                    
## `SourceCRN Australia`                                                                               
## `SourceCrookston Daily Times`                                                                       
## `SourceCross Rhythms`                                                                               
## `SourceCrowdfund Insider`                                                                           
## SourceCrowdsourcing.org                                                                             
## `SourceCrux: Covering all things Catholic`                                                          
## SourceCryptoCoinsNews                                                                               
## `SourceCSO Australia`                                                                               
## `SourceCSO Online`                                                                                  
## SourceCSPnet.com                                                                                    
## `SourceCSRwire.com (press release)`                                                                 
## `SourceCT Post`                                                                                     
## SourceCTR                                                                                           
## `SourceCTV British Columbia News`                                                                   
## `SourceCTV Calgary News`                                                                            
## `SourceCTV Montreal News`                                                                           
## `SourceCTV News`                                                                                    
## `SourceCTV Ottawa News`                                                                             
## `SourceCTV Toronto`                                                                                 
## SourceCTV.ca                                                                                        
## `SourceCU Boulder News & Events`                                                                    
## `SourceCU Columbia Spectator`                                                                       
## `SourceCult of Mac`                                                                                 
## SourceCurbed                                                                                        
## `SourceCurbed Chicago`                                                                              
## `SourceCurbed DC`                                                                                   
## `SourceCustomer Think`                                                                              
## `SourceCW39 NewsFix`                                                                                
## SourceCXOToday.com                                                                                  
## `SourceCycling Weekly`                                                                              
## `SourceCyprus Mail`                                                                                 
## `SourceCzech Happenings`                                                                            
## `SourceD Magazine`                                                                                  
## `SourceDaiji World`                                                                                 
## SourceDaijiworld.com                                                                                
## `SourceDaily American Online`                                                                       
## `SourceDaily Astorian`                                                                              
## `SourceDaily Aztec`                                                                                 
## `SourceDaily Beast`                                                                                 
## `SourceDaily Bruin`                                                                                 
## `SourceDaily Californian`                                                                           
## `SourceDaily Caller`                                                                                
## `SourceDaily Capital (Capital TV)`                                                                  
## `SourceDaily Commercial`                                                                            
## `SourceDaily Courier`                                                                               
## `SourceDaily Democrat`                                                                              
## `SourceDaily Echo`                                                                                  
## `SourceDaily Excelsior`                                                                             
## `SourceDaily Express`                                                                               
## `SourceDaily Free Press (subscription)`                                                             
## `SourceDaily Herald`                                                                                
## `SourceDaily Journal`                                                                               
## `SourceDaily Kos`                                                                                   
## `SourceDaily Life`                                                                                  
## `SourceDaily Local News`                                                                            
## `SourceDaily Mail`                                                                                  
## `SourceDaily Maverick`                                                                              
## `SourceDaily Mirror`                                                                                
## `SourceDaily News`                                                                                  
## `SourceDaily News & Analysis`                                                                       
## `SourceDaily News | The National Newspaper (press release) (blog)`                                  
## `SourceDaily News Egypt`                                                                            
## `SourceDaily Nexus`                                                                                 
## `SourceDaily NK`                                                                                    
## `SourceDaily Northwestern`                                                                          
## `SourceDaily Pakistan`                                                                              
## `SourceDaily Pioneer`                                                                               
## `Sourcedaily post`                                                                                  
## `SourceDaily Post Nigeria`                                                                          
## `SourceDaily Post North Wales`                                                                      
## `SourceDaily Press`                                                                                 
## `SourceDaily Reckoning - Australian Edition`                                                        
## `SourceDaily Record`                                                                                
## `SourceDaily Sabah`                                                                                 
## `SourceDaily Signal`                                                                                
## `SourceDaily Star`                                                                                  
## `SourceDaily Star Gazette`                                                                          
## `SourceDaily Sun`                                                                                   
## `SourceDaily Telegraph`                                                                             
## `SourceDaily Times`                                                                                 
## `SourceDaily Times Nigeria`                                                                         
## `SourceDaily Trojan Online`                                                                         
## `SourceDaily Trust`                                                                                 
## `SourceDaily Yonder`                                                                                
## SourceDailyFinance                                                                                  
## SourceDailyForex.com                                                                                
## SourceDailyFX                                                                                       
## `SourceDailyFX via Yahoo! Finance`                                                                  
## `SourceDailyFX via Yahoo! New Zealand Finance`                                                      
## `SourceDailyFX via Yahoo!7 Finance`                                                                 
## SourceDailyNews                                                                                     
## SourceDailyO                                                                                        
## `SourceDailyPost Nigeria`                                                                           
## Sourcedailytelegraph.com.au                                                                         
## SourceDailyuw                                                                                       
## `SourceDakota Financial News`                                                                       
## `SourceDallas Business Journal`                                                                     
## `SourceDallas Business Journal (blog)`                                                              
## `SourceDallas Morning News`                                                                         
## `SourceDallas Morning News (blog)`                                                                  
## `SourceDallas Sun Times`                                                                            
## `SourceDanbury News Times`                                                                          
## `SourceDarien News-Review`                                                                          
## `SourceDark Reading`                                                                                
## `SourceData Center Knowledge`                                                                       
## SourceDatamation                                                                                    
## SourceDatanami                                                                                      
## SourceDATAQUEST                                                                                     
## `SourceDavid Curry, Digital Trends via Yahoo! News`                                                 
## SourceDawn                                                                                          
## SourceDAWN.com                                                                                      
## `SourceDay Herald`                                                                                  
## `SourceDayton Business Journal`                                                                     
## `SourceDayton Daily News`                                                                           
## `SourceDaytona Beach News-Journal`                                                                  
## `SourceDazeinfo (blog)`                                                                             
## `SourceDC Inno`                                                                                     
## SourceDCist.com                                                                                     
## `SourceDe Dagelijkse Standaard (Blog)`                                                              
## `SourceDe Montfort University (press release)`                                                      
## SourceDeadline                                                                                      
## `SourceDeadline Hollywood`                                                                          
## SourceDeadspin                                                                                      
## SourceDealBreaker                                                                                   
## SourceDEALSTREETASIA                                                                                
## `SourceDeath and Taxes`                                                                             
## `SourceDEBKA file`                                                                                  
## SourceDEBKAfile                                                                                     
## `SourceDeccan Chronicle`                                                                            
## `SourceDeccan Herald`                                                                               
## SourceDeepika                                                                                       
## `SourceDefense One`                                                                                 
## SourceDefenseNews.com                                                                               
## `SourceDeKalb Daily Chronicle`                                                                      
## `SourceDelaware First Media`                                                                        
## SourceDelimiter                                                                                     
## `SourceDelmarva Daily Times`                                                                        
## SourceDelo                                                                                          
## `SourceDelta Farm Press`                                                                            
## `SourceDemocracy Now!`                                                                              
## `SourceDemocracy Now! (blog)`                                                                       
## `SourceDentistry IQ`                                                                                
## `SourceDenver Business Journal (blog)`                                                              
## `SourceDenver Post`                                                                                 
## `SourceDenver Sun Times`                                                                            
## `SourceDepartment of Defense`                                                                       
## `SourceDerby Telegraph`                                                                             
## `SourceDerbyshire Times`                                                                            
## `SourceDerry Journal`                                                                               
## `SourceDerry Now`                                                                                   
## `SourceDeseret News`                                                                                
## `SourceDesign & Trend`                                                                              
## `SourceDesign Week`                                                                                 
## `SourceDesign World Network`                                                                        
## `SourceDesignboom (blog)`                                                                           
## SourceDesignNews                                                                                    
## SourceDESINFOS.com                                                                                  
## `SourceDeSmog Canada`                                                                               
## SourceDesMoinesRegister.com                                                                         
## `SourceDestination CRM`                                                                             
## SourceDestinyMan                                                                                    
## SourceDestructoid                                                                                   
## SourceDetails                                                                                       
## `SourceDetroit Free Press`                                                                          
## `SourceDetroit News`                                                                                
## `SourceDeutsche Welle`                                                                              
## SourceDevelop                                                                                       
## `SourceDeveloper Tech`                                                                              
## SourceDeveloper.com                                                                                 
## SourceDeveloperTech                                                                                 
## SourceDevex                                                                                         
## `SourceDevils Lake Journal`                                                                         
## SourceDexigner                                                                                      
## SourceDezeen                                                                                        
## Sourcedh.be                                                                                         
## `SourceDhaka Tribune`                                                                               
## SourceDhakaTribune                                                                                  
## `SourceDiamondback Online`                                                                          
## `SourceDickinson Press`                                                                             
## `SourceDigi Times`                                                                                  
## SourceDigiday                                                                                       
## SourceDiginomica                                                                                    
## SourceDigit                                                                                         
## `SourceDigital Arts Online`                                                                         
## `SourceDigital Journal`                                                                             
## `SourceDigital Music News`                                                                          
## `SourceDigital Spy`                                                                                 
## `SourceDigital Trends`                                                                              
## `SourceDigital Trends via Yahoo Canada News`                                                        
## `SourceDigital Trends via Yahoo Maktoob News`                                                       
## `SourceDigital Trends via Yahoo UK & Ireland News`                                                  
## `SourceDigital Trends via Yahoo! Finance`                                                           
## `SourceDigital Trends via Yahoo! News`                                                              
## `SourceDigital Trends via Yahoo! Sports`                                                            
## SourceDigitalBroadcastingcom                                                                        
## SourceDIGITALLOOK                                                                                   
## SourceDigitalTVEurope.net                                                                           
## SourceDigitimes                                                                                     
## `SourceDin Merican`                                                                                 
## `SourceDirect Marketing News`                                                                       
## SourceDirectionsMag.com                                                                             
## `SourceDirector magazine`                                                                           
## `SourceDisability Scoop`                                                                            
## SourceDiscover                                                                                      
## `SourceDiscover Humboldt`                                                                           
## `SourceDiscover Magazine (blog)`                                                                    
## `SourceDiscovery News`                                                                              
## `SourceDissident Voice`                                                                             
## `SourceDiverse: Issues in Higher Education`                                                         
## SourceDividend.com                                                                                  
## SourceDJBooth.net                                                                                   
## `SourceDL-Online`                                                                                   
## `SourceDNA India`                                                                                   
## SourceDNAinfo                                                                                       
## SourceDOGOnews                                                                                      
## `SourceDoha News`                                                                                   
## `SourceDomain News`                                                                                 
## `SourceDominican Today`                                                                             
## SourceDoordarshan                                                                                   
## `SourceDorking and Leatherhead Advertiser`                                                          
## `SourceDorset Echo`                                                                                 
## `SourceDothan Eagle`                                                                                
## `SourceDothan First`                                                                                
## `SourceDouglas Budget`                                                                              
## `SourceDover Post`                                                                                  
## `SourceDownload.com via Yahoo! News`                                                                
## `SourceDream Team FC`                                                                               
## `SourceDreuz Info`                                                                                  
## `SourceDrexel University The Triangle Online`                                                       
## SourceDriving                                                                                       
## SourceDSNews.com                                                                                    
## `SourceDubuque Telegraph Herald`                                                                    
## `SourceDuluth News Tribune`                                                                         
## `SourceDuncan Banner`                                                                               
## `SourceDunyaNews Pakistan`                                                                          
## `SourceDunyaNews Pakistan (blog)`                                                                   
## `SourceDurham Herald Sun`                                                                           
## SourceDutchNews.nl                                                                                  
## `SourceDZ Foot`                                                                                     
## `SourceDZone News`                                                                                  
## `SourceE-Commerce Times`                                                                            
## `SourceE-Flux`                                                                                      
## `SourceE-Pao.net`                                                                                   
## `SourceE Kantipur`                                                                                  
## `SourceE! Online`                                                                                   
## `SourceE&T magazine`                                                                                
## Sourcee27                                                                                           
## `Sourcee27 via Yahoo! Singapore News`                                                               
## `SourceEagle-Tribune`                                                                               
## `SourceEagle Radio`                                                                                 
## `SourceEast African Business Week`                                                                  
## `SourceEast Anglian Daily Times`                                                                    
## `SourceEast Asia Forum`                                                                             
## `SourceEast Bay Express`                                                                            
## `SourceEast Bay Times`                                                                              
## `SourceEast Coast Radio`                                                                            
## `SourceEast London and West Essex Guardian Series`                                                  
## `SourceEast Oregonian (subscription)`                                                               
## `SourceEastbourne Herald`                                                                           
## SourceEastday.com                                                                                   
## `SourceEat Out Magazine`                                                                            
## SourceEater                                                                                         
## `SourceEater Austin`                                                                                
## `SourceEater DC`                                                                                    
## `SourceEater Detroit (blog)`                                                                        
## `SourceEater Seattle`                                                                               
## `SourceeCampus News`                                                                                
## `SourceECB Publishing`                                                                              
## SourceEcho                                                                                          
## SourceEchonetdaily                                                                                  
## SourceECNmag.com                                                                                    
## Sourceecns                                                                                          
## `Sourceeco-business.com`                                                                            
## Sourceeconomia                                                                                      
## `SourceEconomic Calendar`                                                                           
## `SourceEconomic Times`                                                                              
## `SourceEconomic Times (blog)`                                                                       
## SourceEconomics21                                                                                   
## `SourceEconoMonitor (blog)`                                                                         
## SourceEconomy                                                                                       
## SourceEconomyWatch.com                                                                              
## SourceEconoTimes                                                                                    
## `SourceEContent (press release)`                                                                    
## SourceEcoWatch                                                                                      
## `SourceEcumenical News`                                                                             
## Sourceedie.net                                                                                      
## `SourceEdmond Sun`                                                                                  
## `SourceEdmonton Journal`                                                                            
## `SourceEdmonton Sun`                                                                                
## SourceEdmunds.com                                                                                   
## SourceEdSurge                                                                                       
## `SourceEdTech Magazine: Focus on Higher Education`                                                  
## `SourceEducation Dive`                                                                              
## `SourceEducation Week (subscription)`                                                               
## `SourceEducation Week (subscription) (blog)`                                                        
## `SourceEducators NZ`                                                                                
## `SourceEE Times`                                                                                    
## `SourceEE Times Asia`                                                                               
## SourceEETimes                                                                                       
## SourceEFF                                                                                           
## `SourceEffingham's News Leader`                                                                     
## `SourceEffingham Daily News`                                                                        
## `SourceEgypt Independent`                                                                           
## `SourceEgypt SIS (press release)`                                                                   
## `SourceEgyptian Streets`                                                                            
## `SourceEJ Insight`                                                                                  
## SourceEkklesia                                                                                      
## `SourceEl Moudjahid`                                                                                
## `SourceEl Paisano`                                                                                  
## `SourceEl Watan`                                                                                    
## `Sourceelan: The Guide to Global Muslim Culture`                                                    
## `SourceElectronic Beats (press release) (blog)`                                                     
## `SourceElectronics EETimes (registration)`                                                          
## `SourceElectronics Weekly`                                                                          
## `SourceElectronics Weekly (blog)`                                                                   
## `SourceElite Daily`                                                                                 
## `SourceElite Daily (blog)`                                                                          
## `SourceElizabethtown News Enterprise`                                                               
## `SourceElko Daily Free Press`                                                                       
## `SourceELLE UK`                                                                                     
## SourceELLE.com                                                                                      
## `SourceElliott Wave`                                                                                
## SourceEllwoodCity.org                                                                               
## `SourceEly News`                                                                                    
## SourceeMarketer                                                                                     
## `SourceEmbassy News (subscription)`                                                                 
## `SourceEmergency Management (blog)`                                                                 
## Sourceemergingmarkets.org                                                                           
## `SourceEmirates 24|7`                                                                               
## SourceEMQ                                                                                           
## `SourceEN DELFI`                                                                                    
## `SourceEN DELFI (subscription)`                                                                     
## SourceeNCA                                                                                          
## `SourceEnergy Matters`                                                                              
## `SourceEnergy Voice`                                                                                
## `SourceEnergy.gov (blog)`                                                                           
## `SourceeNews Park Forest`                                                                           
## SourceEngadget                                                                                      
## `SourceEngadget (blog)`                                                                             
## SourceENGINEERING.com                                                                               
## SourceEnnahar                                                                                       
## `SourceEnough Project`                                                                              
## `SourceEnough Project (blog)`                                                                       
## `SourceENPI Info Centre`                                                                            
## SourceEnsia                                                                                         
## SourceEnstarz                                                                                       
## `SourceEnter Stage Right`                                                                           
## `SourceEnterprise Apps Tech`                                                                        
## `SourceEnterprise Innovation`                                                                       
## `SourceEnterprise Irregulars (blog)`                                                                
## `SourceEnterprise Leader`                                                                           
## `SourceEnterprise Times`                                                                            
## `SourceEnterpriseContentManagementConnection-ECM`                                                   
## SourceEnterpriseTech                                                                                
## `SourceEntertainment Tonight`                                                                       
## `SourceEntertainment Tonight via Yahoo Canada News`                                                 
## `SourceEntertainment Weekly`                                                                        
## `SourceEntertainment Weekly (blog)`                                                                 
## SourceEntrepreneur                                                                                  
## `SourceEntrepreneur via Yahoo Canada Finance`                                                       
## `SourceEntrepreneur via Yahoo! Finance`                                                             
## SourceEntrpreneur                                                                                   
## `SourceEnvironment & Energy Publishing`                                                             
## `SourceEnvironmental Data Interactive Exchange`                                                     
## `SourceEnvironmental Defense Fund (blog)`                                                           
## `SourceEnvironmental Finance`                                                                       
## `SourceEnvironmental Leader`                                                                        
## `SourceEnvironmental News Network`                                                                  
## `SourceEnvironmental Working Group`                                                                 
## SourceeParisExtra.com                                                                               
## `SourceEqual Times`                                                                                 
## `SourceEquilibrio Informativo`                                                                      
## SourceEquities.com                                                                                  
## `SourceErie Times-News`                                                                             
## `SourceErvik.as (press release) (registration) (blog)`                                              
## `Sourceeské noviny`                                                                                 
## SourceESPN                                                                                          
## `SourceESPN (blog)`                                                                                 
## `SourceESPN Blogs`                                                                                  
## `SourceESPN FC`                                                                                     
## `SourceESPN FC (blog)`                                                                              
## SourceESPNcricinfo.com                                                                              
## SourceEsquire.com                                                                                   
## SourceEssence.com                                                                                   
## `SourceEssex Chronicle`                                                                             
## SourceETAuto.com                                                                                    
## SourceETCIO.com                                                                                     
## `SourceETF Daily News`                                                                              
## `SourceETF Trends via Yahoo! Finance`                                                               
## `SourceETF.com via Yahoo! Finance`                                                                  
## SourceETFinalScore.com                                                                              
## `SourceETonline via Yahoo Celebrity`                                                                
## SourceETRetail.com                                                                                  
## SourceETtech.com                                                                                    
## SourceETTelecom.com                                                                                 
## SourceeTurboNews                                                                                    
## `SourceEu Business`                                                                                 
## `SourceEU News`                                                                                     
## `SourceEUbusiness (press release)`                                                                  
## SourceEUobserver                                                                                    
## SourceEurActiv                                                                                      
## `SourceEurasia Review`                                                                              
## SourceEurasiaNet                                                                                    
## `SourceEureka Times Standard`                                                                       
## `SourceEurekAlert (press release)`                                                                  
## `SourceEurekAlert!`                                                                                 
## SourceEurogamer.net                                                                                 
## `SourceEuromoney magazine`                                                                          
## Sourceeuronews                                                                                      
## SourceEuroNews                                                                                      
## `SourceEurope Online Magazine`                                                                      
## `SourceEuropean Council on Foreign Relations`                                                       
## `SourceEuropean Jewish Press`                                                                       
## `SourceEuropean Parliament (press release)`                                                         
## SourceEuropeanCEO                                                                                   
## `SourceEUROPP - European Politics and Policy (blog)`                                                
## SourceEuroScientist                                                                                 
## SourceEurosport                                                                                     
## SourceEURweb                                                                                        
## SourceEurweb.com                                                                                    
## `SourceEvenimentul Zilei`                                                                           
## `SourceEvening Chronicle`                                                                           
## `SourceEvening Standard`                                                                            
## `SourceEveningTimes Online`                                                                         
## `SourceEvent Magazine`                                                                              
## SourceEventHubs                                                                                     
## `SourceEverett Herald`                                                                              
## Sourceevertiq.com                                                                                   
## SourceEverythingLubbock.com                                                                         
## SourceeWeek                                                                                         
## `SourceExaminer Enterprise`                                                                         
## `SourceExaminer Gazette`                                                                            
## SourceExaminer.com                                                                                  
## `SourceExaminerPost.com (blog)`                                                                     
## `SourceExcalibur Online`                                                                            
## `SourceExchange News Direct`                                                                        
## `SourceExchange Rates UK`                                                                           
## `SourceExchangeWire (blog)`                                                                         
## `SourceExecutive Mosaic Media (blog)`                                                               
## `SourceExecutiveBiz (blog)`                                                                         
## `SourceExpert Reviews`                                                                              
## `SourceExperts Exchange (blog)`                                                                     
## `SourceExpress Computer`                                                                            
## SourceExpress.co.uk                                                                                 
## Sourceexpressandstar.com                                                                            
## SourceExtremeTech                                                                                   
## `SourceEye For Travel`                                                                              
## Sourceeyefortravel.com                                                                              
## `SourceEyewitness News`                                                                             
## `SourceEyewitness News 3 Hartford`                                                                  
## SourceeZadar                                                                                        
## `SourceFabius Maximus website (blog)`                                                               
## SourceFactCheck.org                                                                                 
## SourceFAIR                                                                                          
## `SourceFair Observer`                                                                               
## `SourceFairbanks Daily News-Miner`                                                                  
## `SourceFairfield Daily Republic`                                                                    
## `SourceFamagusta Gazette`                                                                           
## `SourceFamily Security Matters`                                                                     
## SourceFanSided                                                                                      
## `SourceFarm Business Communications`                                                                
## `SourceFarm Futures`                                                                                
## `SourceFarm Weekly`                                                                                 
## SourceFarmersWeekly                                                                                 
## `SourceFarming Life`                                                                                
## `SourceFarmington Daily Times`                                                                      
## `SourceFashionista (blog)`                                                                          
## `SourceFast Company`                                                                                
## `SourceFast Company Magazine`                                                                       
## `SourceFayetteville Observer`                                                                       
## `SourceFC Inter.it`                                                                                 
## Sourcefdanewsalert.com                                                                              
## `SourceFederal Computer Week`                                                                       
## `SourceFederal Reserve Bank of San Francisco`                                                       
## `SourceFederal Reserve Bank of San Francisco (blog)`                                                
## `SourceFederal Times`                                                                               
## SourceFederalNewsRadio.com                                                                          
## SourceFedScoop                                                                                      
## SourceFeedstuffs                                                                                    
## `SourceFG Insight`                                                                                  
## SourceFIBA                                                                                          
## SourceFibre2fashion.com                                                                             
## `SourceFIDH (Communiqu\\u009d\\u009d de presse)`                                                    
## `SourceFIDH (press release)`                                                                        
## SourceFierceCIO                                                                                     
## SourceFierceContentManagement                                                                       
## SourceFierceEnterpriseCommunications                                                                
## SourceFierceGovernmentIT                                                                            
## `SourceFierceMedicalDevices (press release) (registration)`                                         
## SourceFierceMobileIT                                                                                
## SourceFierceTelecom                                                                                 
## SourceFierceWireless                                                                                
## SourceFIFA                                                                                          
## SourceFIFA.com                                                                                      
## `SourceFife Today`                                                                                  
## `SourceFight Back! Newspaper`                                                                       
## `SourceFiji Sun Online`                                                                             
## `SourceFiji Times`                                                                                  
## `SourceFileHippo News`                                                                              
## `SourceFinalCall.com News`                                                                          
## `SourceFinance and Commerce`                                                                        
## `SourceFinance Magnates`                                                                            
## `SourceFinance Magnates (blog)`                                                                     
## SourceFinanceAsia                                                                                   
## `SourceFinancial Advisor Magazine (registration)`                                                   
## `SourceFinancial Director`                                                                          
## `SourceFinancial Express`                                                                           
## `SourceFinancial Express Bangladesh`                                                                
## `SourceFinancial Market News`                                                                       
## `SourceFinancial News (subscription)`                                                               
## `SourceFinancial Planning`                                                                          
## `SourceFinancial Post`                                                                              
## `SourceFinancial Times`                                                                             
## `SourceFinancial Times via Yahoo! New Zealand Finance`                                              
## SourceFinancialSpots.com                                                                            
## SourceFinanzen.net                                                                                  
## SourcefindBIOMETRICS                                                                                
## Sourcefinder.com.au                                                                                 
## SourceFinextra                                                                                      
## `SourceFinextra (press release)`                                                                    
## `SourceFingal Independent`                                                                          
## `SourceFirst Things (blog)`                                                                         
## SourceFirstcoastnews.com                                                                            
## SourceFirstpost                                                                                     
## `SourceFirstpost (satire)`                                                                          
## SourceFiveThirtyEight                                                                               
## `SourceFlathead Beacon`                                                                             
## SourceFlavorwire                                                                                    
## `SourceFleet Owner (blog)`                                                                          
## SourceFleetNews                                                                                     
## `SourceFleetwood Today`                                                                             
## SourceFlightglobal                                                                                  
## `SourceFlorida Flambeau`                                                                            
## `SourceFlorida Politics (blog)`                                                                     
## `SourceFlorida Times-Union`                                                                         
## `SourceFlorida Today`                                                                               
## `SourceFlorida Trend`                                                                               
## `SourceFlyer News`                                                                                  
## `SourceFM World`                                                                                    
## `SourceFocus News`                                                                                  
## `SourceFocus Taiwan News Channel`                                                                   
## `SourceFond du Lac Reporter`                                                                        
## `SourceFood Tank (blog)`                                                                            
## SourceFoodManufacture.co.uk                                                                         
## `SourceFoodNavigator-Asia.com`                                                                      
## SourceFoodProductionDaily.com                                                                       
## `SourceFor The Win`                                                                                 
## SourceForbes                                                                                        
## `SourceForbes India`                                                                                
## `SourceForbes via Yahoo! Finance`                                                                   
## `SourceForbes via Yahoo! News`                                                                      
## `SourceForeign Affairs`                                                                             
## `SourceForeign Affairs (subscription)`                                                              
## `SourceForeign Policy`                                                                              
## `SourceForeign Policy (blog)`                                                                       
## `SourceForeign Policy Blogs (blog)`                                                                 
## `SourceForeign Policy In Focus`                                                                     
## `SourceForeign Policy Journal`                                                                      
## `SourceForeign Relations`                                                                           
## `SourceForex Factory`                                                                               
## SourceForexLive                                                                                     
## `SourceFormtek Blog (blog)`                                                                         
## `SourceFort Wayne Journal Gazette`                                                                  
## `SourceFort Wayne Journal Gazette (blog)`                                                           
## `SourceFort Worth Star-Telegram`                                                                    
## `SourceFort Worth Star Telegram`                                                                    
## `SourceFort Worth Star Telegram (blog)`                                                             
## SourceFortune                                                                                       
## `SourceFortune via Yahoo Canada Finance`                                                            
## `SourceFortune via Yahoo! Finance`                                                                  
## SourceForward                                                                                       
## `SourceFoster's Daily Democrat`                                                                     
## SourceFourFourTwo                                                                                   
## `SourceFourFourTwo via Yahoo Canada Sports`                                                         
## `SourceFOX 11 Los Angeles`                                                                          
## `SourceFOX 11 Reno`                                                                                 
## `SourceFOX 12 Oregon`                                                                               
## `SourceFOX 13 News, Tampa Bay`                                                                      
## `SourceFOX 13 Utah`                                                                                 
## `SourceFOX 19 Cincinnati`                                                                           
## `SourceFox 2 Detroit`                                                                               
## `SourceFOX 2 News St. Louis`                                                                        
## `SourceFox 28`                                                                                      
## `SourceFOX 28 South Bend`                                                                           
## `SourceFOX 29 News Philadelphia`                                                                    
## `SourceFOX 31 Denver`                                                                               
## `SourceFox 32 Chicago`                                                                              
## `SourceFox 35 Orlando`                                                                              
## `SourceFOX 4 Kansas City`                                                                           
## `SourceFOX 4 News`                                                                                  
## `SourceFOX 41 Louisville`                                                                           
## `SourceFOX 43 Harrisburg`                                                                           
## `SourceFOX 46 Charlotte`                                                                            
## `SourceFOX 5 Atlanta`                                                                               
## `SourceFOX 5 Las Vegas`                                                                             
## `SourceFOX 5 San Diego`                                                                             
## `SourceFox 59`                                                                                      
## `SourceFOX 59 Indianapolis`                                                                         
## `SourceFOX 6 Milwaukee`                                                                             
## `SourceFOX 6 News Birmingham`                                                                       
## `SourceFOX 61`                                                                                      
## `SourceFOX 7 Austin`                                                                                
## `SourceFOX 7 WTVW Evansville`                                                                       
## `SourceFOX 8 Cleveland`                                                                             
## `SourceFOX 8 New Orleans`                                                                           
## `SourceFOX 8 WGHP`                                                                                  
## `SourceFox Business`                                                                                
## `SourceFOX Business`                                                                                
## `SourceFox Business via Yahoo! Finance`                                                             
## `SourceFOX CT Hartford`                                                                             
## `SourceFOX Illinois`                                                                                
## `SourceFox News`                                                                                    
## `SourceFox News Insider`                                                                            
## `SourceFox News Latino`                                                                             
## `SourceFOX News Radio (blog)`                                                                       
## `SourceFox Sports`                                                                                  
## SourceFox11online.com                                                                               
## `SourceFOX13 Memphis`                                                                               
## Sourcefox13now.com                                                                                  
## SourceFox17                                                                                         
## SourceFOX21News.com                                                                                 
## Sourcefox2now.com                                                                                   
## `SourceFOX30 / CBS47 Jacksonville`                                                                  
## `SourceFOX31 Denver`                                                                                
## SourceFOX40                                                                                         
## `SourceFOX40 Sacramento`                                                                            
## SourceFOX43.com                                                                                     
## Sourcefox4kc.com                                                                                    
## SourceFox5NY                                                                                        
## Sourcefox5sandiego.com                                                                              
## Sourcefox6now.com                                                                                   
## Sourcefox8.com                                                                                      
## SourceFoxReno.com                                                                                   
## SourceFOXSports.com                                                                                 
## `SourceFRANCE 24`                                                                                   
## `SourceFranklin Independent`                                                                        
## `SourceFranklin News Post`                                                                          
## `SourceFraser Coast Chronicle`                                                                      
## `SourceFrederick News Post (subscription)`                                                          
## SourceFredericksburg.com                                                                            
## `SourceFree Malaysia Today`                                                                         
## `SourceFree Press Journal`                                                                          
## `SourceFreedom Newspaper`                                                                           
## SourceFreestonecountytimesonline                                                                    
## `SourceFresh Business Thinking`                                                                     
## SourceFreshPlaza                                                                                    
## `SourceFresno Bee`                                                                                  
## `SourceFresno Bee (blog)`                                                                           
## `SourceFresno Business Journal`                                                                     
## `SourceFrome Standard`                                                                              
## `SourceFrome Times`                                                                                 
## SourceFRONTLINE                                                                                     
## `SourceFrontPage Magazine`                                                                          
## `SourceFrost Illustrated`                                                                           
## SourceFSView                                                                                        
## `SourceFT Adviser`                                                                                  
## `SourceFT Alphaville (registration)`                                                                
## `SourceFT.com (blog)`                                                                               
## `SourceFT.com (registration) (blog)`                                                                
## `SourceFudzilla (blog)`                                                                             
## `SourceFuelFix (blog)`                                                                              
## `SourceFulton News`                                                                                 
## `SourceFund Strategy`                                                                               
## Sourcefuse.tv                                                                                       
## `SourceFuseworks via Yahoo! New Zealand Finance`                                                    
## SourceFusion                                                                                        
## SourceFXStreet                                                                                      
## SourceGadget                                                                                        
## SourceGadgette                                                                                      
## `SourceGainesville Sun`                                                                             
## `SourceGainesville Times`                                                                           
## `SourceGalesburg Register-Mail`                                                                     
## SourceGalleyCat                                                                                     
## SourceGallup                                                                                        
## SourceGallup.com                                                                                    
## SourceGamasutra                                                                                     
## `SourceGamasutra (blog)`                                                                            
## `SourceGame Debate`                                                                                 
## `SourceGame Informer`                                                                               
## `SourceGame Rant`                                                                                   
## `SourceGame Revolution`                                                                             
## SourceGameDev.net                                                                                   
## SourceGamenguide                                                                                    
## SourceGamepur                                                                                       
## `SourceGameranx (blog)`                                                                             
## `SourceGamereactor UK`                                                                              
## `SourceGames Radar`                                                                                 
## Sourcegamesindustry.biz                                                                             
## SourceGamesIndustry.biz                                                                             
## `SourceGamesIndustry.biz (registration)`                                                            
## SourceGameSpot                                                                                      
## `SourceGameSpot (blog)`                                                                             
## `SourceGameSpot via Yahoo! News`                                                                    
## SourceGamespresso                                                                                   
## `SourceGamesRadar (blog)`                                                                           
## SourceGameZone                                                                                      
## SourceGamingBolt                                                                                    
## `SourceGant Daily`                                                                                  
## `SourceGas 2.0`                                                                                     
## `SourceGatestone Institute`                                                                         
## SourceGawker                                                                                        
## `SourceGazette Live`                                                                                
## `SourceGazette News`                                                                                
## SourceGazetteNET                                                                                    
## `SourceGazetteUnion,com (blog)`                                                                     
## Sourcegbtimes                                                                                       
## SourceGCaptain                                                                                      
## SourceGCN.com                                                                                       
## `SourceGear Junkie (blog)`                                                                          
## Sourcegearburn                                                                                      
## SourceGearNuke                                                                                      
## SourceGeek                                                                                          
## `SourceGeek Snack`                                                                                  
## SourceGeek.com                                                                                      
## SourceGeekSided                                                                                     
## SourceGeektime                                                                                      
## SourceGeekWire                                                                                      
## `SourceGeeky Gadgets`                                                                               
## `SourceGeelong Advertiser`                                                                          
## SourceGematsu                                                                                       
## SourceGenomeWeb                                                                                     
## `SourceGeo News, Pakistan`                                                                          
## `SourceGeorgetown University The Hoya`                                                              
## `SourceGeorgia Today`                                                                               
## Sourcegetreading                                                                                    
## Sourcegetwestlondon                                                                                 
## `SourceGhacks Technology News`                                                                      
## `SourceGhana Broadcasting Corporation`                                                              
## SourceGhanasoccernet.com                                                                            
## SourceGhanaWeb                                                                                      
## SourceGhanaweb.com                                                                                  
## `SourceGia \\u009dnh Vnexpresss`                                                                    
## SourceGigaom                                                                                        
## `SourceGigaom via Yahoo! Finance`                                                                   
## `SourceGilmer Mirror`                                                                               
## `SourceGippsland Times`                                                                             
## `SourceGisborne Herald`                                                                             
## SourceGizbot                                                                                        
## Sourcegizmag                                                                                        
## SourceGizmag                                                                                        
## SourceGizmodo                                                                                       
## `SourceGizmodo Australia`                                                                           
## `SourceGizmodo India`                                                                               
## `SourceGizmodo UK`                                                                                  
## SourceGizmoids                                                                                      
## `SourceGladstone Observer`                                                                          
## SourceGlamour                                                                                       
## `SourceGlamour (blog)`                                                                              
## `SourceGlasgow Daily Times`                                                                         
## `SourceGlasgow Evening Times`                                                                       
## `SourceGlens Falls Post-Star`                                                                       
## `SourceGlenwood Springs Post Independent`                                                           
## `SourceGlobal Envision`                                                                             
## `SourceGlobal Grind`                                                                                
## `SourceGlobal Indonesian Voices (GIVnews.com)`                                                      
## `SourceGlobal Investor`                                                                             
## `SourceGlobal News`                                                                                 
## `SourceGlobal Risk Insights`                                                                        
## `SourceGlobal Times`                                                                                
## `SourceGlobal Trade Review (GTR)`                                                                   
## `SourceGlobal Voices Online`                                                                        
## SourceGlobalMeatNews.com                                                                            
## SourceGlobalnews.ca                                                                                 
## SourceGlobalPost                                                                                    
## `SourceGlobeNewswire (press release)`                                                               
## `SourceGlobeNewswire via Yahoo Canada Finance`                                                      
## `SourceGlobeNewswire via Yahoo UK & Ireland Finance`                                                
## `SourceGlobeNewswire via Yahoo! Finance`                                                            
## `SourceGlobeNewswire via Yahoo! Finance India`                                                      
## `SourceGlobeNewswire via Yahoo! New Zealand Finance`                                                
## `SourceGlobeNewswire via Yahoo!7 Finance`                                                           
## SourceGlobes                                                                                        
## `SourceGlobes Online`                                                                               
## SourceGlobeSt.com                                                                                   
## `SourceGMA News`                                                                                    
## `SourceGMA News Online`                                                                             
## `SourceGo Certify`                                                                                  
## SourceGoal.com                                                                                      
## `SourceGoal.com via Yahoo! Sports`                                                                  
## SourceGoDanRiver.com                                                                                
## SourceGoErie.com                                                                                    
## `SourceGold Coast Bulletin`                                                                         
## `SourceGold Seek`                                                                                   
## `SourceGolden Gate Xpress`                                                                          
## SourceGoldSeek.com                                                                                  
## SourceGolf.com                                                                                      
## SourceGolfDigest.com                                                                                
## SourceGoLocalProv                                                                                   
## `SourceGood Gear Guide`                                                                             
## `SourceGOOD Magazine`                                                                               
## `SourceGood Morning America via Yahoo! News`                                                        
## `SourceGood News Network`                                                                           
## `SourceGood News Pilipinas`                                                                         
## SourceGood4Utah                                                                                     
## `SourceGoodCall News (blog)`                                                                        
## `SourceGoogle (press release)`                                                                      
## SourceGOPUSA                                                                                        
## `SourceGoshen News`                                                                                 
## `SourceGospel Herald`                                                                               
## `SourceGossip Monthly Magazine`                                                                     
## `SourceGotham Gazette`                                                                              
## SourceGothamist                                                                                     
## `SourceGotta Be Mobile`                                                                             
## SourceGovConWire                                                                                    
## `SourceGovernance Now`                                                                              
## SourceGoverning                                                                                     
## `SourceGovernment of Canada News`                                                                   
## `SourceGovernment of Jamaica, Jamaica Information Service`                                          
## `SourceGovernment of Ontario News`                                                                  
## `SourceGovernment Technology`                                                                       
## `SourceGQ Magazine`                                                                                 
## SourceGQ.com                                                                                        
## `SourceGraham Cluley Security News`                                                                 
## `SourceGrand Forks Herald`                                                                          
## `SourceGrand Island Independent`                                                                    
## `SourceGrand Junction Daily Sentinel`                                                               
## `SourceGrand Rapids Herald-Review`                                                                  
## `SourceGrand River Sachem`                                                                          
## `SourceGrande Prairie Daily Herald-Tribune`                                                         
## `SourceGreat Falls Tribune`                                                                         
## SourceGreatandhra.com                                                                               
## `SourceGreater Baton Rouge Business Report`                                                         
## `SourceGreater Greater Washington`                                                                  
## `SourceGreater Kashmir`                                                                             
## `SourceGreek Reporter`                                                                              
## `SourceGreeley Tribune`                                                                             
## `SourceGreen Bay Press Gazette`                                                                     
## `SourceGreen Car Reports`                                                                           
## `SourceGreen Left Weekly`                                                                           
## `SourceGreen Valley News`                                                                           
## SourceGreenBiz                                                                                      
## SourceGreenbot                                                                                      
## `SourceGreene County Messenger`                                                                     
## `SourceGreenfield Daily Reporter`                                                                   
## `SourceGreenock Telegraph`                                                                          
## `SourceGreensboro News & Record`                                                                    
## `SourceGreentech Media`                                                                             
## `SourceGreenville News`                                                                             
## `SourceGreenwich Time`                                                                              
## `SourceGrimsby Telegraph`                                                                           
## SourceGrist                                                                                         
## `SourceGroesbeck Journal`                                                                           
## SourcegroovyPost                                                                                    
## `SourceGrub Street`                                                                                 
## SourceGSMArena.com                                                                                  
## `SourceGuardian Liberty Voice`                                                                      
## `SourceGuitar World Magazine`                                                                       
## `SourceGulf Business News`                                                                          
## `SourceGulf Digital News`                                                                           
## `SourceGulf News`                                                                                   
## `SourceGulf News Journal`                                                                           
## `SourceGulf News via Yahoo Maktoob News`                                                            
## `SourceGulf Times`                                                                                  
## `SourceGulf Today`                                                                                  
## Sourcegulfnews.com                                                                                  
## SourceGuns.com                                                                                      
## `SourceGuru Focus`                                                                                  
## `Sourceguru3d.com (press release)`                                                                  
## SourceGuruFocus.com                                                                                 
## `SourceGuruFocus.com via Yahoo! Finance`                                                            
## `SourceGW Today`                                                                                    
## `SourceGympie Times`                                                                                
## `SourceH\\u009d\\u009d Ni Mi`                                                                       
## SourceHaaretz                                                                                       
## `SourceHaaretz Daily`                                                                               
## `SourceHack Read`                                                                                   
## SourceHackaday                                                                                      
## SourceHaitilibre.com                                                                                
## `SourceHamilton Journal News`                                                                       
## `SourceHamilton Spectator`                                                                          
## `SourceHampshire Chronicle`                                                                         
## `SourceHandelsblatt Global Edition (subscription)`                                                  
## `SourceHanford Sentinel`                                                                            
## `SourceHardcore Gamer`                                                                              
## `SourceHardOCP (press release)`                                                                     
## `SourceHardware Secrets`                                                                            
## SourceHardwareZone                                                                                  
## `SourceHardwareZone via Yahoo! Philippines News`                                                    
## `SourceHardwareZone via Yahoo! Singapore News`                                                      
## SourceHarpersBAZAAR.com                                                                             
## `SourceHartford Courant`                                                                            
## `SourceHartlepool Mail`                                                                             
## `SourceHarvard Business Review`                                                                     
## `SourceHarvard Gazette`                                                                             
## `SourceHarvard Law Record`                                                                          
## `SourceHarvard Law School News`                                                                     
## `SourceHastings Tribune`                                                                            
## `SourceHavana Times`                                                                                
## Sourcehaveeruonline                                                                                 
## `SourceHawaii 24/7 (press release)`                                                                 
## `SourceHawaii News Now`                                                                             
## `SourceHeadlines & Global News`                                                                     
## `SourceHealth Affairs (blog)`                                                                       
## `SourceHealth Aim`                                                                                  
## `SourceHealthcare IT News`                                                                          
## SourceHealthline                                                                                    
## `SourceHeat Street`                                                                                 
## `SourceHeavy Duty Trucking`                                                                         
## SourceHeavy.com                                                                                     
## `SourceHelena Daily World`                                                                          
## `SourceHelena Independent Record`                                                                   
## `SourceHellenic News of America`                                                                    
## `SourceHellenic Shipping News Worldwide`                                                            
## `SourceHello Beautiful - Interactive One (blog)`                                                    
## Sourcehellomagazine.com                                                                             
## `SourceHelsingin Sanomat`                                                                           
## `SourceHenderson Daily News`                                                                        
## `SourceHerald-Mail Media`                                                                           
## `SourceHerald & Review`                                                                             
## `SourceHerald & Review (blog)`                                                                      
## `SourceHerald and News`                                                                             
## `SourceHerald Scotland`                                                                             
## `SourceHerald Sun`                                                                                  
## `SourceHerald Times Reporter`                                                                       
## SourceHerald.ie                                                                                     
## SourceHeraldNet                                                                                     
## `SourceHere And Now`                                                                                
## `SourceHereford Times`                                                                              
## `SourceHeritage Florida Jewish News`                                                                
## `SourceHeritage Foundation`                                                                         
## SourceHeritage.org                                                                                  
## `SourceHerts and Essex Observer`                                                                    
## `SourceHexa News`                                                                                   
## SourceHEXUS                                                                                         
## `SourceHibbing Daily Tribune`                                                                       
## `SourceHickory Daily Record`                                                                        
## `SourceHigh Country News`                                                                           
## `SourceHigh Country Press`                                                                          
## `SourceHigh Plains Journal`                                                                         
## `SourceHigh Point University (press release) (blog)`                                                
## `SourceHIGH TIMES`                                                                                  
## `SourceHighbrow Magazine`                                                                           
## `SourceHighlands Today`                                                                             
## SourceHighsnobiety                                                                                  
## `SourceHill Times (subscription)`                                                                   
## `SourceHimalayan Times`                                                                             
## `SourceHindu Business Line`                                                                         
## `SourceHindustan Times`                                                                             
## `SourceHints News Network`                                                                          
## SourceHipHopDX                                                                                      
## `SourceHistory News Network (HNN)`                                                                  
## `SourceHIT Consultant`                                                                              
## SourceHITC                                                                                          
## `SourceHollywood Life`                                                                              
## `SourceHollywood Reporter`                                                                          
## SourceHolyrood.com                                                                                  
## SourceHometownlife.com                                                                              
## `SourceHonest Reporting Canada`                                                                     
## SourceHonestreporting.com                                                                           
## `SourceHong Kong Free Press`                                                                        
## `SourceHong Kong Standard`                                                                          
## `SourceHong Kong Standard (press release)`                                                          
## `SourceHonolulu Civil Beat`                                                                         
## `SourceHonolulu Star-Advertiser`                                                                    
## `SourceHoosier Ag Today`                                                                            
## `SourceHope Star`                                                                                   
## `SourceHornell Evening Tribune`                                                                     
## `SourceHospitality Net`                                                                             
## `SourceHot Air`                                                                                     
## `SourceHot Hardware`                                                                                
## `SourceHot Springs Sentinel`                                                                        
## `SourceHot Stocks Point`                                                                            
## `SourceHotel News Now`                                                                              
## `SourceHotel News Resource (press release)`                                                         
## `SourceHotelier Middle East`                                                                        
## SourceHotNewHipHop                                                                                  
## `SourceHouma Courier`                                                                               
## SourceHousingWire                                                                                   
## `SourceHousingWire (blog)`                                                                          
## `SourceHouston Chronicle`                                                                           
## `SourceHouston Public Media`                                                                        
## `SourceHoustonia Magazine`                                                                          
## `SourceHoward University The District Chronicles`                                                   
## `SourceHowStuffWorks NOW`                                                                           
## SourceHPCwire                                                                                       
## `SourceHQ Grande Prairie`                                                                           
## SourceHRHub                                                                                         
## `SourceHSUS News`                                                                                   
## `SourceHSUS News (blog)`                                                                            
## `Sourcehttp://hamodia.com`                                                                          
## `Sourcehttp://wales.gov.uk/`                                                                        
## `Sourcehttp://www.newsgram.com/`                                                                    
## `SourceHuddersfield Daily Examiner`                                                                 
## `SourceHuddersfield Examiner`                                                                       
## `SourceHuffington Post`                                                                             
## `SourceHuffington Post (blog)`                                                                      
## `SourceHuffington Post Australia`                                                                   
## `SourceHuffington Post Canada`                                                                      
## `SourceHuffington Post India`                                                                       
## `SourceHuffington Post UK`                                                                          
## SourceHUH.                                                                                          
## `SourceHuman Capital`                                                                               
## `SourceHuman Events`                                                                                
## `SourceHuman Resources Online`                                                                      
## `SourceHuman Rights Campaign (blog)`                                                                
## `SourceHuman Rights First`                                                                          
## `SourceHuman Rights First (blog)`                                                                   
## `SourceHuman Rights Watch`                                                                          
## SourceHumanosphere                                                                                  
## `SourceHungary Today`                                                                               
## `SourceHuntington Herald Dispatch`                                                                  
## `SourceHuntsville Item`                                                                             
## `SourceHuron Daily Tribune`                                                                         
## `SourceHurriyet Daily News`                                                                         
## `SourceHybrid Cars News`                                                                            
## `SourceHyde Park Herald`                                                                            
## SourceHydrocarbonOnline                                                                             
## SourceHyperallergic                                                                                 
## `SourceHypergrid Business`                                                                          
## `SourceI am in dna of India`                                                                        
## Sourcei24news                                                                                       
## `SourceI4U News`                                                                                    
## SourceiAfrica.com                                                                                   
## `SourceIAM (registration) (blog)`                                                                   
## SourceiamWire                                                                                       
## `SourceIANS India Private Limited via Yahoo! India News`                                            
## `SourceIANS India Private Limited via Yahoo! Singapore News`                                        
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! India News`                           
## `SourceIANS India Private Limited/Yahoo India News via Yahoo! Singapore News`                       
## `SourceIANS via Yahoo Maktoob News`                                                                 
## `SourceIANS via Yahoo! Finance India`                                                               
## `SourceIB Times via Yahoo UK & Ireland News`                                                        
## `SourceIB Times via Yahoo! Singapore News`                                                          
## `SourceIBN live`                                                                                    
## SourceIBN7                                                                                          
## SourceIBNLive                                                                                       
## `SourceIBNLive (blog)`                                                                              
## `SourceIceland Monitor`                                                                             
## SourceIceNews                                                                                       
## SourceICIS                                                                                          
## SourceiClarified                                                                                    
## `SourceICRC (press release)`                                                                        
## `SourceIdaho State Journal`                                                                         
## `SourceIdaho Statesman`                                                                             
## `SourceIDEX Online`                                                                                 
## SourceiDigitalTimes.com                                                                             
## `SourceIDN InDepthNews | Analysis That Matters`                                                     
## `SourceIEEE Spectrum`                                                                               
## `SourceiFiber One`                                                                                  
## SourceIGN                                                                                           
## `SourceIGN Videogames`                                                                              
## `SourceIGN Xbox One Games`                                                                          
## `SourceIHS Electronics360`                                                                          
## `SourceIJ Review`                                                                                   
## SourceikhwanWeb.com                                                                                 
## `SourceIlford Recorder`                                                                             
## `SourceIlford Recorder 24`                                                                          
## `SourceIllawarra Mercury`                                                                           
## SourceIlliniHQ.com                                                                                  
## Sourceiloubnan.info                                                                                 
## SourceiMediaEthics                                                                                  
## `SourceImmortal News`                                                                               
## Sourceimpact24                                                                                      
## `SourceImperial College London`                                                                     
## `SourceImperial Valley Press`                                                                       
## `SourceIn-Cyprus (press release) (subscription) (blog)`                                             
## `SourceIn Defense of Marxism`                                                                       
## `SourceIn Homeland Security`                                                                        
## `SourceIn These Times`                                                                              
## SourceInc.com                                                                                       
## SourceInDaily                                                                                       
## `SourceIndependent Australia`                                                                       
## `SourceIndependent Catholic News`                                                                   
## `SourceIndependent Florida Alligator`                                                               
## `SourceIndependent Media Review Analysis (IMRA)`                                                    
## `SourceIndependent Online`                                                                          
## `SourceIndependent Reporter`                                                                        
## `SourceIndependent Tribune`                                                                         
## SourceIndependent.ae                                                                                
## SourceIndex.hr                                                                                      
## `SourceIndia Infoline`                                                                              
## `SourceIndia Today`                                                                                 
## `SourceIndia Today Group via Yahoo! Finance India`                                                  
## `SourceIndia Tribune`                                                                               
## `SourceIndia TV`                                                                                    
## SourceIndia.com                                                                                     
## Sourceindiablooms                                                                                   
## SourceIndiainfoline                                                                                 
## `SourceIndian Country Today Media Network`                                                          
## `SourceIndiana Public Media`                                                                        
## `SourceIndiana&#39;s NewsCenter`                                                                    
## `SourceIndianapolis Business Journal`                                                               
## `SourceIndianapolis Business Journal (blog)`                                                        
## `SourceIndianapolis Star`                                                                           
## SourceIndiatimes.com                                                                                
## `SourceIndie Shuffle Music News (blog)`                                                             
## `SourceIndie Wire`                                                                                  
## `SourceIndie Wire (blog)`                                                                           
## `SourceIndo American News`                                                                          
## `SourceIndonesia Investments (press release)`                                                       
## `SourceIndustrial Laser Solutions Magazine`                                                         
## `SourceIndustry Leaders Magazine`                                                                   
## `SourceIndustry Week`                                                                               
## SourceIndustryWeek                                                                                  
## SourceiNews                                                                                         
## SourceiNews880.com                                                                                  
## SourceInferse                                                                                       
## `Sourceinfo-europa`                                                                                 
## `SourceInfo-Palestine`                                                                              
## `Sourceinfo komputer`                                                                               
## SourceInfoQ.com                                                                                     
## `SourceInformation Age`                                                                             
## SourceInformationWeek                                                                               
## SourceINFORUM                                                                                       
## `SourceInfosecurity Magazine`                                                                       
## `SourceInfoTel News Ltd`                                                                            
## SourceInfoToday.com                                                                                 
## SourceInfoWorld                                                                                     
## SourceInhabitat                                                                                     
## `SourceInnovation Excellence (blog)`                                                                
## SourceInquirer                                                                                      
## SourceInquirer.net                                                                                  
## `SourceInSerbia News`                                                                               
## `SourceInside Bay Area`                                                                             
## `SourceInside Edition`                                                                              
## `SourceInside Higher Ed`                                                                            
## `SourceInside Higher Ed (blog)`                                                                     
## `SourceInside INdiana Business`                                                                     
## `SourceInside NoVA`                                                                                 
## `SourceInside Trade`                                                                                
## `SourceInside Tucson Business`                                                                      
## `SourceInside World Football`                                                                       
## `SourceInsideClimate News`                                                                          
## SourceInsideHalton.com                                                                              
## `SourceInsider Louisville (press release) (registration)`                                           
## `SourceInsider Media`                                                                               
## `SourceInsider Monkey (blog)`                                                                       
## `SourceInsider Trading Report`                                                                      
## SourceInsideSources                                                                                 
## `SourceInsight via Yahoo Canada Finance`                                                            
## `SourceInstitute for Defence Studies and Analyses`                                                  
## `SourceInstitutional Investor`                                                                      
## `SourceInstitutional Investor (blog)`                                                               
## SourceInStyle                                                                                       
## `SourceInsurance Journal`                                                                           
## `SourceIntelligence & Terrorism Information Center`                                                 
## `SourceIntelligence Online (subscription)`                                                          
## `SourceInter Press Service`                                                                         
## `SourceInteractive Investor`                                                                        
## SourceInterAksyon                                                                                   
## SourceInterfax                                                                                      
## `SourceIntermountain Jewish News`                                                                   
## `SourceInternational Adviser`                                                                       
## `SourceInternational Business Times`                                                                
## `SourceInternational Business Times AU`                                                             
## `SourceInternational Business Times UK`                                                             
## `SourceInternational Business Times via Yahoo UK & Ireland News`                                    
## `SourceInternational Business Times, India Edition`                                                 
## `SourceInternational Business Times, Singapore Edition`                                             
## `SourceInternational Chamber of Commerce`                                                           
## `SourceInternational Falls Journal`                                                                 
## `SourceInternational Federation of Red Cross and Red Crescent Societies`                            
## `SourceInternational Herald Tribune`                                                                
## `SourceInternational Middle East Media Center`                                                      
## `SourceInternational Monetary Fund`                                                                 
## `SourceInternational New York Times`                                                                
## `SourceInternational Paralymic Committee`                                                           
## `SourceInternational Solidarity Movement`                                                           
## SourceinTheBay                                                                                      
## `SourceIntifada Palestine`                                                                          
## SourceInverse                                                                                       
## SourceInvestCorrectly                                                                               
## SourceInvesting.com                                                                                 
## `SourceInvestment Executive`                                                                        
## `SourceInvestment U`                                                                                
## `SourceInvestment Week`                                                                             
## SourceInvestmentNews                                                                                
## SourceInvestopedia                                                                                  
## `SourceInvestor's Business Daily`                                                                   
## `SourceInvestor Newswire`                                                                           
## SourceInvestorGuide                                                                                 
## `SourceInvestorIdeas.com (press release)`                                                           
## SourceInvestorplace.com                                                                             
## `SourceInvestors Chronicle`                                                                         
## Sourceio9                                                                                           
## `SourceIoT Evolution World (blog)`                                                                  
## `SourceIoT Hub`                                                                                     
## `SourceIowa City Press Citizen`                                                                     
## `SourceiPolitics.ca (subscription)`                                                                 
## SourceiProgrammer                                                                                   
## `SourceIpsos News & Polls (subscription)`                                                           
## `SourceIpswich Star`                                                                                
## SourceIPWatchdog.com                                                                                
## `SourceIRA Market Report`                                                                           
## `SourceIran News Update`                                                                            
## SourceIRINnews.org                                                                                  
## `SourceIrish Building Magazine`                                                                     
## `SourceIrish Examiner`                                                                              
## `SourceIrish Independent`                                                                           
## `SourceIrish Legal News`                                                                            
## `SourceIrish Mirror`                                                                                
## `SourceIrish Times`                                                                                 
## SourceIrishCentral                                                                                  
## `SourceIrvine World News`                                                                           
## `SourceIs stories`                                                                                  
## SourceiSchoolGuide                                                                                  
## `SourceIsland Packet`                                                                               
## `SourceIsland Sun`                                                                                  
## SourceISM                                                                                           
## SourceISPreview                                                                                     
## `SourceIsrael Hayom`                                                                                
## `Sourceisrael heute ltd.`                                                                           
## `SourceIsrael Today`                                                                                
## SourceIsraelValley                                                                                  
## SourceIsthmus                                                                                       
## `SourceIT Business Edge`                                                                            
## `SourceIT Business Edge (blog)`                                                                     
## `SourceiT News`                                                                                     
## `SourceiT News (blog)`                                                                              
## `SourceIT News Africa`                                                                              
## `SourceIT PRO`                                                                                      
## `SourceIT World`                                                                                    
## `SourceIT World Canada`                                                                             
## `SourceIT World Canada (blog)`                                                                      
## SourceITBusiness.ca                                                                                 
## `SourceiTech Post`                                                                                  
## `SourceIthaca Journal`                                                                              
## SourceITProPortal                                                                                   
## `SourceITS International`                                                                           
## `SourceITV News`                                                                                    
## SourceITV.com                                                                                       
## SourceITWeb                                                                                         
## SourceiTWire                                                                                        
## `SourceiTWire (press release)`                                                                      
## SourceITworld                                                                                       
## `SourceJ-Wire Jewish Australian News Service`                                                       
## `SourceJ Weekly`                                                                                    
## `SourceJacaranda FM`                                                                                
## `SourceJackson Clarion Ledger`                                                                      
## `SourceJackson Free Press`                                                                          
## `SourceJackson Hole News & Guide`                                                                   
## `SourceJackson Sun`                                                                                 
## `SourceJacksonville Business Journal`                                                               
## `SourceJacksonville Daily Progress`                                                                 
## `SourceJacksonville Journal Courier`                                                                
## `SourceJacobin magazine`                                                                            
## SourceJadaliyya                                                                                     
## `SourceJakarta Globe`                                                                               
## `SourceJakarta Post`                                                                                
## SourceJalopnik                                                                                      
## `SourceJamaica Gleaner`                                                                             
## `SourceJamaica Observer`                                                                            
## `SourceJamestown Sun`                                                                               
## `SourceJanesville Gazette`                                                                          
## `SourceJapan Today`                                                                                 
## `SourceJefferson City News Tribune`                                                                 
## `SourceJerusalem Center for Public Affairs`                                                         
## `SourceJerusalem Post Israel News`                                                                  
## `SourceJerusalem Post Israel News (blog)`                                                           
## `SourceJeune Afrique`                                                                               
## `SourceJewish Business News`                                                                        
## `SourceJewish Chronicle`                                                                            
## `SourceJewish Ledger`                                                                               
## `SourceJewish Link of New Jersey`                                                                   
## `SourceJewish News`                                                                                 
## `SourceJewish Post`                                                                                 
## `SourceJewish Telegraphic Agency`                                                                   
## SourceJewschool                                                                                     
## SourceJezebel                                                                                       
## SourceJNS.org                                                                                       
## `SourceJobs & Hire`                                                                                 
## SourceJOC.com                                                                                       
## SourceJOE                                                                                           
## SourceJOE.co.uk                                                                                     
## `SourceJohannesburg Sunday World`                                                                   
## `SourceJohnson City Press`                                                                          
## `SourceJoplin Globe`                                                                                
## `SourceJordan Times`                                                                                
## `SourceJournal and Courier`                                                                         
## `SourceJournal Gazette and Times-Courier`                                                           
## `SourceJournal of Turkish Weekly`                                                                   
## `SourceJournal Online`                                                                              
## `SourceJournal Pioneer`                                                                             
## `SourceJournal Times`                                                                               
## SourceJournalism.co.uk                                                                              
## `SourceJP Updates`                                                                                  
## `SourceJspace News`                                                                                 
## `SourceJuneau Empire (subscription)`                                                                
## `SourceJunior College`                                                                              
## SourceJunkee                                                                                        
## SourceJURIST                                                                                        
## `Sourcejust-style.com (subscription)`                                                               
## `SourceJust International`                                                                          
## `SourceJust Jared`                                                                                  
## `SourceJust Security`                                                                               
## SourceJustmeans                                                                                     
## `SourceJustmeans (blog)`                                                                            
## SourceJweekly.com                                                                                   
## `SourceK24 TV`                                                                                      
## `SourceKABC-TV`                                                                                     
## `SourceKABC-TV Los Angeles`                                                                         
## `SourceKaiser Family Foundation`                                                                    
## SourceKAKE                                                                                          
## SourceKALW                                                                                          
## SourceKanglaOnline                                                                                  
## `SourceKankakee Daily Journal`                                                                      
## `SourceKansas City Business Journal`                                                                
## `SourceKansas City InfoZine`                                                                        
## `SourceKansas City Star`                                                                            
## `SourceKansas City Star (blog)`                                                                     
## SourceKAPP                                                                                          
## SourceKARE                                                                                          
## SourceKARK                                                                                          
## `SourceKashmir Life`                                                                                
## `SourceKashmir Media Service`                                                                       
## `SourceKashmir Reader`                                                                              
## `SourceKashmir Watch`                                                                               
## `SourceKasmir Monitor`                                                                              
## `SourceKATC Lafayette News`                                                                         
## SourceKathimerini                                                                                   
## `SourceKathmandu Post`                                                                              
## `SourceKatib\\u009d\\u009dn`                                                                        
## `SourceKatoikos.eu (satire) (registration) (blog)`                                                  
## SourceKATU                                                                                          
## SourceKATV                                                                                          
## `SourceKaufman Herald`                                                                              
## `SourceKAUZ-TV`                                                                                     
## `SourceKawartha Media Group`                                                                        
## `SourceKawowo Sports`                                                                               
## `SourceKBS WORLD Radio News`                                                                        
## SourceKBTX                                                                                          
## `SourceKBTX 3 Bryan - College Station`                                                              
## `SourceKCBD-TV Lubbock`                                                                             
## `SourceKCCI 8 Des Moines`                                                                           
## `SourceKCCI Des Moines`                                                                             
## `SourceKCEN-TV`                                                                                     
## SourceKCET                                                                                          
## `SourceKCRA 3 Sacramento`                                                                           
## `SourceKCRA Sacramento`                                                                             
## SourceKCRG                                                                                          
## `SourceKCTV 5 Kansas City`                                                                          
## `SourceKDLT News`                                                                                   
## SourceKdminer                                                                                       
## SourceKDramaStars                                                                                   
## `SourceKearney Hub`                                                                                 
## `SourceKELO AM-FM`                                                                                  
## `SourceKELOLAND TV`                                                                                 
## `SourceKelowna Capital News`                                                                        
## `SourceKenai Peninsula Online`                                                                      
## `SourceKennebec Journal & Morning Sentinel`                                                         
## `SourceKENS 5 TV`                                                                                   
## `SourceKent Online`                                                                                 
## `SourceKERA News`                                                                                   
## `SourceKERA North Texas`                                                                            
## `SourceKern Golden Empire`                                                                          
## SourceKESQ                                                                                          
## `SourceKETV 7 Omaha`                                                                                
## `SourceKETV Omaha`                                                                                  
## `SourceKEVN Black Hills Fox`                                                                        
## `SourceKewanee Star Courier`                                                                        
## `SourceKEYE TV`                                                                                     
## SourceKEYT                                                                                          
## SourceKFDA                                                                                          
## `SourceKFDA-TV Amarillo`                                                                            
## SourceKFDI                                                                                          
## SourceKFGO                                                                                          
## Sourcekfor.com                                                                                      
## `SourceKFOX 14 El Paso`                                                                             
## `SourceKFOX El Paso`                                                                                
## `SourceKFSM Ft. Smith-Fayetteville`                                                                 
## `SourceKFSN-TV`                                                                                     
## `SourceKFSN-TV Fresno`                                                                              
## SourceKFVS                                                                                          
## SourceKgab                                                                                          
## `SourceKGBT-TV`                                                                                     
## SourceKGMI                                                                                          
## SourceKGNS.tv                                                                                       
## `SourceKGO-TV`                                                                                      
## `SourceKGO-TV Bay Area`                                                                             
## SourceKGOU                                                                                          
## `SourceKGTV San Diego`                                                                              
## Sourcekgw.com                                                                                       
## `SourceKhaama Press (press release) (blog)`                                                         
## `SourceKhaleej Times`                                                                               
## `SourceKhaleej Times via Yahoo Maktoob News`                                                        
## `SourceKHBS - KHOG Fort Smith - Fayetteville`                                                       
## SourceKHON2                                                                                         
## SourceKHOU                                                                                          
## SourceKHOU.com                                                                                      
## `SourceKHQ Right Now`                                                                               
## `SourceKHQ Spokane`                                                                                 
## `SourceKiama Independent`                                                                           
## SourceKicker                                                                                        
## `SourceKIII TV3`                                                                                    
## `SourceKilgore News Herald`                                                                         
## `SourceKill Screen (blog)`                                                                          
## `SourceKilleen Daily Herald`                                                                        
## `SourceKIMT 3`                                                                                      
## SourceKING5.com                                                                                     
## SourceKIONrightnow.com                                                                              
## `SourceKiplinger Personal Finance`                                                                  
## SourceKiplinger.com                                                                                 
## `SourceKipp Report`                                                                                 
## `SourceKIRO 7 Seattle-Tacoma`                                                                       
## `SourceKIRO Seattle`                                                                                
## `SourceKitchener - Waterloo Record`                                                                 
## SourceKitGuru                                                                                       
## `SourceKitsap Sun`                                                                                  
## `SourceKITV Honolulu`                                                                               
## `SourceKKTV 11 Colorado Springs`                                                                    
## `SourceKKTV 11 News`                                                                                
## `SourceKLAS-TV`                                                                                     
## SourceKLTV                                                                                          
## `SourceKLTV 7 Tyler`                                                                                
## `SourceKMBC-TV Kansas City`                                                                         
## `SourceKMBC Kansas City`                                                                            
## SourceKMOV.com                                                                                      
## SourceKMUW                                                                                          
## `SourceKMWorld Magazine`                                                                            
## `SourceKNBN Rapid City`                                                                             
## Sourceknopnews2                                                                                     
## `SourceKnow Your Mobile`                                                                            
## `SourceKnowledge at Wharton`                                                                        
## `SourceKnowledge Wharton Today`                                                                     
## `SourceKnowledge@Wharton`                                                                           
## `SourceKnowTechie (blog)`                                                                           
## `SourceKnoxville News Sentinel`                                                                     
## `SourceKOAA.com Colorado Springs and Pueblo News`                                                   
## `SourceKOAM-TV`                                                                                     
## `SourceKOAM-TV Pittsburg`                                                                           
## `SourceKOAT Albuquerque`                                                                            
## `SourceKOB 4 Albuquerque`                                                                           
## SourceKOB.com                                                                                       
## `SourceKOBI-TV NBC5 / KOTI-TV NBC2`                                                                 
## `SourceKOCO 5 Oklahoma City`                                                                        
## `SourceKOCO Oklahoma City`                                                                          
## `SourceKokomo Tribune`                                                                              
## `SourceKOLD News 13 Tuscon`                                                                         
## SourceKOLO                                                                                          
## `SourceKOLO 8 Reno`                                                                                 
## SourceKomando                                                                                       
## `SourceKOMO News`                                                                                   
## `SourceKOMO Seattle`                                                                                
## `SourceKOMU Columbia`                                                                               
## `SourceKorea JoongAng Daily`                                                                        
## `SourceKorea Portal (English Edition)`                                                              
## `SourceKorea Times`                                                                                 
## SourceKOSU                                                                                          
## SourceKotaku                                                                                        
## `SourceKotaku Australia`                                                                            
## SourceKotatv                                                                                        
## `SourceKPAX-TV`                                                                                     
## SourceKPBS                                                                                          
## `SourceKPBS San Diego`                                                                              
## `SourceKPCC Pasadena`                                                                               
## `Sourcekpfa 94.1fm`                                                                                 
## `SourceKPHO Phoenix`                                                                                
## `SourceKPLR 11 St. Louis`                                                                           
## `SourceKPLU News for Seattle and the Northwest`                                                     
## `SourceKPRC Houston`                                                                                
## `SourceKPRC Local 2 Houston`                                                                        
## `SourceKPVI News 6`                                                                                 
## SourceKQED                                                                                          
## SourceKRBD                                                                                          
## SourceKRCRTV.COM                                                                                    
## SourceKRDO                                                                                          
## `SourceKRDO Colorado Springs`                                                                       
## `SourceKrebs on Security`                                                                           
## SourceKRGV                                                                                          
## `SourceKRIS Corpus Christi News`                                                                    
## `SourceKRNV My News 4`                                                                              
## SourceKRON4.com                                                                                     
## `SourceKRQE & KASA FOX 2 Albuquerque`                                                               
## `SourceKRQE News 13`                                                                                
## `SourceKRTV Great Falls News`                                                                       
## `SourceKSAT San Antonio`                                                                            
## `SourceKSBY San Luis Obispo News`                                                                   
## SourceKSDK                                                                                          
## SourceKSDK.com                                                                                      
## SourceKSHB                                                                                          
## `SourceKSHB-TV Kansas City`                                                                         
## SourceKSL.com                                                                                       
## `SourceKSLA-TV`                                                                                     
## `SourceKSLA-TV Shreveport`                                                                          
## `SourceKSNT (press release) (registration) (blog)`                                                  
## SourceKSPR                                                                                          
## SourceKSWO                                                                                          
## `SourceKSWO Lawton-Wichita Falls`                                                                   
## SourceKTAL                                                                                          
## `SourceKTAL Shreveport`                                                                             
## SourceKTAR.com                                                                                      
## SourceKTBS                                                                                          
## SourceKTIC                                                                                          
## SourceKTLA                                                                                          
## SourceKTOO                                                                                          
## SourceKTRE                                                                                          
## `SourceKTRE Lufkin and Nacogdoches`                                                                 
## `SourceKTRK-TV`                                                                                     
## `SourceKTTC Rochester`                                                                              
## `SourceKTTS 94.7`                                                                                   
## SourceKTUL                                                                                          
## SourceKTUU.com                                                                                      
## `SourceKTVA.com - Anchorage, Alaska`                                                                
## SourceKTVB                                                                                          
## SourceKTVB.com                                                                                      
## SourceKTVN                                                                                          
## `SourceKTVN Reno`                                                                                   
## `SourceKTVQ Billings News`                                                                          
## `SourceKTVU San Francisco`                                                                          
## SourceKTVZ                                                                                          
## SourceKTXS                                                                                          
## `SourceKuensel, Buhutan's National Newspaper`                                                       
## `SourceKUOW News and Information`                                                                   
## SourceKUT                                                                                           
## `SourceKUTV 2News`                                                                                  
## `SourceKuwait News Agency`                                                                          
## `SourceKuwait Times`                                                                                
## `SourceKVOA Tucson News`                                                                            
## SourceKVUE                                                                                          
## SourceKVUE.com                                                                                      
## Sourcekwbe                                                                                          
## SourceKWCH                                                                                          
## `SourceKWQC-TV6`                                                                                    
## `SourceKWTV News9`                                                                                  
## Sourcekwwl.com                                                                                      
## `SourceKX TV North Dakota`                                                                          
## SourceKXAN.com                                                                                      
## `SourceKXLH Helena News`                                                                            
## SourceKXNet.com                                                                                     
## `SourceKXXV News Channel 25`                                                                        
## `SourceKXXV Waco`                                                                                   
## SourceKY3                                                                                           
## `SourceKyiv Post`                                                                                   
## `SourceKYIV Post`                                                                                   
## `SourceKykernel.com (subscription)`                                                                 
## SourceKYMA                                                                                          
## SourceKYTX                                                                                          
## SourceKYUK                                                                                          
## `SourceL'Express`                                                                                   
## `SourceL'Expression`                                                                                
## `SourceL'Humanit\\u009d\\u009d`                                                                     
## `SourceL'Humanité`                                                                                  
## `SourceL'info en direct d'Isra\\u009d\\u009dl 24h/24 (Communiqu\\u009d\\u009d de presse) (Blog)`    
## `SourceL'Orient-Le Jour`                                                                            
## `SourceL&#39;Atelier`                                                                               
## `SourceL.A. Biz`                                                                                    
## `SourceL.A. Weekly`                                                                                 
## `SourceLa Croix`                                                                                    
## `SourceLa Crosse Tribune`                                                                           
## `SourceLA Daily News`                                                                               
## SourceLabourList                                                                                    
## Sourceladepeche.fr                                                                                  
## `SourceLadysmith Gazette`                                                                           
## SourceLAist                                                                                         
## `SourceLake Cowichan Gazette`                                                                       
## `SourceLake Tahoe News`                                                                             
## SourceLakenewsonline.com                                                                            
## `SourceLakeshore Public Media`                                                                      
## `SourceLamorinda Sun`                                                                               
## `SourceLancashire Evening Post`                                                                     
## `SourceLancashire Telegraph`                                                                        
## `SourceLancaster Eagle Gazette`                                                                     
## `SourceLancaster Today`                                                                             
## SourceLancasterOnline                                                                               
## `SourceLanka Business Online`                                                                       
## `SourceLansing State Journal`                                                                       
## `SourceLaptop Mag`                                                                                  
## `SourceLas Cruces Sun-News`                                                                         
## `SourceLas Vegas Review-Journal`                                                                    
## `SourceLas Vegas Review-Journal (blog)`                                                             
## `SourceLas Vegas Sun`                                                                               
## `SourceLast Night On`                                                                               
## `SourceLatin American Herald Tribune`                                                               
## `SourceLatin Correspondent`                                                                         
## `SourceLatin Post`                                                                                  
## `SourceLatin Times`                                                                                 
## `SourceLatino Post`                                                                                 
## `SourceLatinos Post`                                                                                
## `SourceLawfare (blog)`                                                                              
## SourceLawNewz                                                                                       
## `SourceLawrence Berkeley National Laboratory`                                                       
## `SourceLawrence Journal-World`                                                                      
## `SourceLawrence Journal World`                                                                      
## `SourceLawrence Journal World (blog)`                                                               
## `SourceLawyer Herald`                                                                               
## `SourceLayman Online`                                                                               
## SourceLazygamer                                                                                     
## `SourceLBC 97.3`                                                                                    
## `SourceLe Club de Mediapart (Blog)`                                                                 
## `SourceLe Figaro`                                                                                   
## `SourceLe Grand Soir.info`                                                                          
## `SourceLe Mauricien`                                                                                
## `SourceLe Mirabel`                                                                                  
## `SourceLe Monde`                                                                                    
## `SourceLe Monde Diplomatique`                                                                       
## `SourceLe Monde Diplomatique (blog)`                                                                
## `SourceLe Parisien`                                                                                 
## `SourceLe Soleil`                                                                                   
## `SourceLe T\\u009d\\u009dl\\u009d\\u009dgramme`                                                     
## `SourceLeader-Telegram`                                                                             
## `SourceLeader Journal`                                                                              
## `SourceLeaders Tunisie`                                                                             
## `SourceLeadership Newspapers`                                                                       
## SourceLeafly                                                                                        
## `SourceLeamington Courier`                                                                          
## SourceLearnBonds                                                                                    
## SourceLEDinside                                                                                     
## `SourceLee's Summit Journal`                                                                        
## `SourceLeek Post & Times`                                                                           
## `SourceLeesville Daily Leader`                                                                      
## SourceLeFaso.net                                                                                    
## `SourceLeft Foot Forward`                                                                           
## `SourceLeftLane News`                                                                               
## `Sourcelegal Insurrection (blog)`                                                                   
## `SourceLehigh Valley Business`                                                                      
## Sourcelehighvalleylive.com                                                                          
## `SourceLeicester Mercury`                                                                           
## SourceleJDD.fr                                                                                      
## SourceleJSD                                                                                         
## `SourceLet Me Know About This`                                                                      
## `SourceLethbridge Herald`                                                                           
## Sourceletsrecycle.com                                                                               
## `SourceLexington Herald-Leader`                                                                     
## `SourceLexington Herald Leader`                                                                     
## `SourceLexology (registration)`                                                                     
## `SourceLGBTQ Nation`                                                                                
## `SourceLiberal Democrat Voice`                                                                      
## SourceLiberation                                                                                    
## `SourceLiberian Daily Observer`                                                                     
## `SourceLiberty News Now`                                                                            
## SourceLifehacker                                                                                    
## `SourceLifehacker Australia`                                                                        
## `SourceLifehacker UK`                                                                               
## SourceLifeNews.com                                                                                  
## SourceLifesite                                                                                      
## SourceLifestyles                                                                                    
## SourceLifeZette                                                                                     
## `SourceLight Reading`                                                                               
## SourceLiliputing                                                                                    
## `SourceLim Kit Siang`                                                                               
## `SourceLimerick Post`                                                                               
## `SourceLincoln Journal Star`                                                                        
## `SourceLincolnshire Echo`                                                                           
## `SourceLinkedIn (blog)`                                                                             
## `SourceLinn's Stamp News`                                                                           
## SourceLinux                                                                                         
## `SourceLinux Journal`                                                                               
## `SourceLinux Today`                                                                                 
## `SourceLinux.com (blog)`                                                                            
## SourceLinuxInsider.com                                                                              
## `SourceLion's Roar`                                                                                 
## `SourceLisbon Morning Journal`                                                                      
## `SourceLive 5 News Charleston`                                                                      
## `SourceLive Science`                                                                                
## `SourceLive Trading News`                                                                           
## SourceLivemint                                                                                      
## `SourceLiverpool Echo`                                                                              
## `SourceLiveScience.com via Yahoo! News`                                                             
## `SourceLivingston Daily`                                                                            
## SourceLLRX.com                                                                                      
## SourceLobeLog                                                                                       
## `SourceLocal 10`                                                                                    
## `SourceLocal 10 Miami`                                                                              
## `SourceLocal 6 Orlando`                                                                             
## `SourceLocal 8 Now`                                                                                 
## SourceLocalNews8.com                                                                                
## `SourceLockport Union-Sun & Journal`                                                                
## `SourceLogistics Management`                                                                        
## `SourceLompoc Record`                                                                               
## `SourceLondon Evening Standard`                                                                     
## `SourceLondon Free Press`                                                                           
## `SourceLondon Loves Business`                                                                       
## `SourceLondon Review of Books (subscription)`                                                       
## `SourceLondon School of Business and Finance (blog)`                                                
## `SourceLondon South East (registration) (blog)`                                                     
## SourceLondon24                                                                                      
## `SourceLondonderry Today`                                                                           
## SourceLondonist                                                                                     
## `SourceLong Beach Press Telegram`                                                                   
## `SourceLong Island Business News`                                                                   
## `SourceLong Island Business News (subscription)`                                                    
## `SourceLong War Journal`                                                                            
## `SourceLongview Daily News`                                                                         
## `SourceLongview News-Journal`                                                                       
## `SourceLonoke News`                                                                                 
## `SourceLos Angeles Business Journal`                                                                
## `SourceLos Angeles Daily News`                                                                      
## `SourceLos Angeles Sun Times`                                                                       
## `SourceLos Angeles Times`                                                                           
## `SourceLost Coast Outpost`                                                                          
## SourceLoudwire                                                                                      
## `SourceLowell Sun`                                                                                  
## SourceLubbockOnline.com                                                                             
## `SourceLudwig von Mises Institute`                                                                  
## `SourceLusaka Times`                                                                                
## `SourceLuton Today`                                                                                 
## `SourceLuxemburger Wort - English Edition`                                                          
## `SourceLuxury Daily`                                                                                
## `SourceLynchburg News and Advance`                                                                  
## `SourceLynn News`                                                                                   
## `SourceM\\u009d\\u009ddecins Sans Fronti\\u009d\\u009dres (MSF) International`                      
## `SourceM\\u009d\\u009ddias-Presse-Info`                                                             
## `SourceM\\u009d\\u009dtro Montr\\u009d\\u009dal`                                                    
## `SourceMac Kung Fu (satire) (blog)`                                                                 
## `SourceMac Rumors`                                                                                  
## `SourceMacau Daily Times`                                                                           
## SourceMacDailyNews                                                                                  
## `SourceMackay Daily Mercury`                                                                        
## SourceMacleans.ca                                                                                   
## SourceMacNN                                                                                         
## `SourceMacroBusiness (blog)`                                                                        
## SourceMacworld                                                                                      
## `SourceMacworld (blog)`                                                                             
## `SourceMacworld UK`                                                                                 
## `SourceMadame Figaro`                                                                               
## `SourceMadame Noire`                                                                                
## SourceMadameNoire                                                                                   
## SourceMadison.com                                                                                   
## `SourceMaidenhead Advertiser`                                                                       
## `SourceMail & Guardian`                                                                             
## `SourceMail & Guardian Africa`                                                                      
## `SourceMail & Guardian Online`                                                                      
## `SourceMail Today via Yahoo! India News`                                                            
## `SourceMain Line Times`                                                                             
## `SourceMaine Public Broadcasting`                                                                   
## SourceMainStreet                                                                                    
## `SourceMaison des Droits de l'Homme de Limoges`                                                     
## SourceMakeUseOf                                                                                     
## SourceMalawi24                                                                                      
## `SourceMalay Mail Online`                                                                           
## `SourceMalaysia Chronicle`                                                                          
## `SourceMalaysiakini (subscription)`                                                                 
## `SourceMalaysian Digest`                                                                            
## Sourcemalaysiandigest.com                                                                           
## `SourceMalta Independent Online`                                                                    
## `SourceMalta Independent Online (blog)`                                                             
## `SourceMalta Star`                                                                                  
## SourceMaltaToday                                                                                    
## `SourceMaltaToday (blog)`                                                                           
## `SourceManagement Today`                                                                            
## `SourceManawatu Standard`                                                                           
## `SourceManchester Evening News`                                                                     
## `SourceManila Bulletin`                                                                             
## `SourceManila Standard Today`                                                                       
## `SourceMankato Free Press`                                                                          
## `SourceMansfield News Journal`                                                                      
## SourceManufacturing.net                                                                             
## `SourceManx Radio`                                                                                  
## `SourceMaple Ridge News`                                                                            
## `SourceMaple Ridge Times`                                                                           
## SourceMarca                                                                                         
## `SourceMarie Claire Australia`                                                                      
## SourceMarieClaire.com                                                                               
## `SourceMarine Corps Times`                                                                          
## SourceMarineLink                                                                                    
## `SourceMarket Exclusive`                                                                            
## `SourceMarket Realist`                                                                              
## `SourceMarket Realist via Yahoo Canada Finance`                                                     
## `SourceMarket Realist via Yahoo UK & Ireland Finance`                                               
## `SourceMarket Realist via Yahoo! Finance`                                                           
## `SourceMarket Realist via Yahoo! Finance India`                                                     
## `SourceMarket Realist via Yahoo! New Zealand Finance`                                               
## `SourceMarket Realist via Yahoo!7 Finance`                                                          
## `SourceMarket Watch`                                                                                
## SourceMarketing                                                                                     
## `SourceMarketing Interactive`                                                                       
## `SourceMarketing Land`                                                                              
## `SourceMarketing magazine Australia (registration)`                                                 
## `SourceMarketingProfs.com (subscription)`                                                           
## SourceMarketplace.org                                                                               
## `SourceMarketPulse (blog)`                                                                          
## `SourceMarkets Daily`                                                                               
## `SourceMarkets Morning`                                                                             
## SourceMarketWatch                                                                                   
## `SourceMarketWatch (blog)`                                                                          
## `SourceMarketWatch via Yahoo Canada Finance`                                                        
## `SourceMarketWatch via Yahoo UK & Ireland Finance`                                                  
## `SourceMarketWatch via Yahoo! Finance`                                                              
## `SourceMarketWatch via Yahoo! Finance India`                                                        
## `SourceMarketWatch via Yahoo! New Zealand Finance`                                                  
## `SourceMarketWatch via Yahoo! News`                                                                 
## `SourceMarketWatch via Yahoo!7 Finance`                                                             
## SourceMarketwire                                                                                    
## `SourceMarketwired (press release)`                                                                 
## `SourceMarketwired via Yahoo Canada Finance`                                                        
## `SourceMarketwired via Yahoo UK & Ireland Finance`                                                  
## `SourceMarketwired via Yahoo! Finance`                                                              
## `SourceMarlborough Express`                                                                         
## `SourceMarquette Wire`                                                                              
## `SourceMarTech Advisor`                                                                             
## `SourceMartins Ferry Times Leader`                                                                  
## `SourceMartinsburg Journal`                                                                         
## `SourceMaryland Daily Record (subscription)`                                                        
## SourceMashable                                                                                      
## `SourceMashable Tech via Yahoo UK & Ireland News`                                                   
## `SourceMashable via Yahoo Canada News`                                                              
## `SourceMashable via Yahoo! News`                                                                    
## `SourceMason City Globe Gazette`                                                                    
## `SourceMass Device`                                                                                 
## SourceMassLive.com                                                                                  
## `SourceMasterstudies News (blog)`                                                                   
## `SourceMaterial Handling & Logistics`                                                               
## `SourceMaui Now`                                                                                    
## `SourceMaximum PC`                                                                                  
## `SourceMcClatchy Washington Bureau`                                                                 
## SourceMCV                                                                                           
## `SourceMeadville Tribune`                                                                           
## `SourceMeat and Poultry Online`                                                                     
## `SourceMed Device Online (press release)`                                                           
## `SourceMedCity News`                                                                                
## `SourceMedia Life Magazine`                                                                         
## `SourceMedia Matters for America`                                                                   
## `SourceMedia Matters for America (blog)`                                                            
## SourceMediaite                                                                                      
## SourceMediapart                                                                                     
## SourceMediaPost                                                                                     
## `SourceMediaPost Communications`                                                                    
## `SourceMedical Daily`                                                                               
## `SourceMedical Xpress`                                                                              
## `SourceMedicine Hat News`                                                                           
## SourceMedicineNet.com                                                                               
## `SourceMedill Reports: Chicago`                                                                     
## `SourceMedPage Today`                                                                               
## `SourceMEED (subscription)`                                                                         
## SourceMegaGames                                                                                     
## `SourceMehr News Agency - English Version`                                                          
## SourceMemeburn                                                                                      
## `SourceMemorial Examiner`                                                                           
## `SourceMemphis Business Journal`                                                                    
## `SourceMemphis Business Journal (blog)`                                                             
## `SourceMemphis Commercial Appeal`                                                                   
## `SourceMemphis Daily News (blog)`                                                                   
## `SourceMemphis Flyer`                                                                               
## `SourceMen's News Daily`                                                                            
## `SourceMen&#39;s Journal Tech via Yahoo! News`                                                      
## SourceMENAFN                                                                                        
## SourceMENAFN.COM                                                                                    
## `SourceMennonite World Review`                                                                      
## SourceMensquare                                                                                     
## `SourceMerced Sun-Star`                                                                             
## SourceMercoPress                                                                                    
## `SourceMercury Daily (blog)`                                                                        
## `SourceMeriden Record-Journal`                                                                      
## `SourceMeridian Booster`                                                                            
## `SourceMeridian Star`                                                                               
## SourceMerinews                                                                                      
## `SourceMeriTalk (blog)`                                                                             
## `SourceMERRY JANE`                                                                                  
## `SourceMetal Injection.net`                                                                         
## SourceMetalMiner                                                                                    
## SourceMetro                                                                                         
## `SourceMetro Halifax`                                                                               
## `SourceMetro TV News`                                                                               
## SourceMetro.us                                                                                      
## `SourceMetroNews Canada`                                                                            
## SourceMetrotvnews.com                                                                               
## `SourceMetroWest Daily News`                                                                        
## `SourceMFA China`                                                                                   
## `SourceMiami Herald`                                                                                
## `SourceMiami Herald (blog)`                                                                         
## `SourceMiami New Times`                                                                             
## SourceMiBiz                                                                                         
## SourceMic                                                                                           
## Sourcemicebtn                                                                                       
## `SourceMichigan Journal`                                                                            
## `SourceMichigan Radio`                                                                              
## `SourceMichigan State University Extension`                                                         
## SourceMichronicleonline                                                                             
## `SourceMicroCap Magazine`                                                                           
## `SourceMicrogrid Knowledge`                                                                         
## SourceMicroScope                                                                                    
## `SourceMicrosoft - Channel 9`                                                                       
## `SourceMicrosoft - Channel 9 (blog)`                                                                
## `SourceMid-Day`                                                                                     
## `SourceMiddle East Confidential`                                                                    
## `SourceMiddle East Eye`                                                                             
## `SourceMiddle East Forum`                                                                           
## `SourceMiddle East Forum (blog)`                                                                    
## `SourceMiddle East Monitor`                                                                         
## `SourceMiddle East Monitor (blog)`                                                                  
## `SourceMiddle East Newsline`                                                                        
## `SourceMiddle East Online`                                                                          
## `SourceMiddle East Report Online`                                                                   
## `SourceMiddletown Press`                                                                            
## `SourceMidland Daily News`                                                                          
## `SourceMidland Reporter-Telegram`                                                                   
## `SourceMidlothian Exchange`                                                                         
## `SourceMilitary Times`                                                                              
## SourceMilitary.com                                                                                  
## `SourceMille Babords (Communiqu\\u009d\\u009d de presse)`                                           
## `SourceMilli Gazette`                                                                               
## `SourceMilpitas Post`                                                                               
## `SourceMilwaukee Business Journal`                                                                  
## `SourceMilwaukee Journal Sentinel`                                                                  
## `SourceMilwaukee Journal Sentinel (blog)`                                                           
## SourceMINA                                                                                          
## SourceMineweb                                                                                       
## `SourceMining Journal (subscription)`                                                               
## `SourceMining MX`                                                                                   
## SourceMINING.com                                                                                    
## `SourceMinistry of External Affairs (press release)`                                                
## `SourceMinistry of Foreign Affairs of Denmark`                                                      
## `SourceMinneapolis-St. Paul Star Tribune`                                                           
## `SourceMinneapolis Star Tribune`                                                                    
## `SourceMinneapolis Sun Times`                                                                       
## `SourceMinnesota Daily`                                                                             
## `SourceMinnesota Public Radio`                                                                      
## `SourceMinnesota Public Radio News`                                                                 
## SourceMinnPost                                                                                      
## `SourceMintpress News (blog)`                                                                       
## SourceMinyanville.com                                                                               
## `SourceMirage News`                                                                                 
## SourceMirror.co.uk                                                                                  
## `SourceMIS Asia`                                                                                    
## `SourceMiscellany News`                                                                             
## SourceMississauga                                                                                   
## `SourceMississauga News`                                                                            
## `SourceMississippi Business Journal`                                                                
## `SourceMississippi News Now`                                                                        
## `SourceMIT News`                                                                                    
## `SourceMIT Technology Review`                                                                       
## `SourceMitzpeh (press release)`                                                                     
## SourceMixmag                                                                                        
## `SourceMizzima News`                                                                                
## SourceMLive.com                                                                                     
## `SourceMLT News`                                                                                    
## SourceMMAjunkie.com                                                                                 
## `SourceMmegi Online`                                                                                
## SourceMMH.com                                                                                       
## `SourceMNR Daily`                                                                                   
## `SourceMo4ch News (press release) (blog)`                                                           
## `SourceMoberly Monitor-Index`                                                                       
## SourceMobiHealthNews                                                                                
## `SourceMobile & Apps`                                                                               
## `SourceMobile Burn`                                                                                 
## `SourceMobile Choice`                                                                               
## `SourceMobile Computing Today`                                                                      
## `SourceMobile ID World`                                                                             
## `SourceMobile News`                                                                                 
## `SourceMobile Payments Today`                                                                       
## `SourceMobile Press-Register`                                                                       
## `SourceMobile Today`                                                                                
## `SourceMobile World Live`                                                                           
## SourceMobileSyrup.com                                                                               
## SourceMobiPicker                                                                                    
## `SourceModel D`                                                                                     
## `SourceModern Diplomacy`                                                                            
## `SourceModern Distribution Management`                                                              
## SourceModernHealthcare.com                                                                          
## SourceModernMedicine                                                                                
## `SourceModest Money (press release) (blog)`                                                         
## `SourceMohave Daily News`                                                                           
## `SourceMohave Valley News`                                                                          
## `SourceMonadnock Ledger Transcript`                                                                 
## `SourceMondaq News Alerts (registration)`                                                           
## SourceMondoweiss                                                                                    
## SourceMoney                                                                                         
## `SourceMoney Flow Index`                                                                            
## `SourceMoney Magazine`                                                                              
## `SourceMoney Marketing`                                                                             
## `SourceMoney Marketing Online`                                                                      
## `SourceMoney Morning`                                                                               
## `SourceMoney Morning Australia`                                                                     
## `SourceMoney News (press release)`                                                                  
## `SourceMoney Talks News via Yahoo! Finance`                                                         
## SourceMoneycontrol.com                                                                              
## SourceMoneySense                                                                                    
## SourceMoneyweb.co.za                                                                                
## SourceMoneyWeek                                                                                     
## SourceMonitor                                                                                       
## `SourceMonitor Online (blog)`                                                                       
## `SourceMonroe Evening News`                                                                         
## `SourceMonroe News Star`                                                                            
## `SourceMontana Standard`                                                                            
## `SourceMontana Tech`                                                                                
## `SourceMonterey County Weekly`                                                                      
## `SourceMontgomery Advertiser`                                                                       
## `SourceMonthly Review`                                                                              
## `SourceMontreal Gazette`                                                                            
## `SourceMontserrat Reporter`                                                                         
## `SourceMoodys.com (press release) (subscription)`                                                   
## `SourceMorning Consult`                                                                             
## `SourceMorning Journal News`                                                                        
## `SourceMorning News USA`                                                                            
## `SourceMorning Star`                                                                                
## `SourceMorning Star Online`                                                                         
## `SourceMorning Ticker`                                                                              
## SourceMorningstar                                                                                   
## SourceMorningstar.com                                                                               
## `SourceMorocco World News`                                                                          
## `SourceMorris Daily Herald`                                                                         
## `SourceMother Jones`                                                                                
## `SourceMother Nature Network (blog)`                                                                
## SourceMotherboard                                                                                   
## `SourceMotley Fool`                                                                                 
## `SourceMotley Fool Australia`                                                                       
## `SourceMotor Trend`                                                                                 
## SourceMotoring                                                                                      
## `SourceMotorsport.com, Edition: Global`                                                             
## SourceMotorTrend                                                                                    
## `SourceMountain View Voice`                                                                         
## `SourceMovie TV Tech Geeks News`                                                                    
## SourceMoviefone                                                                                     
## Sourcemoviepilot.com                                                                                
## SourceMovieWeb                                                                                      
## `SourceMRCTV (blog)`                                                                                
## `SourceMRCTV (satire) (blog)`                                                                       
## `SourceMrTopStep.com via Yahoo! Finance`                                                            
## SourceMSDynamicsWorld.com                                                                           
## `SourceMSN Autos`                                                                                   
## SourceMSNBC                                                                                         
## SourceMSPmentor                                                                                     
## `SourceMSPmentor (blog)`                                                                            
## SourceMSPoweruser.com                                                                               
## SourceMTPR                                                                                          
## SourceMTV.com                                                                                       
## `SourceMulti-Housing News`                                                                          
## `SourceMultichannel News`                                                                           
## `SourceMumbai Mirror`                                                                               
## SourceMuMbrella                                                                                     
## `SourceMunchies_ Food by VICE`                                                                      
## `SourceMuncie Star Press`                                                                           
## `SourceMuscat Daily`                                                                                
## `SourceMuscatine Journal`                                                                           
## `SourceMusic Business Worldwide`                                                                    
## SourceMusicrooms.net                                                                                
## `SourceMuslimVillage.com (press release) (blog)`                                                    
## `SourceMWC News`                                                                                    
## `SourceMy Fox Boston`                                                                               
## `SourceMy News LA`                                                                                  
## `SourceMy Nintendo News (blog)`                                                                     
## `SourceMy Twin Tiers.com`                                                                           
## SourceMyAJC                                                                                         
## `SourceMyAJC (blog)`                                                                                
## `SourceMyanmar Times`                                                                               
## SourceMyBroadband                                                                                   
## SourceMyCentralJersey.com                                                                           
## SourceMyDaytonDailyNews                                                                             
## Sourcemyfox8.com                                                                                    
## SourceMYFOXZONE.com                                                                                 
## SourceMyjoyonline.com                                                                               
## SourceMyMotherLode.com                                                                              
## SourceMyNewsLA.com                                                                                  
## SourceMyNorthwest.com                                                                               
## `SourceMyrtle Beach Sun News`                                                                       
## SourcemySanAntonio.com                                                                              
## `SourcemySanAntonio.com (blog)`                                                                     
## SourceMyStateline.com                                                                               
## SourceMyStatesman.com                                                                               
## SourceMyTechBits                                                                                    
## `SourceN.C. State University Technician Online`                                                     
## SourceN4BB                                                                                          
## SourceNaharnet                                                                                      
## SourceNAIJ.COM                                                                                      
## `SourceNaked Capitalism`                                                                            
## `SourceNaked Security`                                                                              
## `SourceNaked Security (blog)`                                                                       
## `SourceNamibia Economist`                                                                           
## SourceNamibian                                                                                      
## `SourceNanaimo News Bulletin`                                                                       
## `SourceNanoNews (blog)`                                                                             
## `SourceNapa Valley Register`                                                                        
## `SourceNaples Daily News`                                                                           
## `SourceNarendra Modi (press release) (blog)`                                                        
## SourceNascar                                                                                        
## SourceNasdaq                                                                                        
## `SourceNashua Telegraph`                                                                            
## `SourceNashville Business Journal`                                                                  
## `SourceNashville Business Journal (blog)`                                                           
## `SourceNashville Chatter`                                                                           
## `SourceNathan McAlone, Business Insider via Yahoo! Finance`                                         
## `SourceNation News`                                                                                 
## `Sourcenation.lk - The Nation Newspaper`                                                            
## `SourceNational Catholic Register`                                                                  
## `SourceNational Catholic Reporter`                                                                  
## `SourceNational Catholic Reporter (blog)`                                                           
## `SourceNational Constitution Center via Yahoo! News`                                                
## `SourceNational Geographic`                                                                         
## `SourceNational Journal`                                                                            
## `SourceNational Mirror`                                                                             
## `SourceNational Observer`                                                                           
## `SourceNational Post`                                                                               
## `SourceNational Review Online`                                                                      
## `SourceNational Science Foundation (press release)`                                                 
## `SourceNational Turk English`                                                                       
## `SourceNATO HQ (press release)`                                                                     
## `SourceNatural Gas Intelligence`                                                                    
## `SourceNatural Resources Defense Council`                                                           
## `SourceNatural Resources Defense Council (blog)`                                                    
## SourceNature                                                                                        
## `SourceNature World News`                                                                           
## SourceNature.com                                                                                    
## `SourceNBC 12 Richmond`                                                                             
## `SourceNBC 2 Fort Myers`                                                                            
## `SourceNBC 29 News`                                                                                 
## `SourceNBC 5 Dallas-Fort Worth`                                                                     
## `SourceNBC 6 South Florida`                                                                         
## `SourceNBC 7 San Diego`                                                                             
## `SourceNBC Bay Area`                                                                                
## `SourceNBC Chicago`                                                                                 
## `SourceNBC Chicago (blog)`                                                                          
## `SourceNBC Connecticut`                                                                             
## `SourceNBC Montana`                                                                                 
## `SourceNBC Nebraska`                                                                                
## `SourceNBC New York`                                                                                
## `SourceNBC NEWS`                                                                                    
## `SourceNBC Southern California`                                                                     
## `SourceNBC2 News`                                                                                   
## `SourceNBC4 Washington`                                                                             
## SourceNBC4i.com                                                                                     
## SourceNBCNews.com                                                                                   
## SourceNBCSports.com                                                                                 
## SourceNCAA.com                                                                                      
## `SourceNCR-Iran.org`                                                                                
## SourceNDTV                                                                                          
## `SourceNDTV (blog)`                                                                                 
## SourceNDTVSports.com                                                                                
## `SourceNearshore Americas`                                                                          
## `SourceNehanda Radio`                                                                               
## `SourceNenagh Guardian`                                                                             
## `SourceNeos Kosmos`                                                                                 
## `SourceNeosho Daily News`                                                                           
## SourceNeowin                                                                                        
## SourceNerdist                                                                                       
## `SourceNerdWallet (blog)`                                                                           
## SourceNESN.com                                                                                      
## `SourceNetGuide NZ`                                                                                 
## SourceNetimperative                                                                                 
## `SourceNetwork World`                                                                               
## `SourceNetworks Asia`                                                                               
## SourceNeurogadget                                                                                   
## `SourceNevada County Picayune`                                                                      
## `SourceNew America Media`                                                                           
## `SourceNew Bern Sun Journal`                                                                        
## `SourceNew Era`                                                                                     
## `SourceNew Europe`                                                                                  
## `SourceNew Hampshire Business Review`                                                               
## `SourceNew Hampshire Public Radio`                                                                  
## `SourceNew Hampshire Union Leader`                                                                  
## `SourceNew Haven Register`                                                                          
## `SourceNew Historian`                                                                               
## `SourceNew Internationalist (blog)`                                                                 
## `SourceNew Jersey 101.5 FM Radio`                                                                   
## `SourceNew Jersey Herald`                                                                           
## `SourceNew Kerala`                                                                                  
## `SourceNew Matilda`                                                                                 
## `SourceNew Republic`                                                                                
## `SourceNew Ross Standard`                                                                           
## `SourceNew Sabah Times`                                                                             
## `SourceNew Scientist`                                                                               
## `SourceNew Statesman`                                                                               
## `SourceNew Straits Times Online`                                                                    
## `SourceNew Straits Times via Yahoo! Singapore News`                                                 
## `SourceNew University`                                                                              
## `SourceNew Vision`                                                                                  
## `SourceNew York's PIX11 / WPIX-TV`                                                                  
## `SourceNew York Business Journal`                                                                   
## `SourceNew York Daily News`                                                                         
## `SourceNew York Magazine`                                                                           
## `SourceNew York Post`                                                                               
## `SourceNew York Recorder`                                                                           
## `SourceNew York Review of Books`                                                                    
## `SourceNew York Sun`                                                                                
## `SourceNew York Times`                                                                           ***
## `SourceNew York Times (blog)`                                                                       
## `SourceNew York Times Finance`                                                                      
## `SourceNew Zealand Herald`                                                                          
## `SourceNew Zealand Listener`                                                                        
## `SourceNew Zimbabwe`                                                                                
## `SourceNew Zimbabwe.com`                                                                            
## SourceNewbritainherald                                                                              
## `SourceNewcastle Herald`                                                                            
## `SourceNewham Recorder`                                                                             
## SourceNewNowNext                                                                                    
## `SourceNews-Medical.net`                                                                            
## `SourceNews & Observer`                                                                             
## `SourceNews & Observer (blog)`                                                                      
## `SourceNews & Star`                                                                                 
## `SourceNews 10NBC`                                                                                  
## `SourceNews 1130`                                                                                   
## `SourceNews 24 South Africa`                                                                        
## `SourceNews Channel 12 New Bern`                                                                    
## `SourceNews Every day`                                                                              
## `SourceNews from Rutgers`                                                                           
## `SourceNews Ghana`                                                                                  
## `SourceNews On 6`                                                                                   
## `SourceNews On 6 Tulsa`                                                                             
## `SourceNews One`                                                                                    
## `SourceNews Oracle`                                                                                 
## `SourceNews Radio 710 KEEL`                                                                         
## `SourceNews Sentinel`                                                                               
## `SourceNews Talk 610 CKTB`                                                                          
## `SourceNews Talk 650 CKOM`                                                                          
## `SourceNews Talk 770 Calgary`                                                                       
## `SourceNews Talk Florida`                                                                           
## `SourceNews Tribe`                                                                                  
## `SourceNews Watch International`                                                                    
## `SourceNews West 9 Midland`                                                                         
## `SourceNews World India`                                                                            
## SourceNews.Az                                                                                       
## SourceNews.com.au                                                                                   
## SourceNEWS.com.au                                                                                   
## `SourceNews.com.au Travel`                                                                          
## Sourcenews.delaware.gov                                                                             
## `SourceNEWS10 ABC`                                                                                  
## SourceNews1130                                                                                      
## SourceNews18                                                                                        
## SourceNews24                                                                                        
## `SourceNews24 Nigeria`                                                                              
## SourceNews3LV                                                                                       
## SourceNews4C                                                                                        
## `Sourcenews9.com KWTV`                                                                              
## `SourceNewsAhead Agency`                                                                            
## SourceNewsandtribune                                                                                
## SourcenewsBTC                                                                                       
## SourceNewsbug.info                                                                                  
## `SourceNewsBusters (blog)`                                                                          
## SourceNewscenter1.tv                                                                                
## `SourceNewschannel 6 Wichita Falls`                                                                 
## SourceNewsChannel5.com                                                                              
## SourceNewsday                                                                                       
## SourceNewsDay                                                                                       
## SourceNewsdzeZimbabwe                                                                               
## SourceNewser                                                                                        
## SourceNewsexaminer                                                                                  
## `SourceNewsFactor Network`                                                                          
## SourceNewsfirst                                                                                     
## SourceNewsGhana.com.gh                                                                              
## `SourceNewsHounds (blog)`                                                                           
## SourceNewshub                                                                                       
## `SourceNewshub (blog)`                                                                              
## SourceNewsInferno                                                                                   
## SourceNewsmax                                                                                       
## `SourceNewsnext Bangladesh`                                                                         
## SourceNewsOK.com                                                                                    
## SourceNewsQuench                                                                                    
## `SourceNewstalk 106-108 fm`                                                                         
## `SourceNewstalk ZB`                                                                                 
## `SourceNewsWay 21`                                                                                  
## SourceNewsweek                                                                                      
## `SourceNewsweek ME`                                                                                 
## `SourceNewsweek via Yahoo UK & Ireland News`                                                        
## `SourceNewsweek via Yahoo! News`                                                                    
## `SourceNewsweel ME (satire) (press release) (blog)`                                                 
## SourceNewsWest9.com                                                                                 
## SourceNewswise                                                                                      
## SourceNewsWithViews.com                                                                             
## SourceNewsworks.org                                                                                 
## SourceNewsx                                                                                         
## SourceNewsy                                                                                         
## `SourceNewton Press Mentor`                                                                         
## SourceNewzy                                                                                         
## `SourceNext Big Future`                                                                             
## `SourceNext City`                                                                                   
## SourceNextShark                                                                                     
## `SourceNFC World`                                                                                   
## SourceNFL.com                                                                                       
## `SourceNiagara Falls Review`                                                                        
## `SourceNiche Gamer`                                                                                 
## `SourceNigeria (press release) (blog)`                                                              
## `SourceNightcap TV`                                                                                 
## `SourceNikkei Asian Review`                                                                         
## `SourceNine O&#39;Clock`                                                                            
## `Sourceninemsn 9Stories`                                                                            
## `SourceNintendo Life`                                                                               
## `SourceNIU Newsroom`                                                                                
## SourceNJ.com                                                                                        
## SourceNJBIZ                                                                                         
## `SourceNK News`                                                                                     
## `SourceNL Times`                                                                                    
## SourceNME                                                                                           
## SourceNME.com                                                                                       
## SourceNMPolitics.net                                                                                
## `SourceNo Jitter`                                                                                   
## SourceNOLA.com                                                                                      
## SourceNooga.com                                                                                     
## SourceNoozhawk                                                                                      
## `SourceNorfolk Eastern Daily Press`                                                                 
## `SourceNorman Transcript`                                                                           
## `SourceNorth American Windpower`                                                                    
## `SourceNorth Bay Business Journal`                                                                  
## `SourceNorth Country Public Radio`                                                                  
## `SourceNorth Queensland Register`                                                                   
## `SourceNorthampton Chronicle & Echo`                                                                
## `SourceNorthamptonshire Telegraph`                                                                  
## `SourceNortheast Mississippi Daily Journal`                                                         
## `SourceNorthern Californian`                                                                        
## `SourceNorthern Echo`                                                                               
## `SourceNorthern Star`                                                                               
## SourceNorthernLife.ca                                                                               
## SourceNorthfield.org                                                                                
## SourceNorthJersey.com                                                                               
## `SourceNorthumberland Gazette`                                                                      
## `SourceNorthwest Arkansas News`                                                                     
## `SourceNorthwest Georgia News`                                                                      
## `SourceNorthwest Herald`                                                                            
## `SourceNorthwestern University NewsCenter`                                                          
## `SourceNotebook Review`                                                                             
## SourceNotebookReview.com                                                                            
## `SourceNottingham Post`                                                                             
## SourceNovinite                                                                                      
## SourceNovinite.com                                                                                  
## `SourceNOW Magazine`                                                                                
## SourceNowGamer                                                                                      
## SourceNPR                                                                                           
## SourceNSEAVoice.com                                                                                 
## `SourceNT News`                                                                                     
## SourceNTV                                                                                           
## SourceNumbersUSA                                                                                    
## SourceNuvo                                                                                          
## `SourceNUVO Newsweekly`                                                                             
## SourceNWAOnline                                                                                     
## SourceNWCN.com                                                                                      
## Sourcenwitimes.com                                                                                  
## `SourceNY Blueprint`                                                                                
## `SourceNyasa Times`                                                                                 
## SourceNYCaribNews                                                                                   
## `SourceNYSE Post`                                                                                   
## `SourceNYU Washington Square News`                                                                  
## `SourceNZ Newswire via Yahoo! New Zealand News`                                                     
## `SourceNZ Newswire via Yahoo!7 News`                                                                
## SourceNZCity                                                                                        
## `SourceOakland Tribune`                                                                             
## `SourceOakville Beaver`                                                                             
## SourceObserver                                                                                      
## `SourceObserver-Reporter`                                                                           
## `SourceObstacle Racing Media (press release) (blog)`                                                
## SourceOcala                                                                                         
## SourceOCCRP                                                                                         
## SourceOCRegister                                                                                    
## `Sourceodditycentral (blog)`                                                                        
## `SourceOdessa American`                                                                             
## SourceOilOnline                                                                                     
## SourceOilPrice.com                                                                                  
## `SourceOilprice.com via Yahoo Canada Finance`                                                       
## `SourceOilprice.com via Yahoo! Finance`                                                             
## `SourceOilprice.com via Yahoo! New Zealand Finance`                                                 
## `SourceOilprice.com via Yahoo!7 Finance`                                                            
## `SourceOK! Magazine`                                                                                
## `SourceOklahoma&#39;s NewsChannel 4`                                                                
## `SourceOldham Chronicle`                                                                            
## `SourceOlean Times Herald`                                                                          
## `SourceOlhar Digital`                                                                               
## `SourceOlive Press`                                                                                 
## `SourceOmaha World-Herald`                                                                          
## `SourceOMCT World Organisation Against Torture`                                                     
## `SourceOmnisport via Yahoo! Sports`                                                                 
## `SourceOn Cars India`                                                                               
## `SourceOn Line opinion`                                                                             
## `SourceOne India`                                                                                   
## SourceOneindia                                                                                      
## SourceOneNewsNow                                                                                    
## `SourceOneonta Daily Star`                                                                          
## `SourceOnline Athens`                                                                               
## `SourceOnly Single Player`                                                                          
## Sourceonmanorama                                                                                    
## SourceOnrec                                                                                         
## `SourceOntario Argus Observer`                                                                      
## `SourceOnward State`                                                                                
## SourceOnWindows.com                                                                                 
## `SourceOPB News`                                                                                    
## SourceOpEdNews                                                                                      
## `SourceOpen Democracy`                                                                              
## `SourceOPEN MINDS (registration)`                                                                   
## `SourceOpen Minds UFO News`                                                                         
## SourceOpenCanada                                                                                    
## `SourceOpenDNS Blog (blog)`                                                                         
## `SourceOpinion Internationale`                                                                      
## `SourceOpposing Views`                                                                              
## `SourceoptionMONSTER Research`                                                                      
## `SourceoptionMONSTER via Yahoo! Finance`                                                            
## `SourceOR-Politics.com`                                                                             
## `SourceOracleUnion.com (blog)`                                                                      
## `SourceOrange County Register`                                                                      
## `SourceOregon Daily Emerald`                                                                        
## `SourceOregon Public Broadcasting`                                                                  
## SourceOregonLive.com                                                                                
## `SourceOrlando Business Journal`                                                                    
## `SourceOrlando Business Journal (blog)`                                                             
## `SourceOrlando Sentinel`                                                                            
## `SourceOrlando Weekly (blog)`                                                                       
## `SourceOroville Mercury Register`                                                                   
## `SourceOS News`                                                                                     
## SourceOSNews                                                                                        
## `SourceOSU - The Lantern`                                                                           
## `SourceOsun Defender`                                                                               
## `SourceOswego Daily News`                                                                           
## `SourceOtago Daily Times`                                                                           
## `SourceOTC Outlook`                                                                                 
## `SourceOttawa Citizen`                                                                              
## `SourceOttawa Sun`                                                                                  
## `SourceOumma.com: point de vue musulman sur l'actualit\\u009d\\u009d`                               
## `SourceOumma.com: point de vue musulman sur l'actualité`                                            
## `SourceOUPblog (blog)`                                                                              
## SourceOurQuadCities                                                                                 
## `SourceOut-Law`                                                                                     
## `SourceOut-Law.com`                                                                                 
## `SourceOut Magazine`                                                                                
## SourceOutdoorHub                                                                                    
## `SourceOuter Places`                                                                                
## `SourceOutlook India`                                                                               
## SourceOverlawyered                                                                                  
## `SourceOxfam America (press release) (blog)`                                                        
## `SourceOxford Mail`                                                                                 
## `SourceOxford Student`                                                                              
## `SourceOye! Times`                                                                                  
## SourceOZY                                                                                           
## `SourceOzy via Yahoo Canada News`                                                                   
## `SourceOzy via Yahoo! News`                                                                         
## `SourcePA Money News via Yahoo UK & Ireland Finance`                                                
## `SourcePacific Business News (Honolulu)`                                                            
## `SourcePacific Daily News`                                                                          
## `SourcePacific Standard`                                                                            
## `SourcePage Six`                                                                                    
## `SourcePajhwok Afghan News (subscription) (blog)`                                                   
## `SourcePakistan Christian Post`                                                                     
## `SourcePakistan Observer`                                                                           
## `SourcePakistan Today`                                                                              
## SourcePalatinate                                                                                    
## `SourcePalestine Herald Press`                                                                      
## `SourcePalestine News Network`                                                                      
## `SourcePalestine Note`                                                                              
## `SourcePalladium-Item`                                                                              
## SourcePallonate                                                                                     
## `SourcePalm Beach Daily News`                                                                       
## `SourcePalm Beach Post`                                                                             
## `SourcePalm Beach Post (blog)`                                                                      
## `SourcePamplin Media Group`                                                                         
## `SourcePanAm Post (blog)`                                                                           
## SourcePanARMENIAN.Net                                                                               
## SourceParade                                                                                        
## `SourceParent Herald`                                                                               
## `SourceParkersburg News`                                                                            
## `SourceParksville Qualicum Beach News`                                                              
## `SourceParti Anti Sioniste`                                                                         
## `SourcePassport Magazine`                                                                           
## SourcePatch.com                                                                                     
## `SourcePatently Apple`                                                                              
## `SourcePatheos (blog)`                                                                              
## `SourcePatriot Post`                                                                                
## `SourcePattaya Today`                                                                               
## `SourcePayment Week`                                                                                
## `SourcePayScale Career News (blog)`                                                                 
## SourcePayvand                                                                                       
## `SourcePayvand Iran News`                                                                           
## `SourcePBS NewsHour`                                                                                
## `SourcePC-Tablet`                                                                                   
## `SourcePc-Tablet Media`                                                                             
## `SourcePC Advisor`                                                                                  
## `SourcePC Authority`                                                                                
## `SourcePC Gamer`                                                                                    
## `SourcePC Magazine`                                                                                 
## `SourcePC Perspectives`                                                                             
## `SourcePC PowerPlay`                                                                                
## `SourcePC Tech Magazine`                                                                            
## `SourcePC World`                                                                                    
## SourcePCGamesN                                                                                      
## `SourcePCMag India`                                                                                 
## `Sourcepcplus tabloid komputer`                                                                     
## `SourcePCR-online.biz`                                                                              
## SourcePCWorld                                                                                       
## `SourcePE Hub (subscription) (blog)`                                                                
## `SourcePeeblesshire News`                                                                           
## `SourcePeninsula Clarion`                                                                           
## `SourcePeninsula On-line`                                                                           
## `SourcePenn State News`                                                                             
## `SourcePenn: Office of University Communications`                                                   
## SourcePennLive.com                                                                                  
## `SourcePensacola News Journal`                                                                      
## `SourcePensions & Investments`                                                                      
## `SourcePenticton Western News`                                                                      
## `SourcePeople's World`                                                                              
## `SourcePEOPLE Great Ideas`                                                                          
## `SourcePeople Magazine`                                                                             
## `SourcePEOPLE StyleWatch`                                                                           
## `SourcePeoria Journal Star`                                                                         
## `SourcePeoria Public Radio`                                                                         
## `SourcePerez Hilton`                                                                                
## SourcePerezHilton.com                                                                               
## `SourcePersonal Liberty Digest`                                                                     
## SourcePersonnelToday.com                                                                            
## `SourcePerth Now`                                                                                   
## `SourcePeru this Week`                                                                              
## `SourcePetaPixel (blog)`                                                                            
## `SourcePeter Greenberg.com Travel News`                                                             
## `SourcePeterborough Telegraph`                                                                      
## `SourcePetoskey News-Review`                                                                        
## `SourcePetra News Agency`                                                                           
## `SourcePew Research Center`                                                                         
## `SourcePew Research Center's Global Attitudes Project`                                              
## `SourcePew Research Center's Internet and American Life Project`                                    
## `SourcePew Research Center for the People and the Press`                                            
## SourcePhandroid.com                                                                                 
## `SourcePharmaceutical Executive (press release) (registration) (blog)`                              
## SourcePharmaceuticalOnline                                                                          
## `SourcePhiladelphia Business Journal`                                                               
## `SourcePhilippine Star`                                                                             
## `SourcePhilippine Star via Yahoo! Philippines News`                                                 
## SourcePhilly.com                                                                                    
## `SourcePhilly.com (blog)`                                                                           
## SourcePhillyVoice.com                                                                               
## `SourcePhnom Penh Post`                                                                             
## `SourcePhoenix Business Journal (blog)`                                                             
## `SourcePhone Arena`                                                                                 
## `SourcePhone Scoop`                                                                                 
## SourcePhoneDog                                                                                      
## `SourcePhones Review`                                                                               
## `SourcePhoneWorld Magazine (press release) (blog)`                                                  
## `SourcePhotographyBLOG (blog)`                                                                      
## SourcePhotonics.com                                                                                 
## SourcePhys.Org                                                                                      
## `SourcePhysics Today`                                                                               
## SourcePickupTrucks.com                                                                              
## `SourcePine Bluff Commercial`                                                                       
## SourcePinkNews                                                                                      
## `SourcePioneers Post (press release) (registration) (blog)`                                         
## `SourcePirate FM`                                                                                   
## `SourcePitchfork Media`                                                                             
## `SourcePittsburgh Business Times (blog)`                                                            
## `SourcePittsburgh Post-Gazette`                                                                     
## `SourcePittsburgh Tribune-Review`                                                                   
## `SourcePJ Media`                                                                                    
## `SourcePJ Media (blog)`                                                                             
## SourcePlanet                                                                                        
## SourcePlanetSave.com                                                                                
## SourcePlantAutomation.com                                                                           
## `SourcePlastics & Rubber Weekly`                                                                    
## `SourcePlastics and Rubber Weekly`                                                                  
## `SourcePlastics News`                                                                               
## SourcePlatts                                                                                        
## `SourcePlatts (blog)`                                                                               
## `SourcePlay the Game`                                                                               
## `SourcePlayStation LifeStyle`                                                                       
## `Sourceplus55 (blog)`                                                                               
## `SourcePlymouth Herald`                                                                             
## `SourcePMLiVE (blog)`                                                                               
## `SourcePocket-lint.com`                                                                             
## `SourcePoint of Sale News (tm) (press release) (blog)`                                              
## `SourcePolicy Network`                                                                              
## SourcePolitickerNJ                                                                                  
## SourcePolitico                                                                                      
## `SourcePolitico (blog)`                                                                             
## `SourcePOLITICO Magazine`                                                                           
## SourcePOLITICO.eu                                                                                   
## SourcePoliticsHome.com                                                                              
## SourcePoliticsweb                                                                                   
## SourcePoliticusUSA                                                                                  
## SourcePolitiFact                                                                                    
## SourcePolygon                                                                                       
## `SourcePolygon via Yahoo! News`                                                                     
## `SourcePOP Herald`                                                                                  
## SourcePOPSUGAR                                                                                      
## `SourcePopular Mechanics`                                                                           
## `SourcePopular Science`                                                                             
## SourcePopzara                                                                                       
## `SourcePort Huron Times Herald`                                                                     
## `SourcePorterville Recorder`                                                                        
## `SourcePortland Business Journal (blog)`                                                            
## `SourcePortland Tribune`                                                                            
## `SourcePortsmouth News`                                                                             
## `SourcePost-Bulletin`                                                                               
## `SourcePost-Tribune`                                                                                
## `SourcePost and Parcel`                                                                             
## `SourcePost Online`                                                                                 
## `SourcePost Online (blog)`                                                                          
## `SourcePoughkeepsie Journal`                                                                        
## `SourcePowder Magazine`                                                                             
## `SourcePower Line (blog)`                                                                           
## SourcePoynter.org                                                                                   
## `SourcePPcorn (blog)`                                                                               
## SourcePplware                                                                                       
## `SourcePR Newswire`                                                                                 
## `SourcePR Newswire (press release)`                                                                 
## `SourcePR Newswire UK (press release)`                                                              
## `SourcePR Newswire via Yahoo! Finance`                                                              
## `SourcePR Web (press release)`                                                                      
## `SourcePrague Daily Monitor`                                                                        
## `SourcePrague Post`                                                                                 
## SourcePrameyaNews7                                                                                  
## SourcePravda                                                                                        
## SourcePremier                                                                                       
## `SourcePremium Times`                                                                               
## `SourcePrensa Latina`                                                                               
## `SourcePress-Enterprise`                                                                            
## `SourcePress & Sun-Bulletin`                                                                        
## `SourcePress & Sun-Bulletin (blog)`                                                                 
## `SourcePress and Journal`                                                                           
## `SourcePress Association via Yahoo UK & Ireland News`                                               
## `SourcePress Herald`                                                                                
## `SourcePress Insider Daily`                                                                         
## `SourcePress of Atlantic City`                                                                      
## `SourcePress Release Rocket`                                                                        
## `SourcePress Release Service (press release)`                                                       
## `SourcePress Telegraph (blog)`                                                                      
## `SourcePress Trust of India`                                                                        
## `SourcePress TV`                                                                                    
## `SourcePressChronicle.com (blog)`                                                                   
## `SourcePressenza International Press Agency`                                                        
## SourcePRI                                                                                           
## `SourcePrime Minister of Canada (press release)`                                                    
## `SourcePrince Albert Daily Herald`                                                                  
## `SourcePrince George Citizen`                                                                       
## `SourcePrinted Electronics World`                                                                   
## `SourcePrivate Eye`                                                                                 
## SourcePRNewser                                                                                      
## `SourceProactive Investors UK`                                                                      
## `SourceProduct Reviews`                                                                             
## `SourceProfit Confidential`                                                                         
## SourceProgrammableWeb                                                                               
## `SourceProgress Illinois`                                                                           
## `SourceProgress.org (blog)`                                                                         
## `SourceProject Syndicate`                                                                           
## `SourceProlific North`                                                                              
## `SourceProperty Guru via Yahoo! Singapore News`                                                     
## `SourceProperty Magazine International`                                                             
## SourcePropertyCasualty360                                                                           
## SourceProPublica                                                                                    
## `SourceProspect (blog)`                                                                             
## `SourceProthom Alo (English)`                                                                       
## `SourceProvidence Business News`                                                                    
## SourcePRWeb                                                                                         
## SourcePRWeek                                                                                        
## `SourcePSFK (blog)`                                                                                 
## `SourcePSX Extreme`                                                                                 
## `SourcePublic Finance`                                                                              
## `SourcePublic Finance International`                                                                
## `SourcePublic Knowledge Tech News and Comment (blog)`                                               
## `SourcePublishers Weekly (blog)`                                                                    
## `SourcePueblo Chieftain`                                                                            
## `SourcePuget Sound Business Journal (Seattle)`                                                      
## `SourcePuget Sound Business Journal (Seattle) (blog)`                                               
## `SourcePulitzer Center on Crisis Reporting`                                                         
## Sourcepulse                                                                                         
## `SourcePulse Headlines`                                                                             
## `SourcePulse Nigeria`                                                                               
## SourcePulse.com.gh                                                                                  
## `SourcePulse+IT`                                                                                    
## `SourcePurdue Agricultural Communications`                                                          
## `SourcePush Square`                                                                                 
## `SourcePV-Tech`                                                                                     
## `Sourcepv magazine`                                                                                 
## SourcePYMNTS.com                                                                                    
## `SourceQ13 FOX`                                                                                     
## `SourceQ13 FOX Seattle`                                                                             
## SourceQantara.de                                                                                    
## `SourceQuad-Cities Online`                                                                          
## `SourceQuad City Times`                                                                             
## SourceQuartz                                                                                        
## `SourceQuartz via Yahoo UK & Ireland Finance`                                                       
## `SourceQuartz via Yahoo! Finance`                                                                   
## `SourceQueen's Journal`                                                                             
## `SourceQueensland Country Life`                                                                     
## `SourceQueensland Times`                                                                            
## SourceQueerty                                                                                       
## `SourceQuincy Herald-Whig`                                                                          
## `SourceR & D Magazine`                                                                              
## Sourcerabble.ca                                                                                     
## `Sourcerabble.ca (blog)`                                                                            
## `SourceRacked NY`                                                                                   
## SourceRadarOnline                                                                                   
## `SourceRadio Cadena Agramonte`                                                                      
## `SourceRadio Canada International`                                                                  
## `SourceRadio Free Asia`                                                                             
## `SourceRadio Iowa`                                                                                  
## `SourceRadio New Zealand`                                                                           
## `SourceRadio Pakistan (press release)`                                                              
## `SourceRadio Prague`                                                                                
## `SourceRadio Tamazuj`                                                                               
## `SourceRadio Times`                                                                                 
## `SourceRadio.com Music and Entertainment News`                                                      
## `SourceRadioFreeEurope/RadioLiberty`                                                                
## SourceRadioVop                                                                                      
## `SourceRand Daily Mail`                                                                             
## `SourceRandolph County Herald Tribune`                                                              
## SourceRapaport                                                                                      
## `SourceRapid City Journal`                                                                          
## `SourceRapid tv news`                                                                               
## SourceRappler                                                                                       
## SourceRappler.com                                                                                   
## `SourceRasmussen Reports`                                                                           
## `SourceRaw Story`                                                                                   
## `SourceRCR Wireless News`                                                                           
## `SourceRe/code`                                                                                     
## `SourceReading Eagle`                                                                               
## SourceReadWrite                                                                                     
## SourceReadWriteWeb                                                                                  
## SourceRealClearMarkets                                                                              
## SourceRealClearPolitics                                                                             
## SourceRéalités                                                                                      
## `SourceRealtor.com News`                                                                            
## `SourceRealty Today`                                                                                
## `SourceRealWire (press release)`                                                                    
## SourceReason                                                                                        
## `SourceReason (blog)`                                                                               
## `SourceReboot Illinois`                                                                             
## SourceRecode                                                                                        
## SourceRecombu                                                                                       
## `SourceRecorder Press (blog)`                                                                       
## `SourceRecorderpost.com (satire) (registration) (blog)`                                             
## `SourceRecycling International`                                                                     
## `SourceRecycling Today`                                                                             
## `SourceRed Alert Politics`                                                                          
## `SourceRed and Black`                                                                               
## `SourceRed Deer Advocate`                                                                           
## `SourceRed Flag`                                                                                    
## `SourceRedding Record Searchlight`                                                                  
## `SourceRedheaded Blackbelt`                                                                         
## Sourcerediff.com                                                                                    
## `SourceRedmond Channel Partner`                                                                     
## `SourceRedmond Channel Partner (blog)`                                                              
## `SourceRedmond Reporter`                                                                            
## SourceRedmondmag.com                                                                                
## `SourceRedmondmag.com (blog)`                                                                       
## `SourceRedress Information & Analysis`                                                              
## `SourceRedwood Falls Gazette`                                                                       
## SourceRefinery29                                                                                    
## `SourceRegina Leader-Post`                                                                          
## `SourceReligion News Service`                                                                       
## `SourceRenewable Energy Focus`                                                                      
## SourceRenewAmerica                                                                                  
## SourceRenewEconomy                                                                                  
## SourcereNews                                                                                        
## `SourceReno Gazette-Journal`                                                                        
## `SourceReno Gazette Journal`                                                                        
## `SourceReporters without borders (press release)`                                                   
## SourceRepublica                                                                                     
## `SourceReseller News`                                                                               
## `SourceResource Investor`                                                                           
## SourceReuters                                                                                       
## `SourceReuters - UK Focus via Yahoo UK & Ireland Finance`                                           
## `SourceReuters Africa`                                                                              
## `SourceReuters Blogs (blog)`                                                                        
## `SourceReuters Canada`                                                                              
## `SourceReuters India`                                                                               
## `SourceReuters Middle East via Yahoo Maktoob News`                                                  
## `SourceReuters UK`                                                                                  
## `SourceReuters via Yahoo Canada Finance`                                                            
## `SourceReuters via Yahoo Canada News`                                                               
## `SourceReuters via Yahoo Maktoob News`                                                              
## `SourceReuters via Yahoo UK & Ireland Finance`                                                      
## `SourceReuters via Yahoo UK & Ireland News`                                                         
## `SourceReuters via Yahoo UK & Ireland Sport`                                                        
## `SourceReuters via Yahoo! Finance`                                                                  
## `SourceReuters via Yahoo! Finance India`                                                            
## `SourceReuters via Yahoo! India News`                                                               
## `SourceReuters via Yahoo! New Zealand News`                                                         
## `SourceReuters via Yahoo! News`                                                                     
## `SourceReuters via Yahoo! Philippines News`                                                         
## `SourceReuters via Yahoo! Philippines Sports`                                                       
## `SourceReuters via Yahoo! Singapore News`                                                           
## `SourceReuters via Yahoo! Singapore Sports`                                                         
## `SourceReuters via Yahoo! Sports`                                                                   
## `SourceReuters via Yahoo!7 Finance`                                                                 
## `SourceReuters via Yahoo!7 News`                                                                    
## `SourceReykjav\\u009d\\u009dk Grapevine`                                                            
## SourceRFI                                                                                           
## `SourceRhode Island Public Radio`                                                                   
## `SourceRI Future`                                                                                   
## `SourceRichmond County Daily Journal`                                                               
## `SourceRichmond Times-Dispatch`                                                                     
## SourceRichmond.com                                                                                  
## `SourceRick Kupchella's BringMeTheNews`                                                             
## `SourceRight Side News`                                                                             
## `SourceRight Wing Watch`                                                                            
## SourceRigzone                                                                                       
## `SourceRing of Fire`                                                                                
## `SourceRisers & Fallers`                                                                            
## `SourceRising Kashmir (press release) (registration) (blog)`                                        
## `SourceRising Kashmir Daily English Newspaper`                                                      
## `SourceRIT University News Services`                                                                
## `SourceRiverfront Times (blog)`                                                                     
## SourceRiversideGazette.com                                                                          
## `SourceRoad to Paris`                                                                               
## `SourceRoad to VR`                                                                                  
## `SourceRoad Warrior Voices`                                                                         
## SourceRoadandTrack.com                                                                              
## `SourceRoads and Kingdoms`                                                                          
## `SourceRoanoke Times`                                                                               
## SourceRobdailynews                                                                                  
## SourceRobohub                                                                                       
## `SourceRochdale Online`                                                                             
## `SourceRochester Democrat and Chronicle`                                                            
## `SourceRochester Democrat and Chronicle (blog)`                                                     
## SourceRocketNews24                                                                                  
## `SourceRockford Register Star`                                                                      
## `SourceRockhampton Morning Bulletin`                                                                
## `SourceRoll Call`                                                                                   
## `SourceRoll Call (blog)`                                                                            
## `SourceRoll Call (registration)`                                                                    
## `SourceRoll Call (registration) (blog)`                                                             
## SourceRollingStone.com                                                                              
## `SourceRomania-Insider.com`                                                                         
## `SourceRomford Recorder`                                                                            
## SourceRomper                                                                                        
## `SourceRoute Fifty`                                                                                 
## `SourceRoyal Gazette`                                                                               
## `SourceRoyal Society of Chemistry`                                                                  
## SourceRT                                                                                            
## SourceRTBF                                                                                          
## `SourceRTE News`                                                                                    
## `SourceRTÉ News`                                                                                    
## SourceRTE.ie                                                                                        
## `SourceRTT News`                                                                                    
## `SourceRTV Slovenija`                                                                               
## `SourceRU Daily Targum`                                                                             
## SourceRudaw                                                                                         
## `SourceRuidoso News`                                                                                
## `SourceRunway Girl Network`                                                                         
## SourceRushLimbaugh.com                                                                              
## `SourceRussia and India Report`                                                                     
## `SourceRussia Beyond the Headlines`                                                                 
## `SourceRussia Direct`                                                                               
## `SourceRussian Information Agency Novosti`                                                          
## `SourceRutland Herald`                                                                              
## SourceRwanda                                                                                        
## `SourceRwanda News Agency (registration)`                                                           
## `SourceSabah Daily Express`                                                                         
## `SourceSac City Express`                                                                            
## `SourceSacramento Bee`                                                                              
## `SourceSacramento Bee (blog)`                                                                       
## `SourceSacramento Business Journal`                                                                 
## `SourceSahara Reporters`                                                                            
## SourceSaharaReporters.com                                                                           
## `SourceSalem-News.Com`                                                                              
## `SourceSalem State Log`                                                                             
## SourceSalemNews.net                                                                                 
## SourceSalina.com                                                                                    
## `SourceSalisbury Journal`                                                                           
## SourceSalon                                                                                         
## SourceSalon.com                                                                                     
## `SourceSalt Lake Tribune`                                                                           
## `SourceSAMAA TV (press release) (registration) (blog)`                                              
## `SourceSan Angelo LIVE!`                                                                            
## `SourceSan Angelo Standard Times`                                                                   
## `SourceSan Antonio Business Journal`                                                                
## `SourceSan Antonio Express-News`                                                                    
## `SourceSan Antonio Express-News (subscription)`                                                     
## `SourceSan Bernardino County Sun`                                                                   
## `SourceSan Bernardino Sun`                                                                          
## `SourceSan Diego Free Press`                                                                        
## `SourceSan Diego Jewish World`                                                                      
## `SourceSan Francisco Bay View`                                                                      
## `SourceSan Francisco Business Times (blog)`                                                         
## `SourceSan Francisco Chronicle`                                                                     
## `SourceSan Francisco Examiner`                                                                      
## `SourceSan Francisco Sun Times`                                                                     
## `SourceSan Jose Mercury News`                                                                       
## `SourceSan Jose Mercury News media center`                                                          
## `SourceSan Mateo Daily Journal`                                                                     
## `SourceSandton Chronicle`                                                                           
## `SourceSanta Barbara Independent`                                                                   
## `SourceSanta Clarita Valley Signal`                                                                 
## `SourceSanta Cruz Sentinel`                                                                         
## `SourceSanta Fe New Mexican`                                                                        
## `SourceSanta Fe New Mexican (blog)`                                                                 
## `SourceSanta Fe Reporter`                                                                           
## `SourceSanta Maria Times (subscription)`                                                            
## `SourceSanta Rosa Press Democrat`                                                                   
## SourceSaphirNews.com                                                                                
## `SourceSarasota Herald-Tribune`                                                                     
## `SourceSarnia Observer`                                                                             
## `SourceSaskatoon StarPhoenix`                                                                       
## SourceSaskatoonhomepage.ca                                                                          
## `SourceSaudi Gazette`                                                                               
## `SourceSaudi Gazette via Yahoo Maktoob News`                                                        
## `SourceSauk Prairie Eagle`                                                                          
## `SourceSault Star`                                                                                  
## `SourceSault Ste. Marie Evening News`                                                               
## `SourceSavannah Morning News`                                                                       
## `SourceSB Nation`                                                                                   
## SourceSBS                                                                                           
## `SourceSBS - The World Game`                                                                        
## `SourceSC Magazine`                                                                                 
## `SourceSC Magazine UK`                                                                              
## `SourceScarborough Today`                                                                           
## `SourceSci-Tech Today`                                                                              
## SourceSciDev.Net                                                                                    
## `SourceScience /AAAS`                                                                               
## `SourceScience 2.0`                                                                                 
## `SourceScience Daily`                                                                               
## `SourceScience Magazine`                                                                            
## `SourceScience Recorder`                                                                            
## `SourceScience Times`                                                                               
## `SourceScience World Report`                                                                        
## SourceScienceAlert                                                                                  
## `SourceScienceBlog.com (blog)`                                                                      
## `SourceScientific American`                                                                         
## `SourceScientific American (blog)`                                                                  
## SourceSCNow                                                                                         
## SourceScoop.co.nz                                                                                   
## `SourceScoop.co.nz (press release)`                                                                 
## SourceScoopWhoop                                                                                    
## `SourceScotland on Sunday`                                                                          
## SourceScotsman                                                                                      
## `SourceScotsman (blog)`                                                                             
## `SourceScottish Daily Record`                                                                       
## `SourceScottish Housing News`                                                                       
## `SourceScottsbluff Star Herald`                                                                     
## `SourceSCOTUSblog (blog)`                                                                           
## `SourceScranton Times-Tribune`                                                                      
## `SourceScreen International`                                                                        
## SourceScroll.in                                                                                     
## `SourceSDE Entertainment News`                                                                      
## `SourceSDPB Radio`                                                                                  
## `SourceSDSU Newscenter`                                                                             
## SourceSDTimes.com                                                                                   
## SourceSeacoastonline.com                                                                            
## `SourceSearch Engine Journal`                                                                       
## `SourceSearch Engine Land`                                                                          
## `SourceSeattle Globalist`                                                                           
## `SourceSeattle Sun Times`                                                                           
## `SourceSeattle Times`                                                                               
## Sourceseattlepi.com                                                                                 
## `Sourceseattlepi.com (blog)`                                                                        
## SourceSECcountry.com                                                                                
## `SourceSecrecy News (blog)`                                                                         
## `SourceSecurity Intelligence (blog)`                                                                
## `SourceSee It Market (blog)`                                                                        
## SourceSeeker                                                                                        
## `SourceSeeker (registration) (blog)`                                                                
## `SourceSeeking Alpha`                                                                               
## `SourceSeeNews (subscription)`                                                                      
## `SourceSeeNews Renewables`                                                                          
## SourceSegmentNext                                                                                   
## SourceSelectButton                                                                                  
## `SourceSentinel & Enterprise`                                                                       
## `SourceServer Watch`                                                                                
## `SourceSETHLUI.com via Yahoo! Singapore News`                                                       
## `SourceSevier News Messenger`                                                                       
## `SourceSeychelles News Agency`                                                                      
## `SourceSeymour Tribune`                                                                             
## `SourceSF Weekly (blog)`                                                                            
## SourceSFGate                                                                                        
## `SourceSFGate (blog)`                                                                               
## SourceSFist                                                                                         
## SourceShacknews                                                                                     
## `SourceShanghai Daily (subscription)`                                                               
## Sourceshanghaidaily                                                                                 
## SourceShanghaiist                                                                                   
## `Sourceshare market updates (press release)`                                                        
## `SourceShareCafe (registration)`                                                                    
## SourceShareCast                                                                                     
## `SourceSharecast via Yahoo UK & Ireland Finance`                                                    
## SourceShareChat                                                                                     
## SourceSharekhan                                                                                     
## SourceSheKnows.com                                                                                  
## `SourceSherwood Park News`                                                                          
## `SourceShields Gazette`                                                                             
## `SourceShillong Times`                                                                              
## `SourceShiny Shiny`                                                                                 
## `SourceShreveport Times`                                                                            
## SourceSHRM                                                                                          
## `SourceShropshire Star`                                                                             
## Sourceshropshirestar.com                                                                            
## `SourceSHU Spectrum`                                                                                
## `SourceSierra Leone Telegraph`                                                                      
## `SourceSify News`                                                                                   
## `SourceSilicon Valley Business Journal`                                                             
## `SourceSilicon Valley Business Journal (blog)`                                                      
## SourceSiliconANGLE                                                                               ***
## `SourceSiliconANGLE (blog)`                                                                         
## SourceSiliconBeat                                                                                   
## SourceSiliconera                                                                                    
## SourceSiliconIndia                                                                                  
## SourceSiliconindia.com                                                                              
## SourceSiliconrepublic.com                                                                           
## SourceSILive.com                                                                                    
## `SourceSilver City Sun-News`                                                                        
## SourceSimcoe.com                                                                                    
## `SourceSin Chew Jit Poh`                                                                            
## `SourceSingapore Business Review`                                                                   
## `SourceSingapore Business Review via Yahoo! Finance`                                                
## `SourceSingapore Government Online (press release)`                                                 
## `SourceSioux City Journal`                                                                          
## `SourceSioux Falls Argus Leader`                                                                    
## `SourceSiouxland Matters`                                                                           
## `SourceSiskiyou Daily News`                                                                         
## `SourceSITE Intelligence Group (subscription)`                                                      
## SourceSitePoint                                                                                     
## SourceSkift                                                                                         
## `SourceSky News`                                                                                    
## `SourceSky News Australia`                                                                          
## `SourceSky News via Yahoo Canada News`                                                              
## `SourceSky News via Yahoo UK & Ireland Finance`                                                     
## `SourceSky News via Yahoo UK & Ireland News`                                                        
## SourceSkySports                                                                                     
## `SourceSLAM Online`                                                                                 
## SourceSlashdot                                                                                      
## SourceSlashGear                                                                                     
## `SourceSlate Magazine`                                                                              
## `SourceSlate Magazine (blog)`                                                                       
## SourceSlate.fr                                                                                      
## `SourceSleepy Eye Herald Dispatch`                                                                  
## `SourceSlipped Disc`                                                                                
## `SourceSlugger O'Toole`                                                                             
## `SourceSmall Business Computing`                                                                    
## `SourceSmall Business Times`                                                                        
## `SourceSmall Business Trends`                                                                       
## SourceSmallBusiness.co.uk                                                                           
## `Sourcesmallwarsjournal (blog)`                                                                     
## SourceSmartCompany.com.au                                                                           
## `SourceSmarter Analyst`                                                                             
## `SourceSME Insider`                                                                                 
## SourceSmithsonian                                                                                   
## `SourceSNAPPA Celebrity via Yahoo UK & Ireland News`                                                
## `SourceSNAPPA Technology via Yahoo UK & Ireland News`                                               
## Sourcesnopes.com                                                                                    
## `SourceSocial Europe`                                                                               
## `SourceSocialist Alternative`                                                                       
## `SourceSocialist Project`                                                                           
## `SourceSocialist Worker`                                                                            
## `SourceSocialist Worker Online`                                                                     
## SourceSocialTimes                                                                                   
## `SourceSoftonic EN (blog)`                                                                          
## `SourceSoftpedia News`                                                                              
## `SourceSoftpedia News (blog)`                                                                       
## SourceSOHH                                                                                          
## SourceSojourners                                                                                    
## `SourceSolomon Star`                                                                                
## `SourceSonoma State Star`                                                                           
## `SourceSonoran Weekly Review`                                                                       
## SourceSooToday.com                                                                                  
## `SourceSOS Children`                                                                                
## `SourceSounder At Heart`                                                                            
## SourceSoundersFC.com                                                                                
## Sourcesourcingfocus.com                                                                             
## `SourceSouth Africa.info`                                                                           
## `SourceSouth African Broadcasting Corporation`                                                      
## `SourceSouth Bend Tribune`                                                                          
## `SourceSouth Carolina SC (press release) (blog)`                                                    
## `SourceSouth China Morning Post`                                                                    
## `SourceSouth China Morning Post (registration)`                                                     
## `SourceSouth China Morning Post (subscription)`                                                     
## `SourceSouth Florida Business Journal`                                                              
## `SourceSouth Leeds Life`                                                                            
## `SourceSouth Wales Argus`                                                                           
## `SourceSouth Wales Evening Post`                                                                    
## SourceSouthCoastToday.com                                                                           
## `SourceSoutheast Asia GLOBE`                                                                        
## `SourceSoutheast Missourian`                                                                        
## `SourceSoutheast Texas Record`                                                                      
## `SourceSouthern Political Report`                                                                   
## SourceSouthernminn.com                                                                              
## SourceSouthtownStar                                                                                 
## `SourceSouthwest Times`                                                                             
## `SourceSowetan Live (press release) (registration) (blog)`                                          
## `SourceSpace Daily`                                                                                 
## `SourceSpace War`                                                                                   
## SourceSpace.com                                                                                     
## SourceSpaceDaily                                                                                    
## SourceSpaceNews                                                                                     
## SourceSpaceRef                                                                                      
## `SourceSpalding Guardian`                                                                           
## `SourceSPAMfighter News (press release)`                                                            
## `SourceSpartanburg Herald-Journal`                                                                  
## SourceSpectator.co.uk                                                                               
## `SourceSpectator.co.uk (blog)`                                                                      
## `SourceSpend Matters`                                                                               
## SourceSpiked                                                                                        
## SourceSpin                                                                                          
## `SourceSplice Today`                                                                                
## SourceSport24                                                                                       
## `SourceSporting Life`                                                                               
## `SourceSporting News`                                                                               
## `SourceSporting News via Yahoo UK & Ireland Sport`                                                  
## `SourceSporting News via Yahoo! Sports`                                                             
## SourceSportingNews                                                                                  
## SourceSportingNews.com                                                                              
## `SourceSports Illustrated`                                                                          
## `SourceSportsBusiness Daily (subscription)`                                                         
## SourceSportsGrid                                                                                    
## SourceSportskeeda                                                                                   
## `SourceSportskeeda via Yahoo! India News`                                                           
## SourceSportsnet.ca                                                                                  
## SourceSportTechie                                                                                   
## `SourceSpringfield News-Leader`                                                                     
## `SourceSputnik France`                                                                              
## `SourceSputnik International`                                                                       
## `SourceSputnik UK`                                                                                  
## `SourceSputnik US`                                                                                  
## `SourceSQL Server Pro (blog)`                                                                       
## `SourceSri Lanka Guardian`                                                                          
## `SourceSt, Thomas Source`                                                                           
## `SourceSt. Albert Gazette`                                                                          
## `SourceSt. Augustine Record`                                                                        
## `SourceSt. Catharines Standard`                                                                     
## `SourceSt. Cloud Times`                                                                             
## `SourceSt. George Daily Spectrum`                                                                   
## `SourceSt. Joseph News-Press`                                                                       
## `SourceSt. Louis Business Journal`                                                                  
## `SourceSt. Louis Business Journal (blog)`                                                           
## `SourceSt. Louis Jewish Light`                                                                      
## `SourceSt. Lucia News Online`                                                                       
## `SourceSt. Lucia Times Online News (press release)`                                                 
## `SourceSt. Petersburg Times Blogs`                                                                  
## `SourceSt. Thomas Times-Journal`                                                                    
## `SourceSTA - Slovenska Tiskovna Agencija (subscription)`                                            
## `SourceStabroek News`                                                                               
## `SourceStaff Newsletter`                                                                            
## `SourceStaffing Industry Analysts`                                                                  
## `SourceStamford Advocate`                                                                           
## `SourceStanford Social Innovation Review (subscription)`                                            
## `SourceStanford University News`                                                                    
## `SourceStanly News & Press`                                                                         
## SourceStar2.com                                                                                     
## SourceStarAfrica.com                                                                                
## SourceStarpulse.com                                                                                 
## `SourceStarr 103.5 FM`                                                                              
## `SourceStars and Stripes`                                                                           
## SourceStartups.co.uk                                                                                
## SourceStartupSmart                                                                                  
## SourceSTAT                                                                                          
## `SourceState-Journal.com`                                                                           
## `SourceState Journal`                                                                               
## `SourceState of the State KS (subscription)`                                                        
## `SourceStateImpact Oklahoma`                                                                        
## `SourceStatesman Journal`                                                                           
## `SourceSteelers Lounge (blog)`                                                                      
## SourceStepFeed                                                                                      
## SourceStevenspointjournal                                                                           
## SourceStevivor                                                                                      
## `SourceStillwater News Press`                                                                       
## `Sourcestiripesurse.ro (Comunicat de Pres\\u009d\\u009d)`                                           
## Sourcestjoechannel.com                                                                              
## SourceSTLtoday.com                                                                                  
## `SourceStock & Land`                                                                                
## `SourceStock Transcript`                                                                            
## `SourceStock World`                                                                                 
## SourceStockhouse                                                                                    
## `SourceStockton Record (blog)`                                                                      
## SourceStorypick                                                                                     
## SourceStraight.com                                                                                  
## `SourceStraight.com (blog)`                                                                         
## `SourceStrategy Page`                                                                               
## `Sourcestrategy+business (registration) (blog)`                                                     
## SourceSTRATFOR                                                                                      
## SourceStreamingMedia.com                                                                            
## `SourceStreet Updates`                                                                              
## `SourceStreetAuthority Network via Yahoo! Finance`                                                  
## SourceStreetInsider.com                                                                             
## `SourceStreetInsider.com (blog)`                                                                    
## `SourceStreetsblog New York (blog)`                                                                 
## `SourceStreetWise Report`                                                                           
## `SourceStreetWise Report (press release)`                                                           
## SourceStuff                                                                                         
## SourceStuff.co.nz                                                                                   
## `SourceSturgis Journal`                                                                             
## `SourceSTV News`                                                                                    
## Sourcestv.tv                                                                                        
## `SourceStyle News - StyleWatch - People.com`                                                        
## `SourceSud Ouest`                                                                                   
## `SourceSudan Tribune`                                                                               
## SourceSudbury.com                                                                                   
## `SourceSun-Sentinel`                                                                                
## `SourceSun Sentinel`                                                                                
## `SourceSun Times National`                                                                          
## SourceSun.Star                                                                                      
## `SourceSunbury Daily Item`                                                                          
## `SourceSunday Business Post`                                                                        
## `SourceSunday Leader`                                                                               
## `SourceSunday Observer`                                                                             
## `SourceSunday World`                                                                                
## `SourceSunderland Echo`                                                                             
## SourceSunLive                                                                                       
## `SourceSunshine State News`                                                                         
## `SourceSupermarket News`                                                                            
## `SourceSuperSite for Windows`                                                                       
## `SourceSupply Chain Management Review`                                                              
## SourceSurferToday                                                                                   
## `SourceSustainable Brands`                                                                          
## `SourceSutherland Northern Times`                                                                   
## SourceSwampland                                                                                     
## SourceSwarajya                                                                                      
## `SourceSwarthmore College The Phoenix Online`                                                       
## Sourceswissinfo.ch                                                                                  
## `SourceSwitzer Financial News`                                                                      
## `SourceSydney Morning Herald`                                                                       
## `SourceSyracuse University News`                                                                    
## SourceSyracuse.com                                                                                  
## `SourceSyria Deeply`                                                                                
## `Sourcet-online.de`                                                                                 
## `SourceT.H.E. Journal`                                                                              
## SourceT3                                                                                            
## `SourceTablet Magazine`                                                                             
## `SourceTablet PC Review`                                                                            
## `SourceTaipei Times`                                                                                
## `SourceTaiwan Today`                                                                                
## SourceTakePart                                                                                      
## `SourceTakePart.com via Yahoo! News`                                                                
## `SourceTalkin' Cloud`                                                                               
## SourceTallahassee.com                                                                               
## SourceTameBay                                                                                       
## `SourceTampa Bay Business Journal`                                                                  
## `SourceTampa Bay Review`                                                                            
## `SourceTampa Bay Times`                                                                             
## SourceTampabay.com                                                                                  
## `SourceTampabay.com (blog)`                                                                         
## `SourceTaranaki Daily News`                                                                         
## `SourceTasmania Examiner`                                                                           
## `SourceTasnim News Agency (press release)`                                                          
## SourceTASS                                                                                          
## `SourceTax-News.com`                                                                                
## SourceTBO.com                                                                                       
## SourceTCC                                                                                           
## SourceTCPalm                                                                                        
## SourceTDM.com                                                                                       
## `SourceTeague Chronicle`                                                                            
## `SourceTech Cocktail`                                                                               
## `SourceTech in Asia`                                                                                
## `SourceTech Insider`                                                                                
## `SourceTech Insider (blog)`                                                                         
## `SourceTech Insider via Yahoo UK & Ireland News`                                                    
## `SourceTech Media Network (Laptop) via Yahoo! News`                                                 
## `SourceTech Media Network (Tom&#39;s Guide) via Yahoo! News`                                        
## `SourceTech News Today`                                                                             
## `SourceTech Page One`                                                                               
## `SourceTech Pinas`                                                                                  
## `SourceTech Pro Research via Yahoo! News`                                                           
## `SourceTech Times`                                                                                  
## SourceTech.Co                                                                                       
## SourceTech2                                                                                         
## SourceTechCentral                                                                                   
## SourceTechcrunch                                                                                    
## SourceTechCrunch                                                                                    
## SourceTechdirt                                                                                      
## SourceTechEye                                                                                       
## SourceTechFrag                                                                                      
## SourceTechGadgetCentral                                                                             
## SourceTechHive                                                                                      
## `SourceTechJuice (press release) (blog)`                                                            
## SourceTechland                                                                                      
## SourceTechly                                                                                        
## `SourceTechnabob (blog)`                                                                            
## SourceTechNewsWorld                                                                                 
## SourceTechNewsWorld.com                                                                             
## SourceTechnical.ly                                                                                  
## `SourceTechnical.ly Brooklyn`                                                                       
## `SourceTechnical.ly Philly`                                                                         
## SourceTechnoBuffalo                                                                                 
## `SourceTechnology Personalized`                                                                     
## `SourceTechnology Review`                                                                           
## `SourceTechnology Zimbabwe`                                                                         
## `SourceTechpoint.ng (blog)`                                                                         
## SourceTechRadar                                                                                     
## `SourceTechradar India`                                                                             
## SourceTechRepublic                                                                                  
## `SourceTechRepublic (blog)`                                                                         
## `SourceTechRepublic via Yahoo! Finance`                                                             
## `SourceTechRepublic via Yahoo! News`                                                                
## SourceTechRez                                                                                       
## SourceTechRitual                                                                                    
## SourceTechSpot                                                                                      
## SourceTechTarget                                                                                    
## `SourceTechTarget (blog)`                                                                           
## `SourceTechvibes (blog)`                                                                            
## `SourceTechWeekEurope UK`                                                                           
## SourceTechwire.net                                                                                  
## SourceTechWorld                                                                                     
## SourceTechworm                                                                                      
## SourceTeenVogue.com                                                                                 
## `SourceTehran Times`                                                                                
## `SourceTelecom Asia`                                                                                
## `SourceTelecom Reseller (press release)`                                                            
## Sourcetelecomasia.net                                                                               
## `SourceTelecompaper (subscription)`                                                                 
## SourceTeleGeography                                                                                 
## `SourceTelegraph via Yahoo UK & Ireland Finance`                                                    
## SourceTelegraph.co.uk                                                                               
## `SourceTelegraphStandard.com (blog)`                                                                
## `SourceteleSUR English`                                                                             
## SourceTempo                                                                                         
## SourceTempo.co                                                                                      
## `SourceTen Eyewitness News`                                                                         
## `SourceTerre Haute Tribune Star`                                                                    
## `SourceTES News`                                                                                    
## `SourceTest Tube`                                                                                   
## `SourceTewkesbury ADMAG`                                                                            
## `SourceTexarkana Gazette`                                                                           
## `SourceTexas A&M The Battalion`                                                                     
## `SourceTexas Tribune`                                                                               
## `SourceTG Daily`                                                                                    
## `SourceThaiVisa News`                                                                               
## `SourceThanh Ni\\u009d\\u009dn`                                                                     
## `SourceThanh Nien Daily`                                                                            
## `SourceThe-review`                                                                                  
## `SourceThe `                                                                                        
## `SourceThe Abbotsford News`                                                                         
## `SourceThe Actuary`                                                                                 
## `SourceThe Adam Smith Institute (blog)`                                                             
## `SourceThe Advertiser`                                                                              
## `SourceThe Advocate`                                                                                
## `SourceThe Aero-News Network`                                                                       
## `SourceThe Africa Report`                                                                           
## `SourceThe Age`                                                                                     
## `SourceThe Albany Herald`                                                                           
## `SourceThe American Bazaar`                                                                         
## `SourceThe American Conservative`                                                                   
## `SourceThe American Genius`                                                                         
## `SourceThe American Lawyer`                                                                         
## `SourceThe American Prospect`                                                                       
## `SourceThe Ames Tribune`                                                                            
## `SourceThe Arab Daily News`                                                                         
## `SourceThe Architect's Newspaper`                                                                   
## `SourceThe Arctic Journal`                                                                          
## `SourceThe Argentina Independent`                                                                   
## `SourceThe Argus-Press`                                                                             
## `SourceThe Art Newspaper`                                                                           
## `SourceThe Art of Gears`                                                                            
## `SourceThe Asia Foundation - In Asia`                                                               
## `SourceThe Asia Sentinel`                                                                           
## `SourceThe Asian Age`                                                                               
## `SourceThe Associated Press via Yahoo Canada Sports`                                                
## `SourceThe Associated Press via Yahoo! Sports`                                                      
## `SourceThe Atlantic`                                                                                
## `SourceThe Atlantic via Yahoo Canada News`                                                          
## `SourceThe Atlantic via Yahoo UK & Ireland News`                                                    
## `SourceThe Atlantic via Yahoo! News`                                                                
## `SourceThe Augusta Chronicle`                                                                       
## `SourceThe Australian`                                                                              
## `SourceThe Australian (blog)`                                                                       
## `SourceThe Australian (subscription)`                                                               
## `SourceThe Australian (subscription) (blog)`                                                        
## `SourceThe Australian Financial Review`                                                             
## `SourceThe Auto Channel`                                                                            
## `SourceThe Bakersfield Californian`                                                                 
## `SourceThe Baltic Course`                                                                           
## `SourceThe Barrie Examiner`                                                                         
## `SourceThe Beacon`                                                                                  
## `SourceThe Bellingham Herald`                                                                       
## `SourceThe Big Lead`                                                                                
## `SourceThe Biloxi Sun Herald`                                                                       
## `SourceThe Bitbag`                                                                                  
## `SourceThe Boar`                                                                                    
## `SourceThe Bolton News`                                                                             
## `SourceThe Bookseller`                                                                              
## `SourceThe Bookseller (blog)`                                                                       
## `SourceThe Border Mail`                                                                             
## `SourceThe Borneo Post`                                                                             
## `SourceThe Boston Globe`                                                                            
## `SourceThe Bottom Line`                                                                             
## `SourceThe Bournemouth Daily Echo`                                                                  
## `SourceThe Bozeman Daily Chronicle`                                                                 
## `SourceThe Bradford Era`                                                                            
## `SourceThe Brantford Expositor`                                                                     
## `SourceThe BRICS Post`                                                                              
## `SourceThe Brown Daily Herald`                                                                      
## `SourceThe Brussels Times`                                                                          
## `SourceThe Bubble`                                                                                  
## `SourceThe Buffalo News`                                                                            
## `SourceThe Bulletin`                                                                                
## `SourceThe Business of Fashion`                                                                     
## `SourceTHE BUSINESS TIMES`                                                                          
## `SourceThe Business Times Singapore`                                                                
## `SourceThe Cairo Review of Global Affairs (blog)`                                                   
## `SourceThe California Aggie`                                                                        
## `SourceThe Cambodia Daily`                                                                          
## `SourceThe Cameron Herald`                                                                          
## `SourceThe Canadian Press via Yahoo Canada Finance`                                                 
## `SourceThe Canadian Press via Yahoo Canada News`                                                    
## `SourceThe Canadian Press via Yahoo Canada Sports`                                                  
## `SourceThe Canberra Times`                                                                          
## `SourceThe Canton Repository`                                                                       
## `SourceThe Capital Journal`                                                                         
## `SourceThe Capitol Fax Blog (blog)`                                                                 
## `SourceThe Car Connection`                                                                          
## `SourceThe Cerbat Gem`                                                                              
## `SourceThe Charleston Gazette`                                                                      
## `SourceThe Charlotte Post`                                                                          
## `SourceThe Chattanoogan`                                                                            
## `SourceThe Cheat Sheet`                                                                             
## `SourceThe Cherokeean Herald`                                                                       
## `SourceThe Chicago Maroon`                                                                          
## `SourceThe Chicago Monitor`                                                                         
## `SourceThe Christian Post`                                                                          
## `SourceThe Christian Science Monitor`                                                               
## `SourceThe Christian Times`                                                                         
## `SourceThe Chronicle-Journal`                                                                       
## `SourceThe Chronicle-Telegram`                                                                      
## `SourceThe Chronicle Herald`                                                                        
## `SourceThe Chronicle Journal`                                                                       
## `SourceThe Citizen`                                                                                 
## `SourceThe Citizens&#39; Voice`                                                                     
## `SourceThe Climate Group`                                                                           
## `SourceThe Climate Group (blog)`                                                                    
## `SourceThe Coast`                                                                                   
## `SourceThe Coast Halifax`                                                                           
## `SourceThe Coldwater Daily Reporter`                                                                
## `SourceThe College Fix`                                                                             
## `SourceThe Colorado Independent`                                                                    
## `SourceThe Coloradoan`                                                                              
## `SourceThe Columbian`                                                                               
## `SourceThe Commercial Dispatch`                                                                     
## `SourceThe Compass`                                                                                 
## `SourceThe Concordian (subscription)`                                                               
## `SourceThe Connecticut College Voice`                                                               
## `SourceThe Connexion`                                                                               
## `SourceThe Conroe Courier`                                                                          
## `SourceThe Consumerist`                                                                             
## `SourceThe Conversation AU`                                                                         
## `SourceThe Conversation UK`                                                                         
## `SourceThe Conversation US`                                                                         
## `SourceThe Conversation via Yahoo!7 Finance`                                                        
## `SourceThe Copenhagen Post - Danish news in english`                                                
## `SourceThe Corner Economic`                                                                         
## `SourceThe Cornishman`                                                                              
## `SourceThe Courier`                                                                                 
## `SourceThe Courier-Journal`                                                                         
## `SourceThe Courier Life News`                                                                       
## `SourceThe Courier Mail`                                                                            
## `SourceThe CT Mirror`                                                                               
## `SourceThe Cubic Lane`                                                                              
## `SourceThe Daily Advertiser`                                                                        
## `SourceThe Daily Banter`                                                                            
## `SourceThe Daily Breeze`                                                                            
## `SourceThe Daily Buzz via Yahoo Canada News`                                                        
## `SourceThe Daily Collegian Online`                                                                  
## `SourceThe Daily Comet`                                                                             
## `SourceThe Daily Cougar`                                                                            
## `SourceThe Daily Courier`                                                                           
## `SourceThe Daily Dot`                                                                               
## `SourceThe Daily Free Press`                                                                        
## `SourceThe Daily Freeman`                                                                           
## `SourceThe Daily Gazette`                                                                           
## `SourceThe Daily Herald (press release)`                                                            
## `SourceThe Daily Mercury`                                                                           
## `SourceThe Daily Mining Gazette`                                                                    
## `SourceThe Daily News Journal`                                                                      
## `SourceThe Daily News of Newburyport`                                                               
## `SourceThe Daily Pennsylvanian`                                                                     
## `SourceThe Daily Progress`                                                                          
## `SourceThe Daily Reckoning`                                                                         
## `SourceThe Daily Record`                                                                            
## `SourceThe Daily Reflector`                                                                         
## `SourceThe Daily Star`                                                                              
## `SourceThe Daily Voice`                                                                             
## `SourceThe Daily Vox (blog)`                                                                        
## `SourceThe Daily World`                                                                             
## `SourceThe Day`                                                                                     
## `SourceThe Denver Channel`                                                                          
## `SourceThe Denver Post`                                                                             
## `SourceThe Denver Post (blog)`                                                                      
## `SourceThe Desert Sun`                                                                              
## `SourceThe Detroit News`                                                                            
## `SourceThe Diane Rehm Show`                                                                         
## `SourceThe Dickinson Press`                                                                         
## `SourceThe Diplomat`                                                                                
## `SourceThe Dismal Scientist (subscription)`                                                         
## `SourceThe Dominion Post`                                                                           
## `SourceThe Dorset Echo`                                                                             
## `SourceThe Drive`                                                                                   
## `SourceThe Drum`                                                                                    
## `SourceThe Durango Herald`                                                                          
## `SourceThe Eagle Online`                                                                            
## `SourceThe Echo`                                                                                    
## `SourceThe Ecologist`                                                                               
## `SourceThe Economic Times`                                                                          
## `SourceThe Economist`                                                                               
## `SourceThe Economist (blog)`                                                                        
## `SourceThe Edge`                                                                                    
## `SourceThe Edge Markets`                                                                            
## `SourceThe Edge Markets MY`                                                                         
## `SourceThe Electronic Intifada`                                                                     
## `SourceThe Electronic Intifada (blog)`                                                              
## `SourceThe Elkhart Truth`                                                                           
## `SourceThe Elkhart Truth (blog)`                                                                    
## `SourceThe Emory Wheel`                                                                             
## `SourceThe Epoch Times`                                                                             
## `SourceThe Escapist`                                                                                
## `SourceThe Evening Sun`                                                                             
## `SourceThe Examiner`                                                                                
## `SourceThe Exponent Telegram (press release) (registration)`                                        
## `SourceThe Express Tribune`                                                                         
## `SourceThe Express Tribune (blog)`                                                                  
## `SourceThe FADER`                                                                                   
## `SourceThe Fayetteville Observer`                                                                   
## `SourceThe Federalist`                                                                              
## `SourceThe FINANCIAL`                                                                               
## `SourceThe Financial Express via Yahoo! Finance India`                                              
## `SourceThe Fiscal Times`                                                                            
## `SourceThe Fiscal Times via Yahoo UK & Ireland Finance`                                             
## `SourceThe Fiscal Times via Yahoo! Finance`                                                         
## `SourceThe Fiscal Times via Yahoo! New Zealand Finance`                                             
## `SourceThe Fiscal Times via Yahoo! News`                                                            
## `SourceThe Fiscal Times via Yahoo!7 Finance`                                                        
## `SourceThe Flagship`                                                                                
## `SourceThe Flamborough Review (press release) (registration)`                                       
## `SourceThe Flinders News`                                                                           
## `SourceThe Fort Campbell Courier`                                                                   
## `SourceThe Forward`                                                                                 
## `SourceThe Fresno Bee`                                                                              
## `SourceThe Gadgeteer`                                                                               
## `SourceThe Gadsden Times`                                                                           
## `SourceThe Gainesville Times`                                                                       
## `SourceThe Garden City Telegram`                                                                    
## `SourceThe GATE`                                                                                    
## `SourceThe Gateway Online`                                                                          
## `SourceThe Gazette`                                                                                 
## `SourceThe Gazette  Western University's Student Newspaper`                                         
## `SourceThe Gazette: Eastern Iowa Breaking News and Headlines`                                       
## `SourceThe Gilmer Mirror`                                                                           
## `SourceThe Gleaner`                                                                                 
## `SourceThe Global Herald`                                                                           
## `SourceThe Globalist`                                                                               
## `SourceThe Globe and Mail`                                                                          
## `SourceThe Globe and Mail (subscription)`                                                           
## `SourceThe Grio`                                                                                    
## `SourceThe Guardian`                                                                                
## `SourceThe Guardian (Australia)`                                                                    
## `SourceThe Guardian (blog)`                                                                         
## `SourceThe Guardian Charlottetown`                                                                  
## `SourceThe Guardian Nigeria (satire) (press release) (blog)`                                        
## `SourceThe Guru Investor`                                                                           
## `SourceThe Hacked News`                                                                             
## `SourceThe Hamilton Journal News`                                                                   
## `SourceThe Hankyoreh`                                                                               
## `SourceThe Hans India`                                                                              
## `SourceThe Harvard Crimson`                                                                         
## `SourceThe Hazleton Standard-Speaker`                                                               
## `SourceThe Heartland Institute`                                                                     
## `SourceThe Hechinger Report`                                                                        
## `SourceThe Heights`                                                                                 
## `SourceThe Henderson Daily News`                                                                    
## `SourceThe Hendersonville Times-News`                                                               
## `SourceThe Herald`                                                                                  
## `SourceThe Herald-News`                                                                             
## `SourceThe Herald-Times (subscription)`                                                             
## `SourceThe Herald Bulletin`                                                                         
## `SourceThe Herald News`                                                                             
## `SourceThe Hereford Times`                                                                          
## `SourceThe Hill`                                                                                    
## `SourceThe Hill (blog)`                                                                             
## `SourceThe Hillsdale Daily News`                                                                    
## `SourceThe Hilltop News`                                                                            
## `SourceThe Hindu`                                                                                   
## `SourceThe Hollywood Reporter`                                                                      
## `SourceThe Hollywood Reporter via Yahoo! News`                                                      
## `SourceThe Hollywood Source`                                                                        
## `SourceThe Holmes Report`                                                                           
## `SourceThe Houma Courier`                                                                           
## `SourceThe Hub at Johns Hopkins`                                                                    
## `SourceThe Huffington Post`                                                                         
## `SourceThe Huffington Post UK`                                                                      
## `SourceThe Huntington News`                                                                         
## `SourceThe Independent`                                                                             
## `SourceThe Independent Florida Alligator`                                                           
## `SourceThe Indian Express`                                                                          
## `SourceThe Indian Express (blog)`                                                                   
## `SourceThe Indian Express via Yahoo! India News`                                                    
## `SourceThe Indian Panorama`                                                                         
## `SourceThe Indianapolis Star`                                                                       
## `SourceThe indy100`                                                                                 
## `SourceThe Inquirer`                                                                                
## `SourceThe Inquisitr`                                                                               
## `SourceThe Intelligencer / Wheeling News-Register`                                                  
## `SourceThe Intercept`                                                                               
## `SourceThe Interpreter`                                                                             
## `SourceThe Irish Catholic`                                                                          
## `Sourcethe Irish News`                                                                              
## `SourceThe Irish Times`                                                                             
## `SourceThe Irrawaddy News Magazine`                                                                 
## `SourceThe Ithaca Voice`                                                                            
## `SourceThe Jacksonville Daily News`                                                                 
## `SourceThe Japan News`                                                                              
## `SourceThe Japan Times`                                                                             
## `SourceThe Jewish Journal of Greater Los Angeles`                                                   
## `SourceThe Jewish Press`                                                                            
## `SourceThe Jewish Press (blog)`                                                                     
## `SourceThe Jewish Standard`                                                                         
## `SourceThe Jewish Star`                                                                             
## `SourceThe Jewish Voice`                                                                            
## `SourceThe Jewish Week`                                                                             
## `SourceThe Journal`                                                                                 
## `SourceThe Journal News | LoHud.com`                                                                
## `SourceThe Justice`                                                                                 
## `SourceThe Kansas City Star`                                                                        
## `SourceThe Keene Sentinel`                                                                          
## `SourceThe Killeen Daily Herald`                                                                    
## `SourceThe Kingston Whig-Standard`                                                                  
## `SourceThe Korea Herald`                                                                            
## `SourceThe Korea Observer`                                                                          
## `SourceThe Lakeland Ledger`                                                                         
## `SourceThe Lawton Constitution`                                                                     
## `SourceThe Lawyer`                                                                                  
## `SourceThe Lawyer (registration)`                                                                   
## `SourceThe Ledger`                                                                                  
## `SourceThe Lens`                                                                                    
## `SourceThe Libertarian Republic`                                                                    
## `SourceThe Link`                                                                                    
## `SourceThe Local`                                                                                   
## `SourceThe Local Denmark`                                                                           
## `SourceThe Local.ch`                                                                                
## `SourceThe Local.de`                                                                                
## `SourceThe Local.es`                                                                                
## `SourceThe Local.fr`                                                                                
## `SourceThe Local.it`                                                                                
## `SourceThe Local.se`                                                                                
## `SourceThe London News Review`                                                                      
## `SourceThe Longview News-Journal`                                                                   
## `SourceThe Louisville Cardinal`                                                                     
## `SourceThe Mac Observer`                                                                            
## `SourceThe Maitland Mercury`                                                                        
## `SourceThe Malay Mail Online via Yahoo! Singapore News`                                             
## `SourceThe Malaysian Insider`                                                                       
## `SourceThe Malaysian Insider via Yahoo! Singapore News`                                             
## `SourceThe Mancunion`                                                                               
## `SourceThe Manila Times`                                                                            
## `SourceThe Marijuana Times`                                                                         
## `SourceThe Market Mogul`                                                                            
## `SourceThe Market Oracle`                                                                           
## `SourceThe Marshalltown`                                                                            
## `SourceThe Mary Sue`                                                                                
## `SourceThe Mass Media`                                                                              
## `SourceThe Massachusetts Daily Collegian`                                                           
## `SourceThe McDowell News`                                                                           
## `SourceThe McGill International Review`                                                             
## `SourceThe Mckeesport Daily News`                                                                   
## `SourceThe Media Line`                                                                              
## `SourceThe Medina County Gazette`                                                                   
## `SourceThe Memo`                                                                                    
## `SourceThe Memphis Daily News`                                                                      
## `SourceThe Mercury`                                                                                 
## `SourceThe Mercury News`                                                                            
## `SourceThe Merkle (blog)`                                                                           
## `SourceThe MetroWest Daily News`                                                                    
## `SourceThe Michigan Daily`                                                                          
## `SourceThe Milpitas Post`                                                                           
## `SourceThe Minnesota Daily`                                                                         
## `SourceThe Mission City Record`                                                                     
## `SourceThe Missoulian`                                                                              
## `SourceThe MIT Tech`                                                                                
## `SourceThe Moderate Voice`                                                                          
## `SourceThe Moose Jaw Times Herald`                                                                  
## `SourceThe Morganton News Herald`                                                                   
## `SourceThe Morning Call`                                                                            
## `SourceThe Moscow Times`                                                                            
## `SourceThe Moscow Times (registration)`                                                             
## `SourceThe Motley Fool`                                                                             
## `SourceThe Motley Fool Canada`                                                                      
## `SourceThe Muslim News`                                                                             
## `SourceThe Narco News Bulletin`                                                                     
## `SourceThe Nashua Telegraph`                                                                        
## `SourceThe Nation`                                                                                  
## `SourceThe Nation - Thailand&#39;s English news`                                                    
## `SourceThe Nation (blog)`                                                                           
## `SourceThe Nation Newspaper`                                                                        
## `SourceThe Nation.`                                                                                 
## `SourceThe Nation. (blog)`                                                                          
## `SourceThe National`                                                                                
## `SourceThe National Business Review`                                                                
## `SourceThe National Enquirer`                                                                       
## `SourceThe National Interest Online`                                                                
## `SourceThe National Interest Online (blog)`                                                         
## `SourceThe National Law Review`                                                                     
## `SourceThe National Memo (blog)`                                                                    
## `SourceThe Native American Times`                                                                   
## `SourceThe Nelson Mail`                                                                             
## `SourceThe Neosho Daily News`                                                                       
## `SourceThe New American`                                                                            
## `SourceThe New Canaan News`                                                                         
## `SourceThe New Civil Rights Movement`                                                               
## `SourceThe New Daily`                                                                               
## `SourceThe New Indian Express`                                                                      
## `SourceThe New Mexico Daily Lobo`                                                                   
## `SourceThe New Orleans Advocate`                                                                    
## `SourceThe New School News (blog)`                                                                  
## `SourceThe New Statesman`                                                                           
## `SourceThe New Times`                                                                               
## `SourceThe New York Observer`                                                                       
## `SourceThe New York Review of Books`                                                                
## `SourceThe New Yorker`                                                                              
## `SourceThe New Yorker (satire)`                                                                     
## `SourceThe New Zealand Herald`                                                                      
## `SourceThe News`                                                                                    
## `SourceThe News-Press`                                                                              
## `SourceThe News-Times`                                                                              
## `SourceThe News & Observer`                                                                         
## `SourceThe News Center`                                                                             
## `SourceThe News Herald`                                                                             
## `SourceThe News Hub`                                                                                
## `SourceThe News International`                                                                      
## `SourceThe News Journal`                                                                            
## `SourceThe News Minute`                                                                             
## `SourceThe News Tribune`                                                                            
## `SourceThe News Tribune (blog)`                                                                     
## `SourceThe Next Digit`                                                                              
## `SourceThe Next Silicon Valley`                                                                     
## `SourceThe Next Web`                                                                                
## `SourceThe Nonprofit Quarterly (blog)`                                                              
## `SourceThe Nordic Page`                                                                             
## `SourceThe North Bay Nugget`                                                                        
## `SourceThe Northern Echo (registration)`                                                            
## `SourceThe Northwest Florida Daily News`                                                            
## `SourceThe Oakland Press`                                                                           
## `SourceThe Oberlin Review`                                                                          
## `SourceThe Observer-Dispatch`                                                                       
## `SourceThe Oceanside Post`                                                                          
## `SourceThe Oklahoma Daily`                                                                          
## `SourceThe Olympian`                                                                                
## `SourceThe Onion (satire)`                                                                          
## `SourceThe Orator`                                                                                  
## `SourceThe Oshkosh Northwestern`                                                                    
## `SourceThe Ottawa Times`                                                                            
## `SourceThe Oxford Times`                                                                            
## `SourceThe Palm Beach Post`                                                                         
## `SourceThe Panther`                                                                                 
## `SourceThe Pappas Post`                                                                             
## `SourceThe Pasadena Star-News`                                                                      
## `SourceThe Peak`                                                                                    
## `SourceThe People's Voice`                                                                          
## `SourceThe Philadelphia Inquirer`                                                                   
## `SourceThe Players Tribune`                                                                         
## `SourceThe Point Review`                                                                            
## `SourceThe Portugal News`                                                                           
## `SourceThe Post`                                                                                    
## `SourceThe Post and Courier`                                                                        
## `SourceThe Predictive Analytics Times`                                                              
## `SourceThe Press`                                                                                   
## `SourceThe Press-Enterprise`                                                                        
## `SourceThe Prince Albert Daily Herald`                                                              
## `SourceThe Progressive Pulse`                                                                       
## `SourceThe Providence Journal`                                                                      
## `SourceThe Province`                                                                                
## `SourceThe Province - BC - Victoria`                                                                
## `SourceThe Punch`                                                                                   
## `SourceThe Queensland Times`                                                                        
## `SourceThe Rancher`                                                                                 
## `SourceThe Randolph County Herald-Tribune`                                                          
## `SourceThe Real News Network`                                                                       
## `SourceThe Real News Network (blog)`                                                                
## `SourceThe Rebel`                                                                                   
## `SourceThe Record`                                                                                  
## `SourceThe Record (New Westminster)`                                                                
## `SourceThe Recorder`                                                                                
## `SourceThe Register`                                                                                
## `SourceThe Register-Guard`                                                                          
## `SourceThe Republic`                                                                                
## `SourceThe Review`                                                                                  
## `SourceThe Ridgefield Press`                                                                        
## `SourceThe Ringer (blog)`                                                                           
## `SourceThe Rio Times`                                                                               
## `SourceThe Robesonian`                                                                              
## `SourceThe Rock Hill Herald`                                                                        
## `SourceThe Root`                                                                                    
## `SourceThe Root (blog)`                                                                             
## `SourceThe Rude Baguette`                                                                           
## `SourceThe Rushville Republican`                                                                    
## `SourceThe Russellville Courier`                                                                    
## `SourceThe Sacramento Bee`                                                                          
## `SourceThe Salem News`                                                                              
## `SourceThe Salinas Californian`                                                                     
## `SourceThe Salt Lake Tribune`                                                                       
## `SourceThe San Diego Union-Tribune`                                                                 
## `SourceThe San Gabriel Valley Tribune`                                                              
## `SourceThe San Luis Obispo Tribune`                                                                 
## `SourceThe Sarasota Herald-Tribune`                                                                 
## `SourceThe Saratogian`                                                                              
## `SourceThe Scotsman`                                                                                
## `SourceThe Scranton Times-Tribune`                                                                  
## `SourceThe Seattle Times`                                                                           
## `SourceThe Sheboygan Press`                                                                         
## `SourceThe Shillong Times`                                                                          
## `SourceThe Siasat Daily`                                                                            
## `SourceThe Simcoe Reformer`                                                                         
## `SourceThe Siver Times`                                                                             
## `SourceThe Skanner`                                                                                 
## `SourceThe Slovak Spectator`                                                                        
## `SourceThe Sofia Globe`                                                                             
## `SourceThe Source`                                                                                  
## `SourceThe Southern`                                                                                
## `SourceThe Southland Times`                                                                         
## `SourceThe Spinoff`                                                                                 
## `SourceThe Spokesman-Review`                                                                        
## `SourceThe Spokesman Review (registration)`                                                         
## `SourceThe Stack`                                                                                   
## `SourceThe Standard`                                                                                
## `SourceThe Standard Digital News (press release) (blog)`                                            
## `SourceThe Standard Digital News (satire) (press release) (registration) (blog)`                    
## `Sourcethe star`                                                                                    
## `SourceThe Star`                                                                                    
## `SourceThe Star-Ledger`                                                                             
## `SourceThe Star Online`                                                                             
## `SourceThe Star, Kenya`                                                                             
## `SourceThe State`                                                                                   
## `SourceThe State (blog)`                                                                            
## `SourceThe State Journal-Register`                                                                  
## `SourceThe State News`                                                                              
## `SourceThe Statesman`                                                                               
## `SourceThe Straits Times`                                                                           
## `SourceThe Sudbury Star`                                                                            
## `SourceThe Sun`                                                                                     
## `SourceThe Sun Daily`                                                                               
## `SourceThe Sun Herald`                                                                              
## `SourceThe Sunday Business Post`                                                                    
## `SourceThe Sunday Post`                                                                             
## `SourceThe Sunday Times`                                                                            
## `SourceThe Sunday Times Sri Lanka`                                                                  
## `SourceThe Sunshine Coast Daily`                                                                    
## `SourceThe Swedish Wire`                                                                            
## `SourceThe Sydney Morning Herald`                                                                   
## `SourceThe Tablet`                                                                                  
## `SourceThe Takeaway (blog)`                                                                         
## `SourceThe Tampa  Tribune`                                                                          
## `SourceThe Tand D.com`                                                                              
## `SourceThe Tech Portal`                                                                             
## `SourceThe Tech Report, LLC`                                                                        
## `SourceThe Tech Report, LLC (blog)`                                                                 
## `SourceThe TechNews`                                                                                
## `SourceThe Telegram`                                                                                
## `SourceThe Telegraph`                                                                               
## `SourceThe Temple News`                                                                             
## `SourceThe Tennessean`                                                                              
## `SourceThe Tico Times`                                                                              
## `SourceThe Tidings`                                                                                 
## `SourceThe Times (subscription)`                                                                    
## `SourceThe Times and Democrat`                                                                      
## `SourceThe Times of India`                                                                          
## `SourceThe Times of Isra\\u009d\\u009dl`                                                            
## `SourceThe Times of Israel`                                                                         
## `SourceThe Times of Israël`                                                                         
## `SourceThe Times of Israel (blog)`                                                                  
## `SourceThe Toledo Blade`                                                                            
## `SourceThe Trace`                                                                                   
## `SourceThe Tribune`                                                                                 
## `SourceThe Trinidad Guardian`                                                                       
## `SourceThe Truro Daily News`                                                                        
## `SourceThe Tuscaloosa News`                                                                         
## `SourceThe Tyee`                                                                                    
## `SourceThe UCSD Guardian Online`                                                                    
## `SourceThe Ulster Herald`                                                                           
## `SourceThe Undefeated`                                                                              
## `SourceThe Union Leader`                                                                            
## `SourceThe Union of Grass Valley`                                                                   
## `SourceThe Uniontown Herald Standard`                                                               
## `SourceThe University of Hawaii Kaleo`                                                              
## `SourceThe Unofficial Apple Weblog`                                                                 
## `SourceThe VAR Guy`                                                                                 
## `SourceThe Verge`                                                                                   
## `SourceThe Verge via Yahoo Canada News`                                                             
## `SourceThe Verge via Yahoo! News`                                                                   
## `SourceThe Vermilion`                                                                               
## `SourceThe Vermont Standard`                                                                        
## `SourceThe Victoria Advocate`                                                                       
## `SourceThe Vista Voice`                                                                             
## `SourceThe Voice Herald (blog)`                                                                     
## `SourceThe Voice Observer (blog)`                                                                   
## `SourceThe Voice of Millions`                                                                       
## `SourceThe Wahpeton Daily News`                                                                     
## `SourceThe Wall Street Journal`                                                                  ***
## `SourceThe Wall Street Journal via Yahoo Canada Finance`                                            
## `SourceThe Wall Street Journal via Yahoo UK & Ireland Finance`                                      
## `SourceThe Wall Street Journal via Yahoo! Finance`                                                  
## `SourceThe Wall Street Journal via Yahoo! Finance India`                                            
## `SourceThe Wall Street Journal via Yahoo! New Zealand Finance`                                      
## `SourceThe Wall Street Journal via Yahoo! News`                                                     
## `SourceThe Wall Street Journal via Yahoo!7 Finance`                                                 
## `SourceThe Washington Times`                                                                        
## `SourceThe Wayne Independent`                                                                       
## `SourceThe Weather Channel`                                                                         
## `SourceThe Weather Network`                                                                         
## `SourceThe Weed Blog (blog)`                                                                        
## `SourceThe Week Magazine`                                                                           
## `SourceThe Week UK`                                                                                 
## `SourceThe Weekly Standard`                                                                         
## `SourceThe Weekly Standard (blog)`                                                                  
## `SourceThe Wesleyan Argus`                                                                          
## `SourceThe West Australian`                                                                         
## `SourceThe West Australian via Yahoo!7 News`                                                        
## `SourceThe Westerly Sun`                                                                            
## `SourceThe Whistler`                                                                                
## `SourceThe White House`                                                                             
## `SourceThe White House (blog)`                                                                      
## `SourceThe Wire`                                                                                    
## `SourceThe Worldfolio`                                                                              
## `SourceThe Wrap via Yahoo Celebrity`                                                                
## `SourceThe Youngstown Vindicator`                                                                   
## `SourceThe Yucatan Times`                                                                           
## `SourceThe Zimbabwe Standard`                                                                       
## `SourceThe Zimbabwean`                                                                              
## SourceTheBlaze.com                                                                                  
## SourceTheCable                                                                                      
## SourceTheChronicleHerald.ca                                                                         
## SourceTheCork.ie                                                                                    
## SourceThefairfieldrecorder                                                                          
## SourceThegardenisland.com                                                                           
## SourceTheHorse.com                                                                                  
## `SourceTheHostingNews.com (press release) (blog)`                                                   
## SourceThehour.com                                                                                   
## Sourcetheifp.ca                                                                                     
## Sourcethejournal.ie                                                                                 
## `SourceTheJournal.ie via Yahoo UK & Ireland Finance`                                                
## `SourceTheJournal.ie via Yahoo UK & Ireland News`                                                   
## SourceThelakeandeswave                                                                              
## Sourcethenews.pl                                                                                    
## SourceTheParliamentMagazine.eu                                                                      
## SourceThePoultrySite.com                                                                            
## Sourcethepridela.com                                                                                
## SourceTheSouthAfrican                                                                               
## SourceTheSportsCampus.com                                                                           
## SourceTheStranger.com                                                                               
## `SourceTheStranger.com (blog)`                                                                      
## SourceTheStreet.com                                                                                 
## SourceTheTower.org                                                                                  
## SourcetheTrumpet.com                                                                                
## SourceTheTyee.ca                                                                                    
## SourceThevillagessuntimes                                                                           
## SourceTheWrap                                                                                       
## SourceThinkAdvisor                                                                                  
## SourceThinkProgress                                                                                 
## `SourceThird Sector`                                                                                
## `SourceThis is Bristol`                                                                             
## `SourceThis is Money`                                                                               
## `SourceThis Is Money`                                                                               
## `SourceThis is Oxfordshire`                                                                         
## `SourceTHISDAY Live`                                                                                
## `SourceThomas Reuters Fondation`                                                                    
## SourceThomasNet                                                                                  ***
## `SourceThomson Reuters Foundation`                                                                  
## `SourceThomson Reuters StreetEvents via Yahoo! Finance`                                             
## SourceThreatpost                                                                                    
## `SourceThurrott.com (blog)`                                                                         
## SourceTHV11.com                                                                                     
## `SourceTickerTV News (press release)`                                                               
## SourceTidBITS                                                                                       
## `SourceTimaru Herald`                                                                               
## SourceTIME                                                                                          
## `SourceTime Magazine`                                                                               
## `SourceTimes Colonist`                                                                              
## `SourceTimes Daily`                                                                                 
## `SourceTimes Higher Education (THE)`                                                                
## `SourceTimes Leader`                                                                                
## `SourceTimes LIVE`                                                                                  
## `SourceTimes News`                                                                                  
## `SourceTimes Now.tv`                                                                                
## `SourceTimes of India`                                                                              
## `SourceTimes of India (blog)`                                                                       
## `SourceTimes of Malta`                                                                              
## `SourceTimes of Malta (blog)`                                                                       
## `SourceTimes of Oman`                                                                               
## `SourceTimes Record`                                                                                
## `SourceTimes Record (subscription)`                                                                 
## `SourceTimes Record News`                                                                           
## SourceTimesonline.com                                                                               
## `SourceTimmins Press`                                                                               
## SourceTMZ.com                                                                                       
## SourceTnooz                                                                                         
## `SourceToday's Zaman`                                                                               
## `SourceToday in Bermuda`                                                                            
## SourceToday.com                                                                                     
## SourceTODAY.ng                                                                                      
## SourceTODAYonline                                                                                   
## `SourceToledo Blade`                                                                                
## `SourceToledo News Now`                                                                             
## `SourceTom's Guide`                                                                                 
## `SourceTom's Hardware`                                                                              
## `SourceToowoomba Chronicle`                                                                         
## `SourceTop Tech News`                                                                               
## `SourceTopeka Capital Journal`                                                                      
## `SourceTopsail Voice`                                                                               
## `SourceToronto Star`                                                                                
## `SourceToronto Sun`                                                                                 
## `SourceTorque News`                                                                                 
## SourceTorrentFreak                                                                                  
## `SourceTouch Arcade`                                                                                
## `SourceToward Freedom`                                                                              
## SourceTowleroad                                                                                     
## `SourceTown Hall`                                                                                   
## `SourceTownsville Bulletin`                                                                         
## SourceTPM                                                                                           
## `SourceTPM (blog)`                                                                                  
## `SourceTrade Arabia`                                                                                
## `SourceTrade Calls`                                                                                 
## `SourceTrades Union Congress`                                                                       
## SourceTradingFloor.com                                                                              
## `SourceTrak.in (blog)`                                                                              
## `SourceTransport Topics Online`                                                                     
## `SourceTravel Daily News International`                                                             
## `SourceTravel Weekly`                                                                               
## `SourceTravel+Leisure`                                                                              
## SourceTravelersToday                                                                                
## `SourceTravelGBI (press release) (blog)`                                                            
## SourceTraveller                                                                                     
## `SourceTraverse City Record Eagle`                                                                  
## SourceTravolution                                                                                   
## SourceTreehugger                                                                                    
## SourceTrefis                                                                                        
## `SourceTrend News Agency`                                                                           
## `SourceTri-City Herald`                                                                             
## `SourceTri County Leader`                                                                           
## `SourceTriad Business Journal (blog)`                                                               
## `SourceTriangle Business Journal`                                                                   
## `SourceTribune-Review`                                                                              
## SourceTrinicenter.com                                                                               
## `SourceTrinidad & Tobago Express`                                                                   
## `SourceTrinidad Guardian`                                                                           
## `SourceTriple Pundit (registration) (blog)`                                                         
## SourceTristatehomepage.com                                                                          
## `SourceTriValley Central`                                                                           
## `SourceTRT World`                                                                                   
## SourceTruckingInfo.com                                                                              
## SourceTrueAchievements                                                                              
## SourceTRUNEWS                                                                                       
## SourceTrustedReviews                                                                                
## `SourceTruth-Out`                                                                                   
## `SourceTruth In Media`                                                                              
## SourceTruthdig                                                                                      
## `SourceTSA - Tout Sur l'Alg\\u009d\\u009drie`                                                       
## `SourceTucson News Now`                                                                             
## `SourceTucson Weekly`                                                                               
## SourceTudocelular.com                                                                               
## `SourceTufts Daily`                                                                                 
## `SourceTulsa World`                                                                                 
## `SourceTunisia Live`                                                                                
## `SourceTuoitrenews (press release)`                                                                 
## `SourceTurkish Review`                                                                              
## `SourceTuscaloosa News (subscription)`                                                              
## `SourceTV Guide (blog)`                                                                             
## `SourceTV Newsroom`                                                                                 
## `SourceTV Technology`                                                                               
## SourceTVbytheNumbers                                                                                
## SourceTVLine                                                                                        
## SourceTVNewser                                                                                      
## SourceTVNZ                                                                                          
## SourceTVPredictions.com                                                                             
## `SourceTWC News`                                                                                    
## `SourceTWCN Tech News (blog)`                                                                       
## SourceTweakTown                                                                                     
## SourceTwice                                                                                         
## `SourceTwin Falls Times-News`                                                                       
## `SourceTwinCities.com-Pioneer Press`                                                                
## SourceTwinfinite                                                                                    
## `SourceTwitchFilm (blog)`                                                                           
## SourceTwitchy                                                                                       
## SourceTwoCircles.net                                                                                
## `SourceTyler Morning Telegraph`                                                                     
## `SourceU-T San Diego`                                                                               
## `SourceU of M News Service`                                                                         
## `SourceU.S. Department of Education (press release)`                                                
## `SourceU.S. Department of Education (press release) (blog)`                                         
## `SourceU.S. EPA.gov (press release)`                                                                
## `SourceU.S. News & World Report`                                                                    
## `SourceU.S. News & World Report (blog)`                                                             
## `SourceU.S.News & World Report via Yahoo! News`                                                     
## SourceU.TV                                                                                          
## SourceUbergizmo                                                                                     
## `SourceUC Davis`                                                                                    
## `SourceUC Los Angeles`                                                                              
## `SourceUC Merced University News`                                                                   
## `SourceUCalgary News`                                                                               
## `SourceUChicago News`                                                                               
## `SourceUD Daily`                                                                                    
## `SourceUGA Today`                                                                                   
## `SourceUK Fundraising`                                                                              
## `SourceUKNow (press release)`                                                                       
## `SourceUkraine Today`                                                                               
## `SourceUloop News`                                                                                  
## `SourceUltimate-Guitar.Com`                                                                         
## Sourceummid.com                                                                                     
## `SourceUN Dispatch`                                                                                 
## `SourceUN News Centre`                                                                              
## `SourceUncover California`                                                                          
## SourceUNCTAD                                                                                        
## `SourceUND The Dakota Student`                                                                      
## `SourceUndercurrent News`                                                                           
## `SourceUnion of Concerned Scientists`                                                               
## `SourceUnionOracle.com (blog)`                                                                      
## `SourceUniontown Herald Standard`                                                                   
## `SourceUnited Nations`                                                                              
## `SourceUniverse Today`                                                                              
## `SourceUniversity Herald`                                                                           
## `SourceUniversity of Delaware`                                                                      
## `SourceUniversity of Delaware Review`                                                               
## `SourceUniversity of St. Thomas Newsroom`                                                           
## `SourceUniversity of Virginia`                                                                      
## `SourceUniversity of Virginia The Cavalier Daily`                                                   
## `SourceUniversity World News`                                                                       
## `SourceUNM Newsroom`                                                                                
## SourceUPI                                                                                           
## SourceUPI.com                                                                                       
## SourceUpperMichigansSource.com                                                                      
## SourceUPROXX                                                                                        
## `SourceUPROXX via Yahoo! News`                                                                      
## `SourceUPROXX via Yahoo! Sports`                                                                    
## SourceUpstart                                                                                       
## `SourceUpstate Business Journal`                                                                    
## `SourceUpstream Online`                                                                             
## SourceUpvoted                                                                                       
## SourceUpworthy                                                                                      
## `SourceUQ News`                                                                                     
## `SourceUrban Land`                                                                                  
## `SourceUrgent Communications`                                                                       
## `SourceUS 99.5`                                                                                     
## `SourceUS News & World Report`                                                                      
## `SourceUs Weekly`                                                                                   
## `SourceUS Weekly`                                                                                   
## `SourceUSA Today`                                                                                   
## `SourceUSA TODAY`                                                                                ***
## `SourceUSA TODAY College`                                                                           
## `SourceUSA TODAY High School Sports`                                                                
## `SourceUSAPP American Politics and Policy (blog)`                                                   
## `SourceUSDA.gov (press release)`                                                                    
## `SourceUSDA.gov (press release) (blog)`                                                             
## `SourceUSgamer (satire) (registration) (blog)`                                                      
## `SourceUSNI News`                                                                                   
## `SourceuSwitch.com (Tech)`                                                                          
## `SourceUT The Daily Texan`                                                                          
## `SourceUTA The Shorthorn`                                                                           
## `SourceUtah Business`                                                                               
## SourceUTDailyBeacon.com                                                                             
## `SourceUtility Dive`                                                                                
## `SourceUtne Reader Online`                                                                          
## `SourceUTV Ireland`                                                                                 
## `SourceUTV Ireland (blog)`                                                                          
## Sourceuuworld.org                                                                                   
## `SourceUW Badger Herald`                                                                            
## `SourceUW Today`                                                                                    
## SourceV3.co.uk                                                                                      
## `SourceValdosta Daily Times`                                                                        
## `SourceValley Advocate`                                                                             
## `SourceValley morning Star`                                                                         
## `SourceValley News`                                                                                 
## `SourceValley News Live`                                                                            
## SourceValueWalk                                                                                     
## `SourceVancity Buzz`                                                                                
## `SourceVancouver Sun`                                                                               
## `SourceVancouver Sun (blog)`                                                                        
## SourceVanguard                                                                                      
## `SourceVanity Fair`                                                                                 
## SourceVariety                                                                                       
## `SourceVariety via Yahoo! Finance`                                                                  
## `SourceVatican Radio`                                                                               
## SourceVatorNews                                                                                     
## SourceVEJA.com                                                                                      
## SourceVenezuelanalysis.com                                                                          
## `SourceVentura County Star`                                                                         
## `SourceVenture Capital Post`                                                                        
## SourceVentureBeat                                                                                   
## `SourceVentures Africa`                                                                             
## SourceVentureVillage                                                                                
## `SourceVenues Today`                                                                                
## `SourceVera Files`                                                                                  
## `SourceVermont Public Radio`                                                                        
## SourceVG247                                                                                         
## SourceVibe                                                                                          
## `SourceVibe Magazine`                                                                               
## SourceVICE                                                                                          
## `SourceVICE (blog)`                                                                                 
## `SourceVICE News`                                                                                   
## `SourceVictor Post`                                                                                 
## SourceVideogamer.com                                                                                
## SourceVideoNewsUs                                                                                   
## `SourceViet Nam News`                                                                               
## `SourceVietnam Plus`                                                                                
## `SourceVietNamNet Bridge`                                                                           
## `SourceVillage Voice`                                                                               
## `SourceVine Report`                                                                                 
## `SourceVineland Daily Journal`                                                                      
## `SourceVineyard Gazette`                                                                            
## `SourceVirgin Islands Daily News`                                                                   
## `SourceVirginia Gazette`                                                                            
## `SourceVirginian-Pilot`                                                                             
## `SourceVirtualization Review`                                                                       
## `SourceVirtualization Review (blog)`                                                                
## `SourceVisionMobile (blog)`                                                                         
## SourceVnExpress                                                                                     
## `SourceVOA Khmer (English)`                                                                         
## `SourceVOA Learning English`                                                                        
## `SourceVOA News`                                                                                    
## `SourceVOA Ting Vit`                                                                                
## `SourceVOA Zimbabwe`                                                                                
## SourceVocativ                                                                                       
## SourceVOCM                                                                                          
## SourceVogue.co.uk                                                                                   
## SourceVogue.com                                                                                     
## `SourceVoice & Data Online`                                                                         
## `SourceVoice Chronicle`                                                                             
## `SourceVoice of America`                                                                            
## `SourceVoice of America (blog)`                                                                     
## `SourceVoice of San Diego`                                                                          
## Sourcevoiceofdetroit                                                                                
## `SourceVoltaire Network`                                                                            
## SourceVox                                                                                           
## `SourceVR-Zone`                                                                                     
## `SourceVR World`                                                                                    
## SourceVRFocus                                                                                       
## Sourcevtdigger.org                                                                                  
## `SourceVulcan Post (press release)`                                                                 
## SourceVulture                                                                                       
## `SourceW*USA 9`                                                                                     
## `SourceWA today`                                                                                    
## `SourceWABC-TV`                                                                                     
## `SourceWABC-TV New York`                                                                            
## `SourceWABE 90.1 FM`                                                                                
## SourceWACH.com                                                                                      
## `SourceWaco Tribune-Herald`                                                                         
## `SourceWAFA - Palestine News Agency`                                                                
## SourceWAFF                                                                                          
## `SourceWAFF 48 News Huntsville`                                                                     
## `SourceWaging Nonviolence`                                                                          
## SourceWAGM                                                                                          
## `SourceWaikato Times`                                                                               
## Sourcewajr                                                                                          
## `SourceWakefield Express`                                                                           
## `SourceWakey Wakey News`                                                                            
## `SourceWALB Albany`                                                                                 
## SourceWalesOnline                                                                                   
## `SourceWall Street 24`                                                                              
## `SourceWall Street Daily`                                                                           
## `SourceWall Street Journal`                                                                         
## `SourceWall Street Journal (blog)`                                                                  
## `SourceWall Street Journal (subscription)`                                                          
## `SourceWall Street Journal (subscription) (blog)`                                                   
## `SourceWall Street Journal Blogs`                                                                   
## `SourceWall Street Pit`                                                                             
## `SourceWalla Walla Union-Bulletin`                                                                  
## SourceWaltonian                                                                                     
## SourceWAMC                                                                                          
## SourceWamda                                                                                         
## SourceWAND                                                                                          
## `SourceWandsworth Guardian`                                                                         
## SourceWANE                                                                                          
## SourceWAOW                                                                                          
## `SourceWAPT Jackson`                                                                                
## SourceWarc                                                                                          
## `SourceWard's Auto`                                                                                 
## SourceWareable                                                                                      
## `SourceWarsaw Business Journal`                                                                     
## `SourceWashington Blade`                                                                            
## `SourceWashington Business Journal`                                                                 
## `SourceWashington City Paper`                                                                       
## `SourceWashington City Paper (blog)`                                                                
## `SourceWashington Examiner`                                                                         
## `SourceWashington Free Beacon`                                                                      
## `SourceWashington Free Beacon (blog)`                                                               
## `SourceWashington News Wire`                                                                        
## `SourceWashington Post`                                                                             
## `SourceWashington Post (blog)`                                                                      
## `SourceWashington Times`                                                                            
## SourceWashingtonian.com                                                                             
## `SourceWaste Management World`                                                                      
## Sourcewaste360                                                                                      
## SourceWatchdog.org                                                                                  
## `SourceWATE 6 On Your Side`                                                                         
## `SourceWaterbury Republican American`                                                               
## `SourceWaterloo Cedar Falls Courier`                                                                
## `SourceWaterloo Record`                                                                             
## `SourceWatertown Daily Times`                                                                       
## SourceWatertownDailyTimes.com                                                                       
## `SourceWausau Daily Herald`                                                                         
## `SourceWAVE 3`                                                                                      
## `SourceWAVE 3 Louisville`                                                                           
## `SourceWAVY-TV`                                                                                     
## `SourceWaxahachie Daily Light`                                                                      
## `SourceWaynesville Daily Guide`                                                                     
## `SourceWBAL-TV Baltimore`                                                                           
## `SourceWBAL Baltimore`                                                                              
## `SourceWBAL Radio`                                                                                  
## SourceWBAY                                                                                          
## SourceWBEZ                                                                                          
## `SourceWBEZ 91.5 Chicago`                                                                           
## SourceWBFO                                                                                          
## `SourceWBIR-TV`                                                                                     
## SourceWBIR.com                                                                                      
## `SourceWBNS-10TV Columbus`                                                                          
## `SourceWBOC TV 16`                                                                                  
## `SourceWBOY-TV`                                                                                     
## `SourceWBRC FOX6 News - WBRC.com`                                                                   
## SourceWBT                                                                                           
## SourceWBTV                                                                                          
## `SourceWBTV Charlotte`                                                                              
## SourceWBUR                                                                                          
## `SourceWBUR Boston`                                                                                 
## SourceWBXH                                                                                          
## `SourceWCAV Charlottesville`                                                                        
## SourceWCAX                                                                                          
## `SourceWCAX-TV Vermont`                                                                             
## `SourceWCBD News 2`                                                                                 
## SourceWCCFtech                                                                                      
## `SourceWCCFtech (blog)`                                                                             
## SourceWCPO                                                                                          
## `SourceWCSH-TV`                                                                                     
## SourceWCSH6.com                                                                                     
## `SourceWCSM Radio`                                                                                  
## SourceWCTV                                                                                          
## `SourceWCVB Boston`                                                                              ***
## SourceWCYB                                                                                          
## `SourceWDAM-TV`                                                                                     
## SourceWDAY                                                                                          
## SourceWDBJ7                                                                                         
## `SourceWDIV Detroit`                                                                                
## SourceWDRB                                                                                          
## `SourceWDSU New Orleans`                                                                            
## SourceWDTN                                                                                          
## SourceWDTV                                                                                          
## `SourceWe Got This Covered`                                                                         
## `SourceWe Live Security (blog)`                                                                     
## `SourceWe Up It`                                                                                    
## SourceWeAreGreenBay.com                                                                             
## `SourceWeAreTheCity (press release) (blog)`                                                         
## SourceWeatherWatch.co.nz                                                                            
## SourceWEAU                                                                                          
## `SourceWEAU Eau Claire`                                                                             
## `SourceWeb Host Industry Review`                                                                    
## `SourceWeb India`                                                                                   
## SourceWebMD                                                                                         
## SourceWebProNews                                                                                    
## `SourceWebster Journal`                                                                             
## `SourceWECT-TV6`                                                                                    
## `SourceWECT 6 Wilmington`                                                                           
## `SourceWeekly Times Now`                                                                            
## `SourceWESH 2 Orlando`                                                                              
## `SourceWESH Orlando`                                                                                
## `SourceWest Central Tribune`                                                                        
## `SourceWest Virginia MetroNews`                                                                     
## `SourceWestern Advocate`                                                                            
## `SourceWestern Journalism`                                                                          
## `SourceWestern Morning News`                                                                        
## `SourceWestern Producer (subscription)`                                                             
## `SourceWestern Star`                                                                                
## `SourceWestern Telegraph`                                                                           
## SourceWesternSlopeNow                                                                               
## `SourceWestfair Online`                                                                             
## `SourceWestlaw Insider (blog)`                                                                      
## `SourceWestside Gazette`                                                                            
## `SourceWestside Today`                                                                              
## `SourceWeyburn Review`                                                                              
## SourceWFAA                                                                                          
## SourceWFAA.com                                                                                      
## SourceWFDD                                                                                          
## `SourceWFLX FOX 29`                                                                                 
## SourceWFMJ                                                                                          
## `SourceWFMJ Youngstown`                                                                             
## SourceWFMYNews2.com                                                                                 
## `SourceWFMZ Allentown`                                                                              
## `SourceWFMZ Eastern Pennsylvania and Western New Jersey`                                            
## SourceWFSB                                                                                          
## `SourceWFTV Orlando`                                                                                
## SourceWFXG.com                                                                                      
## `SourceWGAL 8 Susquehanna Valley`                                                                   
## `SourceWGBA-TV`                                                                                     
## SourceWGEM                                                                                          
## `SourceWGEM Quincy`                                                                                 
## SourceWGME                                                                                          
## `SourceWGN-TV`                                                                                      
## `SourceWGN Radio`                                                                                   
## `SourceWGN TV Chicago`                                                                              
## SourceWGNO                                                                                          
## SourceWGRZ.com                                                                                      
## `SourceWHAS 11.com (subscription)`                                                                  
## SourceWHAS11.com                                                                                    
## SourceWhatCulture                                                                                   
## SourceWhaTech                                                                                       
## `SourceWHDH-TV`                                                                                     
## SourceWheels.ca                                                                                     
## `SourceWhich-50 (blog)`                                                                             
## `SourceWHIO-TV 7 Dayton`                                                                            
## `SourceWhite House Dossier`                                                                         
## `SourceWhitehorse Star (subscription)`                                                              
## `SourceWhitehouse.gov (press release)`                                                              
## `SourceWHNT-TV Huntsville`                                                                          
## Sourcewhnt.com                                                                                      
## `SourceWHO-TV 13 Des Moines`                                                                        
## Sourcewhotv.com                                                                                     
## `SourceWhoWhatWhy / RealNewsProject (blog)`                                                         
## SourceWHSV                                                                                          
## `SourceWhyalla News`                                                                                
## `SourceWIAT 42`                                                                                     
## SourceWIBW                                                                                          
## `SourceWichita Eagle`                                                                               
## `SourceWicked Local`                                                                                
## `SourceWicked Local Natick`                                                                         
## `SourceWicked Local Wellesley`                                                                      
## SourceWIFR                                                                                          
## `SourceWIFR Rockford`                                                                               
## Sourcewigantoday.net                                                                                
## `SourceWii U Daily`                                                                                 
## SourceWikinews                                                                                      
## `SourceWillamette Week`                                                                             
## `SourceWilts and Gloucestershire Standard`                                                          
## `SourceWILX-TV`                                                                                     
## `SourceWILX 10 Lansing`                                                                             
## `SourceWINA AM 1070 (press release)`                                                                
## SourceWinBeta                                                                                       
## `SourceWindows Central`                                                                             
## `SourceWindows IT Pro`                                                                              
## `SourceWindows IT Pro (blog)`                                                                       
## `SourceWindows Report`                                                                              
## `SourceWindowsItPro (subscription)`                                                                 
## `SourceWindowsItPro (subscription) (blog)`                                                          
## `SourceWindpower Engineering (press release)`                                                       
## `SourceWindsor Star`                                                                                
## `SourceWink News`                                                                                   
## `SourceWinnipeg Free Press`                                                                         
## `SourceWinnipeg Sun`                                                                                
## `SourceWinona Daily News`                                                                           
## `SourceWinston-Salem Chronicle`                                                                     
## `SourceWinston-Salem Journal`                                                                       
## SourceWIRED                                                                                         
## `SourceWired News`                                                                                  
## `SourceWired UK`                                                                                    
## SourceWired.co.uk                                                                                   
## `SourceWireless Week`                                                                               
## SourceWirtschaftsWoche                                                                              
## `SourceWIS News 10 Columbia`                                                                        
## `SourceWISC-TV Madison`                                                                             
## `SourceWisconsin Gazette`                                                                           
## `SourceWisconsin Public Radio News`                                                                 
## `SourceWISH-TV`                                                                                     
## `SourceWISH-TV Indianapolis`                                                                        
## `SourceWISN 12 Milwaukee`                                                                           
## `SourceWISN Milwaukee`                                                                              
## SourceWITN                                                                                          
## Sourcewivb.com                                                                                      
## `SourceWJBF-TV`                                                                                     
## SourceWJLA                                                                                          
## SourceWJTV                                                                                          
## `SourceWJXT Jacksonville`                                                                        ***
## SourceWKBN.com                                                                                      
## `SourceWKBW-TV`                                                                                     
## SourceWKOW                                                                                          
## SourceWKRG                                                                                          
## `SourceWKRG News 5 Mobile`                                                                          
## `SourceWKSU News`                                                                                   
## `SourceWKYC-TV`                                                                                     
## SourceWKYT                                                                                          
## `SourceWLBT 3 Jackson`                                                                              
## SourceWLBZ2.com                                                                                     
## Sourcewlfi.com                                                                                      
## `SourceWLKY Louisville`                                                                             
## SourceWLNS                                                                                          
## `SourceWLOX-TV Biloxi`                                                                              
## SourceWLRN                                                                                          
## `SourceWLS-TV`                                                                                      
## `SourceWLWT-TV Cincinnati`                                                                          
## `SourceWLWT Cincinnati`                                                                             
## `SourceWMBD - FOX 43 Peoria`                                                                        
## `SourceWMBF News Myrtle Beach`                                                                      
## `SourceWMC Action News 5`                                                                           
## `SourceWMCTV Memphis`                                                                               
## SourceWMPoweruser.com                                                                               
## SourceWMTV                                                                                          
## `SourceWMTW Portland`                                                                               
## `SourceWMUR Manchester`                                                                             
## `SourceWN Philippines`                                                                              
## SourceWNAX                                                                                          
## SourceWNBA.com                                                                                      
## SourceWNCN                                                                                          
## SourceWNCT                                                                                          
## SourceWND.com                                                                                       
## `SourceWNDU-TV`                                                                                     
## `SourceWNEP 16 Pennsylvania`                                                                        
## Sourcewnep.com                                                                                      
## `SourceWNIJ and WNIU`                                                                               
## SourceWNYC                                                                                          
## `SourceWNYC New York Public Radio`                                                                  
## SourceWNYT                                                                                          
## SourceWOAI                                                                                          
## SourceWOAI.com                                                                                      
## `SourceWonkette (satire) (blog)`                                                                    
## `SourceWoodstock Sentinel-Review`                                                                   
## SourceWOODTV.com                                                                                    
## `SourceWorcester Telegram`                                                                          
## `SourceWorkers World`                                                                               
## SourceWorkpermit.com                                                                                
## `SourceWorld Affairs (blog)`                                                                        
## `SourceWorld Bank Group`                                                                            
## `SourceWorld Bank Group (blog)`                                                                     
## `SourceWorld Fishing`                                                                               
## `SourceWorld Highways`                                                                              
## `SourceWorld Intellectual Property Review (subscription)`                                           
## `SourceWorld Nuclear News`                                                                          
## `SourceWorld Policy Institute (blog)`                                                               
## `SourceWorld Politics Review`                                                                       
## `SourceWorld Socialist Web Site`                                                                    
## `SourceWorld Tribune`                                                                               
## SourceWorldcrunch                                                                                   
## `SourceWorthing Herald`                                                                             
## `SourceWorthington Daily Globe`                                                                     
## `SourceWOWK-TV West Virginia`                                                                       
## SourceWOWT                                                                                          
## `SourceWPBF West Palm Beach`                                                                        
## SourceWPEC                                                                                          
## `SourceWPIX 11 New York`                                                                            
## `SourceWPRI 12 Eyewitness News`                                                                     
## SourceWPRO                                                                                          
## SourceWPTV.com                                                                                      
## SourceWPTZ                                                                                          
## `SourceWPTZ Burlington`                                                                             
## `SourceWPTZ The Champlain Valley`                                                                   
## `SourceWPVI-TV`                                                                                     
## `SourceWPVI – Philadelphia via Yahoo! News`                                                         
## `SourceWPVI 6abc Philadelphia`                                                                      
## `SourceWPXI Pittsburgh`                                                                             
## `SourceWQAD Moline`                                                                                 
## SourceWQAD.com                                                                                      
## `SourceWQOW Eau Claire`                                                                             
## `SourceWRAL Tech Wire`                                                                              
## SourceWRAL.com                                                                                      
## SourceWRBL                                                                                          
## `SourceWRCB-TV`                                                                                     
## `SourceWRDW-TV`                                                                                     
## `SourceWREG-TV Memphis`                                                                             
## Sourcewreg.com                                                                                      
## SourceWrestlezone                                                                                   
## `SourceWREX-TV`                                                                                     
## SourceWRGB                                                                                          
## SourceWRIC                                                                                          
## `SourceWRTV Indianapolis`                                                                           
## `SourceWSAZ-TV`                                                                                     
## `SourceWSB Atlanta`                                                                                 
## `SourceWSBT-TV`                                                                                     
## SourceWSET                                                                                          
## `SourceWSFA 12 Montgomery`                                                                          
## SourceWSLS                                                                                          
## `SourceWSOC Charlotte`                                                                              
## `SourceWSYM-TV`                                                                                     
## SourceWSYR                                                                                          
## `SourceWT VOX`                                                                                      
## `SourceWTAE-TV Pittsburgh`                                                                          
## `SourceWTAE Pittsburgh`                                                                             
## SourceWTAJ                                                                                          
## SourceWTAW                                                                                          
## SourceWTHR                                                                                          
## `SourceWTHR Indianapolis`                                                                           
## `SourceWTKR Norfolk`                                                                                
## Sourcewtkr.com                                                                                      
## SourceWTMA                                                                                          
## `SourceWTMJ-TV (press release) (registration) (blog)`                                               
## `SourceWTMJ (press release) (subscription) (blog)`                                                  
## `SourceWTNH Connecticut News (press release)`                                                       
## SourceWTOC                                                                                          
## `SourceWTOC 11 Savannah`                                                                            
## SourceWTOK                                                                                          
## SourceWTOL.com                                                                                      
## SourceWTOP                                                                                          
## `SourceWTOV Steubenville`                                                                           
## `SourceWTSP 10 News`                                                                                
## SourceWTSP.com                                                                                      
## `SourceWTTV CBS4Indy`                                                                               
## SourceWTVA                                                                                          
## SourceWTVC                                                                                          
## `SourceWTVD-TV`                                                                                     
## SourceWTVM                                                                                          
## `SourceWTXL ABC 27`                                                                                 
## `SourceWUIS 91.9`                                                                                   
## SourceWUSA9.com                                                                                     
## SourceWVLT                                                                                          
## SourceWVTM13                                                                                        
## `SourceWVVA Bluefield`                                                                              
## `SourceWVVA TV (registration)`                                                                      
## `SourceWWAY NewsChannel 3`                                                                          
## `SourceWWBT NBC12 News`                                                                             
## SourceWWD                                                                                           
## SourceWWL                                                                                           
## Sourcewwlp.com                                                                                      
## `SourceWWMT-TV`                                                                                     
## `SourceWWNY TV 7`                                                                                   
## `SourceWWSB ABC 7`                                                                                  
## Sourcewww.breakbulk.com                                                                             
## `Sourcewww.kingstonregion.com/`                                                                     
## Sourcewww.worldbulletin.net                                                                         
## `SourceWXIA-TV`                                                                                     
## `SourceWXII-TV Winston-Salem`                                                                       
## SourceWXIX                                                                                          
## `SourceWXOW 19 La Crosse`                                                                           
## `SourceWXXI News`                                                                                   
## SourceWXYZ                                                                                          
## `SourceWXYZ-TV Detroit`                                                                             
## `SourceWYFF 4 Greenville`                                                                           
## `SourceWyoming Business Report`                                                                     
## `SourceWyoming Tribune`                                                                             
## SourceWYTV                                                                                          
## `SourceWZZM 13 Grand Rapids`                                                                        
## SourceWZZM13.com                                                                                    
## `SourceXãLun.com tin tc vit nam 24h cp nht`                                                         
## SourceXconomy                                                                                       
## `SourceXDA Developers (blog)`                                                                       
## SourceXinhua                                                                                        
## SourceXXLMAG.COM                                                                                    
## `SourceYa Libnan`                                                                                   
## `SourceYahoo Autos`                                                                                 
## `SourceYahoo Canada Finance - Insight (blog)`                                                       
## `SourceYahoo Canada Sports (blog)`                                                                  
## `SourceYahoo Celebrity UK`                                                                          
## `SourceYahoo Finance`                                                                               
## `SourceYahoo Finance UK`                                                                            
## `SourceYahoo Finance via Yahoo! Finance`                                                            
## `SourceYahoo Finance via Yahoo! News`                                                               
## `SourceYahoo Food`                                                                                  
## `SourceYahoo Health`                                                                                
## `SourceYahoo Katie Couric`                                                                          
## `SourceYahoo Movies (blog)`                                                                         
## `SourceYahoo Music`                                                                                 
## `SourceYahoo New Zealand via Yahoo! New Zealand News`                                               
## `SourceYahoo New Zealand via Yahoo!7 News`                                                          
## `SourceYahoo News`                                                                                  
## `SourceYahoo News Canada (blog)`                                                                    
## `SourceYahoo News Digest`                                                                           
## `SourceYahoo News UK`                                                                               
## `SourceYahoo News via Yahoo Canada News`                                                            
## `SourceYahoo News via Yahoo UK & Ireland News`                                                      
## `SourceYahoo News via Yahoo! News`                                                                  
## `SourceYahoo Parenting`                                                                             
## `SourceYahoo Politics`                                                                              
## `SourceYahoo Singapore News`                                                                        
## `SourceYahoo Singapore on Tumblr via Yahoo! Singapore News`                                         
## `SourceYahoo Sports`                                                                                
## `SourceYahoo Sports (blog)`                                                                         
## `SourceYahoo Tech`                                                                                  
## `SourceYahoo Tech via Yahoo! News`                                                                  
## `SourceYahoo Travel`                                                                                
## `SourceYahoo TV (blog)`                                                                             
## `SourceYahoo! Maktoob News`                                                                         
## `SourceYahoo7 and Agencies via Yahoo! New Zealand News`                                             
## `SourceYahoo7 and Agencies via Yahoo!7 News`                                                        
## `SourceYahoo7 Finance via Yahoo!7 Finance`                                                          
## `SourceYahoo7 News`                                                                                 
## `SourceYakima Herald-Republic`                                                                      
## `SourceYale Environment 360`                                                                        
## `SourceYaleGlobal Online`                                                                           
## `SourceYarmouth County Vanguard`                                                                    
## `SourceYellowhammer News`                                                                           
## `SourceYeni \\u009d\\u009dafak English (press release)`                                             
## `SourceYES! Magazine`                                                                               
## `SourceYeshiva World News`                                                                          
## `SourceYibada (English Edition)`                                                                    
## `SourceYIBADA English`                                                                              
## `SourceYLE News`                                                                                    
## SourceYNaija                                                                                        
## SourceYnetnews                                                                                      
## `SourceYonhap News`                                                                                 
## `SourceYork Daily Record/Sunday News`                                                               
## `SourceYork Dispatch`                                                                               
## `SourceYork Press`                                                                                  
## SourceYorkRegion.com                                                                                
## `SourceYorkshire Evening Post`                                                                      
## `SourceYorkshire Post`                                                                              
## `SourceYorkton News Review`                                                                         
## `SourceYorkton This Week`                                                                           
## `SourceYorkton This Week (press release)`                                                           
## `SourceYouGov US`                                                                                   
## `SourceYoungstown Vindicator`                                                                       
## `SourceYour EDM`                                                                                    
## `SourceYour Hometown Lima Stations`                                                                 
## `SourceYour Houston News`                                                                           
## `SourceYour Houston News (blog)`                                                                    
## `SourceYour Middle East`                                                                            
## `SourceYour News Now`                                                                               
## Sourceyourcentralvalley.com                                                                         
## SourceYourErie                                                                                      
## SourceYourStory.com                                                                                 
## SourceYourWestValley.com                                                                            
## `SourceYouth Health Magzine`                                                                        
## `SourceYouth Ki Awaaz`                                                                              
## SourceYubaNet                                                                                       
## SourceYugaTech                                                                                      
## `SourceYuma Sun`                                                                                    
## `SourceZacks via Yahoo Canada Finance`                                                              
## `SourceZacks via Yahoo UK & Ireland Finance`                                                        
## `SourceZacks via Yahoo! Finance`                                                                    
## `SourceZacks via Yahoo! Finance India`                                                              
## `SourceZacks via Yahoo! New Zealand Finance`                                                        
## `SourceZacks via Yahoo!7 Finance`                                                                   
## SourceZacks.com                                                                                     
## SourceZap2It                                                                                        
## `SourceZawya (registration)`                                                                        
## SourceZDNet                                                                                         
## `SourceZDNet (blog)`                                                                                
## `SourceZDNet UK`                                                                                    
## `SourceZee News`                                                                                    
## SourceZergwatch                                                                                     
## `SourceZero Hedge`                                                                                  
## SourceZIK                                                                                           
## `SourceZimbabwe Independent`                                                                        
## `SourceZimEye - Zimbabwe News`                                                                      
## `SourceZME Science`                                                                                 
## SourceZNBC                                                                                          
## SourceZolmax                                                                                        
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 123.82  on 99  degrees of freedom
## Residual deviance: 648.79  on 27  degrees of freedom
## AIC: 794.79
## 
## Number of Fisher Scoring iterations: 25

Answer:

Let’s break down the important parts of the summary for the above logistic regression model:

  • Significance Codes: These are codes indicating the level of significance of each coefficient. In this case, ’***’ means a very high level of significance, while ’ ’ (a space) means not significant. Significance codes help you determine which coefficients are statistically significant in predicting the binary outcome.

  • Dispersion Parameter: For the binomial family (which is used for logistic regression), the dispersion parameter is a measure of how much the data deviates from the model’s expectations. It’s essentially a measure of model fit. In this case, it’s taken to be 1, which means that the model’s predictions match the data well.

  • Null Deviance and Residual Deviance: The null deviance measures how well the response variable is predicted by a model with no predictors (only the intercept). The residual deviance measures how well the response variable is predicted by the model you’ve built. The difference between the null deviance and residual deviance indicates the goodness of fit. In this case, the null deviance is 123.82, and the residual deviance is 648.79, suggesting that the model is providing a better fit than a null model.

  • AIC (Akaike Information Criterion): AIC is a measure of the model’s goodness of fit and takes into account the number of predictors. It’s used for model selection. Lower AIC values indicate a better fit. In this case, the AIC is 794.79, which is a measure of how well the model fits the data, but it should be compared to the AIC of other models for model selection.

  • Number of Fisher Scoring Iterations: This tells how many iterations were needed to estimate the model’s parameters. In this case, it took 25 iterations.

To interpret the coefficients, one would need to look at the coefficients for the predictors (Topic and Source) in the above logistic regression model. These coefficients indicate how the log-odds of the binary outcome change with a one-unit change in the predictor while holding other predictors constant.

For example, if the coefficient for ‘TopicEconomy’ is positive, it means that an increase in the ‘Economy’ topic is associated with an increase in the log-odds of the binary outcome (whatever it represents). If the coefficient is negative, it’s associated with a decrease in the log-odds.

# Use broom to tidy the model results
tidy_results <- tidy(model)

# Calculating the confidence interval manually
coefficient <- coef(model)["Topic"]  # Assuming 'Topic' is the variable of interest
standard_error <- tidy_results$std.error[2]  # Assuming we are using the second coefficient
critical_value <- qnorm(0.975)  # For 95% confidence interval

# Compute the confidence interval
lower_bound <- coefficient - critical_value * standard_error
upper_bound <- coefficient + critical_value * standard_error

# Print the results
cat("The standard error for the coefficient is:", standard_error, "\n")
## The standard error for the coefficient is: 177464.3
cat("The 95% confidence interval for the coefficient is [", lower_bound, ", ", upper_bound, "].\n")
## The 95% confidence interval for the coefficient is [ NA ,  NA ].

Part 3:

Consider a transformation for any explanatory variable, and illustrate why you need the transformation (or why you do not) Scatter Plots …

# Scatter plot before transformation
ggplot(data, aes(x = Facebook, y = SentimentTitle)) + 
  geom_point() + 
  ggtitle("Scatter Plot of Sentiment Title Vs. Facebook (Before Transformation)")

Answer:

The image shows a scatter plot of the Sentiment Title and the number of Facebook likes. The relationship between the two variables is non-linear, which means that a linear regression model will not be able to accurately capture the relationship between them.

There are two main reasons why the transformation is necessary:

  • To improve the accuracy of the model. A linear regression model is only able to learn linear relationships between the features and the target variable. By transforming the data, we can make the relationship between the sentiment title and the number of Facebook likes more linear, which will improve the accuracy of the model.

  • To interpret the coefficients of the model. The coefficients of a linear regression model represent the change in the target variable for every unit change in the feature. If the relationship between the features and the target variable is non-linear, then the coefficients of the model will not be interpretable. By transforming the data, we can make the relationship between the sentiment title and the number of Facebook likes more linear, which will make the coefficients of the model interpretable.

# Perform reciprocal transformation on 'Facebook' variable
data$Facebook_reciprocal <- 1 / data$Facebook

# Scatter plot after transformation
ggplot(data, aes(x = Facebook_reciprocal, y = SentimentTitle)) + 
  geom_point() + 
  geom_smooth(method = "lm", se = FALSE) +
  ggtitle("Scatter Plot of Sentiment Title Vs. Facebook (After Transformation)")
## `geom_smooth()` using formula = 'y ~ x'
## Warning: Removed 16844 rows containing non-finite values (`stat_smooth()`).

Overall, the transformation is necessary to improve the accuracy and interpretability of the model. The scatter plot shows a positive correlation between the two variables, meaning that as the sentiment title becomes more positive, the number of likes on Facebook tends to increase.