The video that accompanies this notebook is available at https://ucdavis.box.com/v/sts-205-notebook-3.
In this notebook we are going to do some more advanced work with word frequencies and n-grams. Let’s start by loading the tidyverse
and tidytext
packages, sourcing our functions, and making the sotu
data frame.
library(tidyverse)
library(tidytext)
source("functions.r")
sotu <- make_sotu()
── Column specification ────────────────────────────────────────────────────────
cols(
year = col_double(),
pres = col_character(),
use_last = col_logical()
)
head(sotu)
We can also examine the frequency of phrases, rather than single words. If we go back to the sotu
data frame, we can tokenize it by n-grams of any length. We do that by specifying token = "ngrams"
and the size of n
in the unnest_tokens()
argument. Below we make a data frame of bigrams and trigrams.
sotu_bigrams <- sotu %>% unnest_tokens(gram, text, token = "ngrams", n = 2)
head(sotu_bigrams)
sotu_trigrams <- sotu %>% unnest_tokens(gram, text, token = "ngrams", n = 3)
head(sotu_trigrams)
We can make the same charts we made above to see the frequency of bigrams and trigrams over time. The first thing we need to do, though, is eliminate bigrams and trigrams that contain stopwords. The tidytext
package includes two functions that make this easy: separate()
and unite()
.
sotu_bigrams <- sotu_bigrams %>% filter(!str_detect(gram, "[:digit:]")) %>%
separate(gram, c("w1", "w2"), sep = " ") %>%
filter(!w1 %in% stop_words$word & !w2 %in% stop_words$word) %>%
unite(gram, w1, w2, sep = " ")
sotu_trigrams <- sotu_trigrams %>% filter(!str_detect(gram, "[:digit:]")) %>%
separate(gram, c("w1", "w2", "w3"), sep = " ") %>%
filter(!w1 %in% stop_words$word & !w2 %in% stop_words$word & !w3 %in% stop_words$word) %>%
unite(gram, w1, w2, w3, sep = " ")
head(sotu_trigrams)
This is not the last time we will be working with bigrams, so I’m going to make a function that makes bigrams from the sotu
data frame.
sotu_tokenize_bigrams <- function() {
sotu_bigrams <- sotu %>% mutate(text = str_replace_all(text, "<p>", "")) %>%
unnest_tokens(gram, text, token = "ngrams", n = 2) %>%
filter(!str_detect(gram, "[:digit:]")) %>%
separate(gram, c("w1", "w2"), sep = " ") %>%
filter(!w1 %in% stop_words$word & !w2 %in% stop_words$word) %>%
unite(gram, w1, w2, sep = " ")
return(sotu_bigrams)
}
sotu_bigrams <- sotu_tokenize_bigrams()
Now we can run the functions we made before.
all_top_grams(sotu_bigrams, 10)
Selecting by n
all_top_grams(sotu_trigrams, 10)
Selecting by n
png("top_bigrams_pres.png", width = 50, height = 50, units = "in", res = 100)
top_grams_pres(sotu_bigrams, 5)
Selecting by n
dev.off()
quartz_off_screen
2
top_grams_pres(sotu_trigrams, 5)
Selecting by n
grams_by_pres(sotu_bigrams, "bigrams_by_pres.png", 10)
Selecting by pct
quartz_off_screen
2
grams_by_pres(sotu_trigrams, "trigrams_by_pres.png", 5)
Selecting by pct
quartz_off_screen
2
The first thing we are going to do is build an n-gram viewer for the State of the Union addresses. First we will view a specific n-gram over time, then we will write a general function to view as many n-grams as we want.
sotu %>% mutate(text = str_replace_all(text, "<p>", "")) %>%
unnest_tokens(gram, text, token = "ngrams", n = 2) %>%
group_by(year) %>% count(gram) %>% mutate(freq = n/sum(n)) %>% filter(gram == "united states") %>%
ggplot(aes(x = year, y = freq)) + geom_line() + labs(title = "united states")
What if we want to see the frequency of “america” in addition to “united states”?
ngrams <- c("united states", "america")
for(i in 1:length(ngrams)) {
ngram <- ngrams[i]
n <- str_count(ngram, " ") + 1
graph <- sotu %>% mutate(text = str_replace_all(text, "<p>", "")) %>%
unnest_tokens(gram, text, token = "ngrams", n = n) %>%
group_by(year) %>% count(gram) %>% mutate(freq = n/sum(n)) %>%
filter(gram == ngram) %>%
ggplot(aes(x = year, y = freq)) + geom_line() + labs(title = ngram)
print(graph)
}
What if we want to see the frequency of “america” and “united states” on the same graph?
ngrams <- c("united states", "america")
all_ngrams <- data.frame()
for(i in 1:length(ngrams)) {
ngram <- ngrams[i]
n <- str_count(ngram, " ") + 1
data <- sotu %>% mutate(text = str_replace_all(text, "<p>", "")) %>%
unnest_tokens(gram, text, token = "ngrams", n = n) %>%
group_by(year) %>% count(gram) %>% mutate(freq = n/sum(n)) %>%
select(year, gram, freq) %>% filter(gram == ngram) %>% ungroup
all_ngrams <- rbind(all_ngrams, data)
}
ggplot(all_ngrams, aes(x = year, y = freq, color = gram)) + geom_line() + labs(title = "N-Grams")
Now we can generalize this code into a function to view any number of n-grams.
view_ngrams <- function(ngrams) {
all_ngrams <- data.frame()
for(i in 1:length(ngrams)) {
ngram <- ngrams[i]
n <- str_count(ngram, " ") + 1
data <- sotu %>% mutate(text = str_replace_all(text, "<p>", "")) %>%
unnest_tokens(gram, text, token = "ngrams", n = n) %>%
group_by(year) %>% count(gram) %>% mutate(freq = n/sum(n)) %>%
select(year, gram, freq) %>% filter(gram == ngram) %>% ungroup
all_ngrams <- rbind(all_ngrams, data)
}
ggplot(all_ngrams, aes(x = year, y = freq, color = gram)) + geom_line() + labs(title = "N-Grams")
}
view_ngrams(c("united states", "america", "united states of america"))
view_ngrams(c("economy", "economic", "economic growth"))
Another way we can use word or n-gram frequencies is to examine the words or n-grams that are uniquely characteristic of a document. We do this with term frequency - inverse document frequency or Tf-Idf. In this case, we are going to use presidents as our unit of analysis, finding the words (and then bigrams) that are uniquely characteristic of a president. That is, words that any given president uses that are not also routinely used by the other presidents.
Let’s start by running our sotu_tokenize_words()
function to make a data frame of all of the words, with stopwords removed. Then we will add a “president” column with president as a factor.
sotu_words <- sotu_tokenize_words() %>% mutate(president = fct_inorder(factor(pres)))
head(sotu_words)
Term frequency, or Tf, is just a count of the number of times a given term appears in a document, divided by the total number of terms in that document. Remember, in this instance, a “document” refers not to a single State of the Union, but to all State of the Unions given by a particular president.
tf <- sotu_words %>% group_by(president) %>% count(gram) %>% mutate(tf = n/sum(n))
head(tf)
Inverse document frequency, or Idf, is the natural log of the total number of documents divided by the number of documents in which a given term appears.
df <- tf %>% mutate(n = 1) %>% group_by(gram) %>% summarize(df = sum(n)) %>% arrange(-df)
head(df)
tail(df)
min(df$df)
[1] 1
max(df$df)
[1] 42
tfidf <- left_join(tf, df) %>% mutate(idf = log(length(unique(sotu$pres))/df), tf_idf = tf*idf)
Joining, by = "gram"
head(tfidf)
We can write a function that calculates the tf_idf of a data frame.
tf_idf <- function(dataset) {
tf <- dataset %>% group_by(president) %>% count(gram) %>% mutate(tf = n/sum(n))
df <- tf %>% mutate(n = 1) %>% group_by(gram) %>% summarize(df = sum(n))
tfidf <- left_join(tf, df) %>% mutate(idf = log(length(unique(sotu$pres))/df), tf_idf = tf*idf)
return(tfidf)
}
tf_idf_words <- tf_idf(sotu_words)
Joining, by = "gram"
head(tf_idf_words)
We can visualize the top Tf-Idf terms for each president the same way we visualized top words for each president last week.
tf_idf(sotu_words) %>% group_by(president) %>% top_n(5, tf_idf) %>%
ggplot(aes(x = gram, y = tf_idf, fill = president)) + geom_col() + coord_flip() +
facet_wrap(vars(president), scale = "free_y") + theme(legend.position = "none")
Joining, by = "gram"
Again, this is too big to view in the notebook, so let’s write it out to a .png
file. Let’s also generalize it into a function.
view_tf_idf <- function(dataset, filename, nterms) {
graph <- tf_idf(dataset) %>% group_by(president) %>% top_n(nterms, tf_idf) %>%
ggplot(aes(x = gram, y = tf_idf, fill = president)) + geom_col() + coord_flip() +
facet_wrap(vars(president), scale = "free_y") + theme(legend.position = "none")
png(filename, height = 20, width = 30, units = "in", res = 200)
print(graph)
dev.off()
}
view_tf_idf(sotu_words, "tf_idf_words.png", 5)
Joining, by = "gram"
null device
1
Now that we have written it as a function, we can also apply it to bigrams, or any other length of n-grams. First we need to make a data frame of bigrams.
sotu_bigrams <- sotu_tokenize_bigrams() %>% mutate(president = fct_inorder(factor(pres)))
head(sotu_bigrams)
Now we can call the view_tf_idf()
function.
view_tf_idf(sotu_bigrams, "tf_idf_bigrams.png", 5)
Joining, by = "gram"
null device
1
sotu_tokenize_bigrams() %>% mutate(president = fct_inorder(factor(pres))) %>% view_tf_idf("tf_idf_bigrams.png", 7)
null device
1
Another way to work with n-grams is keywords in context, or kwic. In a kwic, the word of interest is the middle word of the n-gram, and we look for all n-grams of a particular length where that word is in the middle. For example, if we wanted to see the word “united” and two words on each side of it in the first State of the Union address, we would be looking for all 5-grams where “united” is the third word. Here is one way we could do it.
text <- str_split(sotu$text[1], " ") %>% unlist()
locations <- tolower(text) %>% str_which("united")
for(l in 1:length(locations)) {
start <- ifelse(locations[l] > 2, locations[l] - 2, 1)
end <- ifelse(locations[l] + 2 <= length(text), locations[l] + 2, length(text))
print(str_c(text[start:end], collapse = " "))
}
[1] "of the United States (of"
[1] "of the United States require"
[1] "of the United States is"
[1] "of the United States are"
If we want to see all of the instances of “united” in all of the addresses.
for(i in 1:nrow(sotu)) {
print(str_c(sotu$pres[i], ", ", sotu$year[i]))
text <- str_split(sotu$text[i], " ") %>% unlist()
locations <- tolower(text) %>% str_which("united")
if(length(locations) > 0) {
for(l in 1:length(locations)) {
start <- ifelse(locations[l] > 2, locations[l] - 2, 1)
end <- ifelse(locations[l] + 2 <= length(text), locations[l] + 2, length(text))
print(str_c(text[start:end]), collapse = " ")
}
}
}
[1] "George Washington, 1790"
[1] "of" "the" "United" "States" "(of"
[1] "of" "the" "United" "States" "require"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "are"
[1] "George Washington, 1790.5"
[1] "of" "the" "United" "States," "renewed"
[1] "by" "the" "United" "States," "reminds"
[1] "George Washington, 1791"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "which"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States," "would"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "borders"
[1] "of" "the" "United" "States" "having"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "under"
[1] "of" "the" "United" "States" "is"
[1] "George Washington, 1792"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "or"
[1] "within" "the" "United" "States." "These"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "pursuant"
[1] "George Washington, 1793"
[1] "whom" "the" "United" "States" "have"
[1] "of" "the" "United" "States." "These"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "within" "the" "United" "States," "array"
[1] "of" "the" "United" "States," "or"
[1] "within" "the" "United" "States," "or"
[1] "of" "the" "United" "States," "although"
[1] "us." "The" "United" "States" "ought"
[1] "to" "the" "United" "States" "among"
[1] "of" "the" "United" "States." "But"
[1] "throughout" "the" "United" "States\"" "has"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "is"
[1] "for" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "as"
[1] "throughout" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "will"
[1] "George Washington, 1794"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "\"to"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "notified"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "would"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "Let"
[1] "of" "the" "United" "States\"," "on"
[1] "against" "the" "United" "States." "And"
[1] "of" "the" "United" "States" "has"
[1] "over" "these" "United" "States;" "to"
[1] "George Washington, 1795"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States," "will"
[1] "and" "the" "United" "States"
[5] "controversies"
[1] "of" "the" "United" "States," "we"
[1] "George Washington, 1796"
[1] "with" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "took"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "agreeably"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "therefore"
[1] "of" "the" "United" "States" "in"
[1] "invite" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "continue"
[1] "of" "the" "United" "States" "placed"
[1] "of" "the" "United" "States," "naturally"
[1] "to" "the" "United" "States," "that"
[1] "John Adams, 1797"
[1] "of" "the" "United" "States." "Nothing,"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "is"
[1] "to" "the" "United" "States." "Still,"
[1] "against" "the" "United" "States." "Great"
[1] "of" "the" "United" "States" "to"
[1] "against" "the" "United" "States." "Although"
[1] "to" "the" "United" "States," "it"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "Various"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "have"
[1] "<p>" "The" "United" "States" "being"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "upon"
[1] "of" "the" "United" "States." "By"
[1] "from" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "and"
[1] "John Adams, 1798"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "toward"
[1] "from" "the" "United" "States" "for"
[1] "from" "the" "United" "States" "should"
[1] "of" "the" "United" "States," "of"
[1] "which" "the" "United" "States" "ought"
[1] "<p>" "The" "United" "States" "will"
[1] "of" "the" "United" "States." "But"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "commences"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "John Adams, 1799"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States," "when"
[1] "by" "the" "United" "States" "and"
[1] "with" "the" "United" "States," "and"
[1] "by" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "With"
[1] "of" "the" "United" "States" "requiring"
[1] "that" "the" "United" "States" "could"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "prosperous"
[1] "John Adams, 1800"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States." "No"
[1] "of" "the" "United" "States" "to"
[1] "from" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "called"
[1] "within" "the" "United" "States" "still"
[1] "Thomas Jefferson, 1801"
[1] "of" "the" "United" "States," "and"
[1] "Thomas Jefferson, 1802"
[1] "of" "the" "United" "States," "surrounded"
[1] "Thomas Jefferson, 1803"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States," "intended"
[1] "to" "the" "United" "States" "by"
[1] "to" "the" "United" "States," "reserving"
[1] "of" "the" "United" "States" "has"
[1] "Thomas Jefferson, 1804"
[1] "of" "the" "United" "States:" "<p>"
[1] "within" "the" "United" "States" "have"
[1] "Thomas Jefferson, 1805"
[1] "of" "the" "United" "States:" "<p>"
[1] "Thomas Jefferson, 1806"
[1] "of" "the" "United" "States:" "<p>"
[1] "and" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "a"
[1] "with" "the" "United" "States," "powers"
[1] "against" "the" "United" "States?" "While"
[1] "of" "the" "United" "States," "would"
[1] "of" "the" "United" "States." "These"
[1] "of" "the" "United" "States" "from"
[1] "Thomas Jefferson, 1807"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "was"
[1] "to" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "may"
[1] "Thomas Jefferson, 1808"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "its"
[1] "and" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "their"
[1] "of" "the" "United" "States" "no"
[1] "by" "the" "United" "States" "are"
[1] "of" "the" "United" "States." "On"
[1] "of" "the" "United" "States," "and"
[1] "James Madison, 1809"
[1] "toward" "the" "United" "States" "as"
[1] "of" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States" "would"
[1] "by" "the" "United" "States," "that"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "in"
[1] "toward" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "which" "the" "United" "States" "ought"
[1] "to" "the" "United" "States" "as"
[1] "James Madison, 1810"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States." "It"
[1] "of" "the" "United" "States." "This"
[1] "to" "the" "United" "States" "is"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "with"
[1] "toward" "the" "United" "States," "are"
[1] "to" "the" "United" "States," "had"
[1] "of" "the" "United" "States" "extends,"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States," "prudence"
[1] "calling" "for" "united" "councils" "and"
[1] "James Madison, 1811"
[1] "with" "the" "United" "States." "<p>"
[1] "enemy," "the" "United" "States" "being"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "toward"
[1] "to" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "nation," "the" "United" "States" "have"
[1] "into" "the" "United" "States." "<p>"
[1] "toward" "the" "United" "States," "will"
[1] "of" "the" "United" "States" "toward"
[1] "of" "the" "United" "States" "to"
[1] "putting" "the" "United" "States" "into"
[1] "with" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "of"
[1] "James Madison, 1812"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "invariably"
[1] "of" "the" "United" "States" "to"
[1] "affected" "the" "United" "States," "without"
[1] "between" "the" "United" "States" "and"
[1] "in" "the" "United" "States." "It"
[1] "war" "with" "united" "counsels" "and"
[1] "James Madison, 1813"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "from"
[1] "toward" "the" "United" "States," "was"
[1] "by" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "being"
[1] "from" "the" "United" "States," "who"
[1] "against" "the" "United" "States" "within"
[1] "for" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "such"
[1] "to" "the" "United" "States" "than"
[1] "of" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "to"
[1] "James Madison, 1814"
[1] "of" "the" "United" "States" "and"
[1] "with" "the" "United" "States." "<p>"
[1] "James Madison, 1815"
[1] "against" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States," "which"
[1] "against" "the" "United" "States." "Such"
[1] "of" "the" "United" "States;" "but"
[1] "which" "the" "United" "States" "ought"
[1] "relieve" "the" "United" "States" "from"
[1] "forms," "the" "United" "States" "are"
[1] "toward" "the" "United" "States;" "to"
[1] "James Madison, 1816"
[1] "of" "the" "United" "States" "with"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "in"
[1] "regulations" "the" "United" "States" "may"
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States" "lost"
[1] "which" "the" "United" "States" "were"
[1] "that" "the" "United" "States" "preferred"
[1] "of" "the" "United" "States" "preferring"
[1] "<p>" "The" "United" "States," "having"
[1] "into" "the" "United" "States" "through"
[1] "of" "the" "United" "States" "has"
[1] "James Monroe, 1817"
[1] "and" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "and"
[1] "this" "the" "United" "States" "have"
[1] "to" "the" "United" "States." "It"
[1] "conflict" "the" "United" "States" "have"
[1] "by" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "into" "the" "United" "States," "an"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "required"
[1] "which" "the" "United" "States" "are"
[1] "which" "the" "United" "States" "are"
[1] "to" "the" "United" "States," "and,"
[1] "of" "the" "United" "States" "toward"
[1] "within" "the" "United" "States," "the"
[1] "throughout" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "our"
[1] "James Monroe, 1818"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States" "at"
[1] "to" "the" "United" "States" "to"
[1] "from" "the" "United" "States," "have"
[1] "particularly" "the" "United" "States," "while"
[1] "to" "the" "United" "States," "the"
[1] "If" "the" "United" "States," "from"
[1] "to" "the" "United" "States" "an"
[1] "of" "the" "United" "States." "<p>"
[1] "on" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "to"
[1] "against" "the" "United" "States," "could"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States" "in"
[1] "to" "the" "United" "States." "Negotiations"
[1] "to" "the" "United" "States," "have"
[1] "of" "the" "United" "States" "over"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States." "In"
[1] "James Monroe, 1819"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "from"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "this"
[1] "by" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "on"
[1] "with" "the" "United" "States" "affecting"
[1] "of" "the" "United" "States" "who"
[1] "to" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "offered"
[1] "of" "the" "United" "States" "had"
[1] "from" "the" "United" "States" "against"
[1] "to" "the" "United" "States." "How"
[1] "of" "the" "United" "States," "as"
[1] "to" "the" "United" "States" "a"
[1] "of" "the" "United" "States" "which"
[1] "if" "the" "United" "States" "had"
[1] "for" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "at"
[1] "from" "the" "United" "States" "or"
[1] "to" "the" "United" "States." "A"
[1] "of" "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "reserved"
[1] "of" "the" "United" "States" "was"
[1] "from" "the" "United" "States" "after"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States," "and"
[1] "James Monroe, 1820"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States" "heretofore"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "into" "the" "United" "States." "By"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "were"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "at"
[1] "to" "the" "United" "States," "for"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "were"
[1] "James Monroe, 1821"
[1] "into" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "back"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "consist"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "were"
[1] "claim" "the" "United" "States" "could"
[1] "of" "the" "United" "States." "To"
[1] "of" "the" "United" "States," "the"
[1] "to" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States." "But"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "in"
[1] "to" "the" "United" "States" "need"
[1] "to" "the" "United" "States" "by"
[1] "and" "the" "United" "States" "more"
[1] "to" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States." "As"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "relating"
[1] "in" "the" "United" "States," "but"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "and"
[1] "James Monroe, 1822"
[1] "to" "the" "United" "States." "Of"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States," "that"
[1] "of" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "it"
[1] "of" "the" "United" "States" "to"
[1] "abolish" "the" "United" "States" "trading"
[1] "which" "the" "United" "States" "hold"
[1] "of" "the" "United" "States" "in"
[1] "by" "the" "United" "States" "would"
[1] "on" "the" "United" "States" "to"
[1] "throughout" "the" "United" "States." "A"
[1] "<p>" "The" "United" "States" "owe"
[1] "to" "the" "United" "States" "will"
[1] "James Monroe, 1823"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "inhabiting"
[1] "of" "the" "United" "States" "under"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "under"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "accredited"
[1] "by" "the" "United" "States" "from"
[1] "if" "the" "United" "States" "remain"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "of"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "in" "the" "United" "States" "a"
[1] "of" "the" "United" "States" "cherish"
[1] "between" "the" "United" "States" "and"
[1] "toward" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States"
[5] "indispensable"
[1] "than" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "James Monroe, 1824"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "and"
[1] "by" "the" "United" "States," "have"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States," "and"
[1] "sea," "the" "United" "States" "have"
[1] "visit" "the" "United" "States," "with"
[1] "which" "the" "United" "States" "have"
[1] "by" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "then" "the" "United" "States" "have"
[1] "between" "the" "United" "States"
[5] "individually,"
[1] "and" "the" "United" "States," "and"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "is"
[1] "John Quincy Adams, 1825"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "upon"
[1] "by" "the" "United" "States," "has"
[1] "invited" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States," "there"
[1] "from" "the" "United" "States" "after"
[1] "throughout" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "The"
[1] "a" "more" "united" "and" "active"
[1] "throughout" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "for"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States;" "it"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "announced"
[1] "of" "the" "United" "States" "bordered"
[1] "had" "been" "united" "in" "one,"
[1] "continue" "so" "united" "to" "this"
[1] "by" "the" "United" "States" "in"
[1] "of" "the" "United" "States;" "if"
[1] "to" "the" "United" "States," "and"
[1] "John Quincy Adams, 1826"
[1] "Congress," "the" "United" "States" "have"
[1] "of" "the" "United" "States" "upon"
[1] "by" "the" "United" "States" "already"
[1] "and" "the" "United" "States" "have"
[1] "toward" "the" "United" "States" "are"
[1] "which" "the" "United" "States" "have"
[1] "parties," "the" "United" "States" "in"
[1] "of" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "are"
[1] "in" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "in"
[1] "in" "the" "United" "States" "should"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States." "It"
[1] "and" "the" "United" "States" "relations"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "in"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "These"
[1] "of" "the" "United" "States" "coming"
[1] "exports." "The" "United" "States" "opened"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States," "not"
[1] "of" "the" "United" "States" "from"
[1] "as" "the" "United" "States" "did"
[1] "of" "the" "United" "States" "even"
[1] "to" "the" "United" "States" "no"
[1] "other," "deprived" "United" "States" "of"
[1] "of" "the" "United" "States" "or"
[1] "indeed," "deprived" "United" "States" "of"
[1] "to" "the" "United" "States" "of"
[1] "with" "the" "united" "states" "of"
[1] "depression" "to" "United" "States" "was"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "it"
[1] "of" "the" "United" "States" "might"
[1] "of" "the" "United" "States," "to"
[1] "is" "before" "United" "States" "all."
[1] "toward" "the" "United" "States" "constantly"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "provision"
[1] "John Quincy Adams, 1827"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "became"
[1] "of" "the" "United" "States," "had"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States" "either"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "residing"
[1] "of" "the" "United" "States" "to"
[1] "and" "the" "United" "States." "This"
[1] "toward" "the" "United" "States" "so"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "who"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "under"
[1] "to" "the" "United" "States." "This"
[1] "of" "the" "United" "States" "near"
[1] "of" "the" "United" "States" "or"
[1] "men" "of" "United" "States" "troops,"
[1] "of" "the" "United" "States," "for"
[1] "of" "the" "United" "States" "a"
[1] "John Quincy Adams, 1828"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States." "By"
[1] "and" "the" "United" "States," "relying"
[1] "by" "the" "United" "States," "has"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "it"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States," "to"
[1] "by" "the" "United" "States--that" "of"
[1] "with" "the" "United" "Netherlands," "Sweden,"
[1] "by" "the" "United" "States" "had"
[1] "and" "the" "United" "States," "in"
[1] "upon" "the" "United" "States" "alone."
[1] "from" "the" "United" "States," "at"
[1] "with" "the" "United" "Mexican" "States"
[1] "<p>" "The" "United" "States" "of"
[1] "of" "the" "United" "States" "the"
[1] "of" "the" "United" "States," "statements"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "have"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "been"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "requires"
[1] "Andrew Jackson, 1829"
[1] "between" "the" "United" "States" "and"
[1] "left" "the" "United" "States" "render"
[1] "nations," "the" "United" "States" "have"
[1] "of" "the" "United" "States" "from"
[1] "by" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "be"
[1] "against" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "court"
[1] "of" "the" "United" "States." "Either"
[1] "invested" "in" "United" "States" "3%"
[1] "upon" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "in"
[1] "of" "the" "United" "States?" "Could"
[1] "of" "the" "United" "States," "and"
[1] "in" "the" "United" "States" "to"
[1] "from" "the" "United" "States" "than"
[1] "of" "the" "United" "States" "exists"
[1] "of" "the" "United" "States" "will,"
[1] "of" "the" "United" "States" "expires"
[1] "Andrew Jackson, 1830"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States." "But"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "which"
[1] "in" "the" "United" "States" "only,"
[1] "from" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "it"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "every"
[1] "from" "the" "United" "States" "to"
[1] "with" "the" "United" "States." "To"
[1] "of" "the" "United" "States" "resulting"
[1] "from" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "to"
[1] "toward" "the" "United" "States" "have"
[1] "of" "the" "United" "States." "No"
[1] "between" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "could"
[1] "and" "the" "United" "States" "fairly"
[1] "of" "the" "United" "States" "the"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "when"
[1] "to" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "as"
[1] "which" "the" "United" "States" "may"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "requires"
[1] "of" "the" "United" "States" "so"
[1] "of" "the" "United" "States," "though"
[1] "Andrew Jackson, 1831"
[1] "are" "free," "united," "industrious," "and"
[1] "to" "24" "united" "States;" "from"
[1] "of" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "Republics" "of"
[1] "of" "the" "United" "States," "which"
[1] "of" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "as"
[1] "to" "the" "United" "States." "As"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "as"
[1] "Andrew Jackson, 1832"
[1] "of" "the" "United" "States." "Although"
[1] "of" "the" "United" "States" "before"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States," "funded"
[1] "of" "the" "United" "States" "opposition"
[1] "of" "the" "United" "States" "with"
[1] "to" "the" "United" "States" "for"
[1] "the" "whole" "United" "States" "regarded"
[1] "to" "the" "United" "States" "the"
[1] "by" "the" "United" "States" "for"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "remains"
[1] "Andrew Jackson, 1833"
[1] "of" "the" "United" "States" "have"
[1] "nations," "the" "United" "States" "have"
[1] "which" "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "in"
[1] "by" "the" "United" "States," "would"
[1] "of" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "out"
[1] "of" "the" "United" "States" "at"
[1] "to" "the" "United" "States" "by"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "the"
[1] "between" "the" "United" "States" "and"
[1] "that" "the" "United" "States" "may"
[1] "to" "the" "United" "States," "in"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States." "It"
[1] "prosperity" "the" "United" "States" "are"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "whom" "the" "United" "States" "have"
[1] "toward" "the" "United"
[4] "States--assurances" "which"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States" "for"
[1] "to" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "from"
[1] "in" "the" "United" "States," "but"
[1] "of" "the" "United" "States," "funded"
[1] "to" "the" "United" "States." "We"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States." "This"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "Regarding"
[1] "Andrew Jackson, 1834"
[1] "language" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "at"
[1] "with" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States." "The"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "some"
[1] "and" "the" "United" "States," "and"
[1] "them" "when" "united" "under" "one"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "could"
[1] "of" "the" "United" "States" "for"
[1] "to" "the" "United" "States," "who"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "for"
[1] "in" "the" "United" "States)," "to"
[1] "of" "the" "United" "States" "should"
[1] "on" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States" "or"
[1] "of" "the" "United" "States," "which"
[1] "and" "the" "United" "States" "having,"
[1] "to" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "Government"
[1] "and" "the" "United" "States" "thereby"
[1] "with" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "might"
[1] "in" "the" "United" "States," "strongly"
[1] "with" "the" "United" "States." "Her"
[1] "weaken" "that" "united" "sentiment" "in"
[1] "of" "the" "United" "States" "with"
[1] "that" "the" "United" "States" "ought"
[1] "of" "the" "United" "States" "to"
[1] "spare" "the" "United" "States" "the"
[1] "against" "the" "United" "States," "she"
[1] "of" "the" "United" "States." "Created"
[1] "against" "the" "United" "States" "as"
[1] "against" "the" "United" "States" "may"
[1] "of" "the" "United" "States" "that"
[1] "of" "the" "United" "States," "quite"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "If"
[1] "of" "the" "United" "States." "It"
[1] "with" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "Nothing"
[1] "of" "the" "United" "States." "All"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "desire"
[1] "of" "the" "United" "States," "for"
[1] "of" "the" "United" "States," "and,"
[1] "Andrew Jackson, 1835"
[1] "successful" "when" "united" "against" "external"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "presented"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States," "although"
[1] "into" "the" "United" "States" "on"
[1] "of" "the" "United" "States." "<p>"
[1] "Holland" "were" "united" "under" "one"
[1] "to" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States." "Aware"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "where"
[1] "found" "the" "United" "States" "an"
[1] "power" "of" "united" "Europe." "During"
[1] "bayonet," "the" "United" "States" "intermitted"
[1] "of" "the" "United" "States," "in"
[1] "in" "the" "United" "States" "reached"
[1] "of" "the" "United" "States," "having"
[1] "of" "the" "United" "States." "When"
[1] "engagement," "the" "United" "States" "were"
[1] "in" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "that"
[1] "with" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "had"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "imposes"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "in"
[1] "which" "the" "United" "States" "hold"
[1] "of" "the" "United" "States" "that"
[1] "of" "the" "United" "States," "from"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "can"
[1] "of" "the" "United" "States" "rested"
[1] "of" "the" "United" "States" "a"
[1] "of" "the" "United" "States" "indulged"
[1] "of" "the" "United" "States," "which"
[1] "Andrew Jackson, 1836"
[1] "of" "the" "United" "States," "it"
[1] "of" "the" "United" "States" "should"
[1] "to" "the" "United" "States" "that"
[1] "of" "the" "United" "States," "their"
[1] "of" "the" "United" "States," "after"
[1] "of" "the" "United" "States" "in"
[1] "throughout" "the" "United" "States\"" "to"
[1] "of" "the" "United" "States\"." "There"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "that"
[1] "by" "the" "United" "States" "Bank"
[1] "of" "the" "United" "States" "Bank"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States."
[5] "Independently"
[1] "by" "the" "United" "States" "Bank"
[1] "of" "the" "United" "States" "has"
[1] "by" "the" "United" "States" "require"
[1] "only" "the" "United" "States." "Instead"
[1] "to" "the" "United" "States" "the"
[1] "If" "the" "United" "States" "be"
[1] "If" "the" "United" "States" "is"
[1] "to" "the" "United" "States" "all"
[1] "of" "the" "United" "States" "can"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "are" "kept" "united," "should" "be"
[1] "of" "the" "United" "States" "devolving"
[1] "Martin van Buren, 1837"
[1] "which" "the" "United" "States," "under"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States" "must"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "and" "the" "United" "States" "are"
[1] "of" "the" "United" "States." "The"
[1] "and" "the" "United" "States" "which"
[1] "and" "the" "United" "States" "sentiments"
[1] "of" "the" "United" "States" "in"
[1] "in" "the" "United" "States" "previously"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "would"
[1] "both" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "with"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "to"
[1] "required." "The" "United" "States" "in"
[1] "of" "the" "United" "States." "The"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "they"
[1] "throughout" "the" "United" "States" "presents"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "has"
[1] "of" "the" "United" "States" "would"
[1] "of" "the" "United" "States" "cover"
[1] "Martin van Buren, 1838"
[1] "religion" "have" "united" "for" "the"
[1] "by" "a" "united," "sensitive," "and"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "no"
[1] "of" "the" "United" "States" "would"
[1] "which" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "in"
[1] "from" "the" "United" "States." "A"
[1] "of" "the" "United" "States" "toward"
[1] "with" "the" "United" "States," "or"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "requires"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "or"
[1] "from" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "have,"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "This"
[1] "of" "the" "United" "States," "the"
[1] "indemnify" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "from"
[1] "of" "the" "United" "States;" "their"
[1] "by" "the" "United" "States" "of"
[1] "sympathy," "the" "United" "States" "have"
[1] "river." "The" "United" "States" "have"
[1] "to" "the" "United" "States" "than"
[1] "1829," "the" "United" "States" "have"
[1] "by" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "sell"
[1] "toward" "the" "United" "States;" "and"
[1] "Seminoles." "The" "United" "States" "have"
[1] "against" "the" "United" "States," "would"
[1] "of" "the" "United" "States" "within"
[1] "of" "the" "United" "States," "an"
[1] "in" "the" "United" "States" "is"
[1] "of" "the" "United" "States," "on"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States," "held"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States,\"" "passed"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "stationed"
[1] "of" "the" "United" "States" "are,"
[1] "of" "the" "United" "States," "all"
[1] "Martin van Buren, 1839"
[1] "and" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "feel,"
[1] "of" "the" "United" "States" "the"
[1] "of" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "under"
[1] "of" "the" "United" "States." "<p>"
[1] "with" "the" "United" "States." "This"
[1] "of" "the" "United" "States" "which"
[1] "compel" "the" "United" "States" "to"
[1] "Governments" "formerly" "united" "for" "redress."
[1] "with" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "while"
[1] "in" "the" "United" "States." "These"
[1] "of" "the" "United" "States" "subject"
[1] "in" "the" "United" "States," "I"
[1] "of" "the" "United" "State" "Bank"
[1] "by" "the" "united" "and"
[5] "well-directed"
[1] "of" "the" "United" "States." "In"
[1] "Martin van Buren, 1840"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "It"
[1] "between" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "upon"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "may"
[1] "of" "the" "United" "States." "Our"
[1] "than" "the" "United" "States" "have"
[1] "the" "whole" "United" "States." "The"
[1] "of" "the" "United" "States" "that"
[1] "aggregate" "of" "united" "strength" "and"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "directed"
[1] "to" "the" "United" "States" "for"
[1] "John Tyler, 1841"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States," "or"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "than"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "must"
[1] "of" "the" "United" "States;" "but"
[1] "of" "the" "United" "States" "to"
[1] "desirous" "the" "United" "States" "may"
[1] "which" "the" "United" "States" "may"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "failed"
[1] "of" "the" "United" "States" "has"
[1] "<p>" "The" "United" "States" "can"
[1] "from" "the" "United" "States," "we"
[1] "of" "these" "United" "States," "and"
[1] "of" "the" "United" "States" "upon"
[1] "unsatisfied." "The" "United" "States" "have,"
[1] "of" "the" "United" "States," "will"
[1] "the" "late" "United" "States" "Bank"
[1] "of" "the" "United" "States" "its"
[1] "of" "the" "United" "States" "that"
[1] "John Tyler, 1842"
[1] "of" "the" "United" "States:" "<p>"
[1] "institutions" "the" "United" "States" "are"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "with"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "how"
[1] "that" "the" "United" "States" "had"
[1] "therefore," "the" "United" "States" "have"
[1] "of" "the" "United" "States" "commonly"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "under"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States," "who"
[1] "of" "the" "United" "States" "who"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States." "A"
[1] "within" "the" "United" "States" "amounted"
[1] "in" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "Bank"
[1] "John Tyler, 1843"
[1] "of" "the" "United" "States:" "<p>"
[1] "between" "the" "United" "States" "and"
[1] "dispute." "The" "United" "States" "would"
[1] "subject," "the" "United" "States" "have"
[1] "of" "the" "United" "States," "every"
[1] "between" "the" "United" "States" "and"
[1] "including" "the" "United" "States," "was"
[1] "to" "the" "United" "States" "after"
[1] "between" "the" "United" "States" "and"
[1] "27,000,000" "people" "united" "for" "all"
[1] "by" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States)," "should"
[1] "against" "the" "United" "States." "If"
[1] "close." "The" "United" "States" "have"
[1] "of" "the" "United" "States." "We"
[1] "from" "the" "United" "States" "by"
[1] "of" "the" "United" "States;" "that"
[1] "of" "the" "United" "States," "speak"
[1] "becomes" "the" "United" "States," "as"
[1] "hostilities." "These" "United" "States" "threw"
[1] "independence" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "a"
[1] "to" "the" "United" "States." "All"
[1] "in" "the" "United" "States." "<p>"
[1] "from" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "apart"
[1] "the" "late" "United" "States" "Bank,"
[1] "of" "the" "United" "States." "While"
[1] "of" "the" "United" "States" "and"
[1] "John Tyler, 1844"
[1] "of" "the" "United" "States:" "<p>"
[1] "to" "the" "united" "power" "of"
[1] "safety." "The" "United" "States" "are"
[1] "of" "the" "United" "States." "Amongst"
[1] "of" "the" "United" "States" "more"
[1] "than" "the" "United" "States." "She"
[1] "between" "the" "United" "States" "and"
[1] "causes." "The" "United" "States"
[5] "commissioner,"
[1] "of" "the" "United" "States" "on"
[1] "in" "the" "United" "States," "was"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "is"
[1] "to" "the" "United" "States" "without"
[1] "of" "the" "United" "States" "against"
[1] "ceased." "The" "United" "States" "have"
[1] "to" "the" "United" "States." "This"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "envoy"
[1] "from" "the" "United" "States" "under"
[1] "to" "the" "United" "States," "and"
[1] "from" "the" "United" "States," "will"
[1] "between" "the" "United" "States" "and"
[1] "against" "the" "United" "States" "in"
[1] "and" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "would"
[1] "in" "the" "United" "States." "However"
[1] "treaty" "the" "United" "States" "assumed"
[1] "between" "the" "United" "States," "Texas,"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "acting"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "where"
[1] "that" "the" "United" "States" "is"
[1] "becomes" "the" "United" "States," "therefore,"
[1] "James Polk, 1845"
[1] "to" "the" "United" "States,\"" "my"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "in"
[1] "by" "the" "United" "States" "having"
[1] "of" "the" "United" "States," "which"
[1] "to" "the" "United" "States." "We"
[1] "she" "has" "united" "her" "\"lone"
[1] "to" "the" "United" "States" "made"
[1] "to" "the" "United" "States,\"" "which"
[1] "of" "the" "United" "States" "did"
[1] "to" "the" "United" "States." "Thus,"
[1] "toward" "the" "United" "States--has" "been"
[1] "on" "the" "United" "States," "either"
[1] "by" "the" "United" "States" "were"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "through"
[1] "of" "the" "United" "States" "declared"
[1] "of" "the" "United" "States," "independent"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States" "toward"
[1] "by" "the" "United" "States" "with"
[1] "by" "the" "United" "States" "had"
[1] "enlisted." "The" "United" "States" "were"
[1] "from" "the" "United" "States." "With"
[1] "by" "the" "United" "States" "to"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "appointed"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "a"
[1] "to" "the" "United" "States" "any"
[1] "by" "the" "United" "States" "for"
[1] "that" "the" "United" "States" "would"
[1] "which" "the" "United" "States" "ought"
[1] "of" "the" "United" "States," "and"
[1] "by" "the" "United" "States." "Under"
[1] "to" "the" "United" "States," "they"
[1] "and" "the" "United" "States." "An"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "is"
[1] "to" "the" "United" "States" "north"
[1] "by" "the" "United" "States" "without"
[1] "advancement." "The" "United" "States," "sincerely"
[1] "of" "the" "United" "States" "can"
[1] "to" "the" "United" "States." "We"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "from" "the" "United" "States" "or"
[1] "of" "the" "United" "States" "from"
[1] "to" "the" "United" "States" "from"
[1] "in" "the" "United" "States" "from"
[1] "into" "the" "United" "States," "whether"
[1] "into" "the" "United" "States" "of"
[1] "into" "the" "United" "States," "and"
[1] "against" "the" "United" "States," "which"
[1] "of" "the" "United" "States," "acting"
[1] "of" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "does"
[1] "in" "the" "United" "States" "ship"
[1] "to" "the" "United" "States" "early"
[1] "to" "the" "United" "States" "his"
[1] "of" "the" "United" "States" "it"
[1] "of" "the" "United" "States\"" "and"
[1] "of" "the" "United" "States" "proved"
[1] "of" "the" "United" "States" "or"
[1] "of" "the" "United" "States" "continuing"
[1] "of" "the" "United" "States" "is"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "are"
[1] "and" "the" "United" "States." "An"
[1] "of" "the" "United" "States," "and"
[1] "against" "the" "United" "States" "for"
[1] "James Polk, 1846"
[1] "of" "the" "United" "States" "with"
[1] "by" "the" "United" "States." "On"
[1] "had" "the" "United" "States" "resorted"
[1] "which" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "made"
[1] "of" "the" "United" "States," "independent"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "by"
[1] "Had" "the" "United" "States" "at"
[1] "by" "the" "United" "States" "can"
[1] "by" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "of"
[1] "abused," "the" "United" "States" "promptly"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "against"
[1] "against" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "with"
[1] "toward" "the" "United" "States." "It"
[1] "while" "the" "United" "States," "anxious"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "against"
[1] "to" "the" "United" "States" "constituted"
[1] "to" "the" "United" "States" "by"
[1] "1819" "the" "United" "States," "by"
[1] "and" "Coahuila" "united" "and" "formed"
[1] "other" "Mexican" "United" "States" "and"
[1] "including" "the" "United" "States," "were"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "or"
[1] "1837" "the" "United" "States" "have"
[1] "that" "the" "United" "States" "do"
[1] "to" "the" "United" "States" "to"
[1] "unless" "the" "United" "States," "having"
[1] "against" "the" "United" "States." "Texas"
[1] "by" "the" "United" "States," "but"
[1] "by" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "bore"
[1] "to" "the" "United" "States" "was"
[1] "against" "the" "United" "States" "that"
[1] "to" "the" "United" "States" "by"
[1] "to" "the" "United" "States" "by"
[1] "that" "the" "United" "States" "have"
[1] "Spain," "the" "United" "States" "asserted"
[1] "of" "the" "United" "States" "with"
[1] "by" "the" "United" "States.\"" "He"
[1] "from" "the" "United" "States," "of"
[1] "within" "the" "United" "States," "who"
[1] "of" "the" "United" "States," "in"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "proposing"
[1] "to" "the" "United" "States" "proposed"
[1] "of" "the" "United" "States" "understood"
[1] "of" "the" "United" "States," "he"
[1] "with" "the" "United" "States" "was"
[1] "by" "the" "United" "States" "were"
[1] "by" "the" "United" "States" "the"
[1] "by" "the" "United" "States" "into"
[1] "against" "the" "United" "States," "denounced"
[1] "with" "the" "United" "States" "were"
[1] "with" "the" "United" "States" "was"
[1] "<p>" "The" "United" "States" "never"
[1] "to" "the" "United" "States." "At"
[1] "to" "the" "United" "States," "which"
[1] "to" "the" "United" "States" "upon"
[1] "to" "the" "United" "States" "had"
[1] "to" "the" "United" "States" "had"
[1] "with" "the" "United" "States," "and"
[1] "from" "the" "United" "States" "intrusted"
[1] "of" "the" "United" "States" "at"
[1] "from" "the" "United" "States," "alleging"
[1] "with" "the" "United" "States," "to"
[1] "enable" "the" "United" "States" "to"
[1] "to" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States," "yet,"
[1] "to" "the" "United" "States." "<p>"
[1] "against" "the" "United" "States" "and"
[1] "against" "the" "United" "States" "was"
[1] "to" "the" "United" "States." "Any"
[1] "by" "the" "United" "States." "My"
[1] "as" "the" "United" "States" "were"
[1] "with" "the" "United" "States," "and"
[1] "with" "the" "United" "States." "Paredes"
[1] "of" "the" "United" "States," "with"
[1] "against" "the" "United" "States" "the"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "and"
[1] "against" "the" "United" "States." "From"
[1] "whilst" "the" "United" "States" "will"
[1] "against" "the" "United" "States." "I"
[1] "by" "the" "United" "States," "Great"
[1] "in" "the" "United" "States" "whenever"
[1] "in" "the" "United" "States" "for"
[1] "food," "the" "United" "States" "should"
[1] "and" "the" "United" "States" "new"
[1] "country." "The" "United" "States" "can"
[1] "of" "the" "United" "States" "at"
[1] "than" "the" "United" "States," "for"
[1] "by" "the" "United" "States" "acting"
[1] "of" "the" "United" "States" "for"
[1] "by" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "over"
[1] "James Polk, 1847"
[1] "which" "the" "United" "States" "were"
[1] "Though" "the" "United" "States" "were"
[1] "and" "the" "United" "States.\"" "This"
[1] "by" "the" "United" "States" "consistently"
[1] "of" "the" "United" "States" "to"
[1] "subject" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "took"
[1] "by" "the" "United" "States" "was"
[1] "reimburse" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "of"
[1] "treaty," "the" "United" "States" "should"
[1] "this" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States;" "and"
[1] "by" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "was"
[1] "to" "the" "United" "States" "of"
[1] "to" "the" "United" "States" "of"
[1] "that" "the" "United" "States" "were"
[1] "required" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "the"
[1] "to" "the" "United" "States," "for"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States," "it"
[1] "moment" "the" "United" "States" "shall"
[1] "that" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "and"
[1] "by" "the" "United" "States" "would"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States." "Numerous"
[1] "of" "the" "United" "States." "At"
[1] "by" "the" "United" "States," "we"
[1] "of" "the" "United" "States" "was"
[1] "by" "the" "United" "States," "the"
[1] "by" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "should"
[1] "Republic." "The" "United" "States" "were"
[1] "of" "the" "United" "States" "to"
[1] "with" "the" "United" "States," "but"
[1] "with" "the" "United" "States." "Besides,"
[1] "in" "the" "United" "States" "on"
[1] "to" "the" "United" "States," "and"
[1] "to" "the" "United" "States" "will"
[1] "and" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "early"
[1] "of" "the" "United" "States" "lying"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States." "Good"
[1] "in" "the" "United" "States" "has"
[1] "in" "the" "United" "States," "and"
[1] "into" "the" "United" "States" "during"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States." "They"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "who"
[1] "for" "the" "United" "States." "Some"
[1] "become" "more" "united" "and" "contented"
[1] "and" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "mail"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States" "coastwise"
[1] "to" "the" "United" "States," "while"
[1] "in" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "at"
[1] "James Polk, 1848"
[1] "causes," "the" "United" "States," "with"
[1] "of" "the" "United" "States" "hailed"
[1] "of" "the" "United" "States" "to"
[1] "by" "the" "United" "States" "before"
[1] "by" "the" "United" "States" "before"
[1] "acquisitions," "the" "United" "States"
[5] "are"
[1] "of" "the" "United" "States" "around"
[1] "of" "the" "United" "States," "not"
[1] "to" "the" "United" "States." "Texas,"
[1] "by" "the" "United" "States," "it"
[1] "of" "the" "United" "States" "be"
[1] "of" "the" "United" "States" "at"
[1] "with" "the" "United" "States" "in"
[1] "to" "the" "United" "States," "all"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States," "it"
[1] "of" "the" "United" "States," "or,"
[1] "which" "the" "United" "States" "assume"
[1] "of" "the" "United" "States." "It"
[1] "by" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "amounting"
[1] "of" "the" "United" "States" "be"
[1] "to" "the" "United" "States." "This"
[1] "to" "the" "United" "States," "and"
[1] "of" "the" "United" "States." "Considerable"
[1] "of" "the" "United" "States." "As"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "that"
[1] "adopted" "which," "united" "and" "combined,"
[1] "in" "the" "United" "States" "upon"
[1] "in" "the" "United" "States" "a"
[1] "in" "the" "United" "States" "was"
[1] "of" "States," "united" "together" "for"
[1] "of" "the" "United" "States," "though"
[1] "of" "the" "United" "States." "If"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "would"
[1] "of" "the" "United" "States." "This"
[1] "of" "the" "United" "States" "or"
[1] "of" "the" "United" "States." "We"
[1] "of" "the" "United" "States" "is"
[1] "Zachary Taylor, 1849"
[1] "of" "the" "United" "States" "again"
[1] "and" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "within" "the" "United" "States" "against"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "and,"
[1] "of" "the" "United" "States," "civil"
[1] "Magyars." "The" "United" "States" "did"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "I"
[1] "transporting" "the" "United" "States" "mail"
[1] "of" "the" "United" "States" "on"
[1] "States." "The" "United" "States" "stand"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "at"
[1] "to" "the" "United" "States" "for"
[1] "in" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "mails"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "within"
[1] "of" "the" "United" "States," "which"
[1] "of" "the" "United" "States," "will"
[1] "Millard Fillmore, 1850"
[1] "of" "the" "United" "States" "claim"
[1] "in" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "is"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "who"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "desires"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "that"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "will"
[1] "in" "the" "United" "States" "(not"
[1] "in" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "and,"
[1] "against" "the" "United" "States;" "and"
[1] "to" "the" "united" "Government" "under"
[1] "Millard Fillmore, 1851"
[1] "in" "the" "United" "States," "who"
[1] "of" "the" "United" "States." "On"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States." "Its"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "engaged"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States." "These"
[1] "of" "the" "United" "States," "it"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States," "begin,"
[1] "whom" "the" "United" "States" "are"
[1] "nonintervention," "the" "United" "States"
[5] "have"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "or"
[1] "which" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "wherever"
[1] "than" "the" "United" "States." "Our"
[1] "of" "the" "United" "States" "residing"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "Your"
[1] "of" "the" "United" "States" "against"
[1] "France" "is" "united" "by" "sentiments"
[1] "to" "the" "United" "States." "On"
[1] "of" "the" "United" "States" "steam"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "have"
[1] "and" "the" "United" "States" "it"
[1] "from" "the" "United" "States" "had"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "as"
[1] "that" "the" "United" "States" "can"
[1] "<p>" "The" "United" "States" "shall"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "releases"
[1] "against" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "on"
[1] "between" "the" "United" "States" "and"
[1] "within" "the" "United" "States" "was"
[1] "within" "the" "United" "States," "excluding"
[1] "in" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States," "arranging"
[1] "against" "the" "United" "States." "Justice"
[1] "of" "the" "United" "States." "<p>"
[1] "throughout" "the" "United" "States," "or"
[1] "Millard Fillmore, 1852"
[1] "of" "the" "United" "States" "and"
[1] "this," "the" "United" "States" "have,"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "that" "the" "United" "States" "entertain"
[1] "and" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "who"
[1] "of" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "which"
[1] "to" "the" "United" "States," "that"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States," "whose"
[1] "of" "the" "United" "States" "are"
[1] "to" "the" "United" "States," "but,"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "a"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "farther"
[1] "collisions" "the" "United" "States" "have"
[1] "in" "the" "United" "States;" "to"
[1] "of" "the" "United" "States" "by"
[1] "against" "the" "United" "States." "I"
[1] "come," "the" "United" "States" "have"
[1] "Franklin Pierce, 1853"
[1] "treaty." "The" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "against" "the" "United" "States," "organized"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "within" "the" "United" "States" "against"
[1] "with" "the" "United" "States," "is"
[1] "of" "the" "United" "States." "After"
[1] "with" "the" "United" "States" "ship"
[1] "of" "the" "United" "States" "and"
[1] "in" "the" "United" "States." "The"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "will,"
[1] "with" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "employed"
[1] "of" "the" "United" "States," "whose"
[1] "and" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "has"
[1] "<p>" "The" "United" "States" "have"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "is"
[1] "to" "the" "United" "States," "has"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "As" "their" "united" "valor" "was"
[1] "so" "their" "united" "wisdom" "proved"
[1] "of" "their" "united" "efforts" "nor"
[1] "of" "the" "United" "States" "has"
[1] "Franklin Pierce, 1854"
[1] "law" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "being"
[1] "of" "the" "United" "States." "This"
[1] "of" "the" "United" "States" "a"
[1] "and" "the" "United" "States" "providing"
[1] "which" "the" "United" "States" "would"
[1] "of" "the" "United" "States." "The"
[1] "and" "the" "United" "States," "without"
[1] "privateers," "the" "United" "States" "will"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "of"
[1] "to" "the" "United" "States," "which"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "mentioned"
[1] "into" "the" "United" "States," "a"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "into" "the" "United" "States" "district"
[1] "of" "the" "United" "States," "and"
[1] "and" "the" "United" "States." "There"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "for"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "by"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "for"
[1] "of" "the" "United" "States" "interested"
[1] "to" "the" "United" "States," "for"
[1] "which" "the" "United" "States" "or"
[1] "toward" "the" "United" "States." "The"
[1] "of" "the" "United" "States;" "and"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States." "From"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "are,"
[1] "in" "the" "United" "States," "stimulated,"
[1] "in" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "requires"
[1] "the" "thirteen" "united" "colonies," "in"
[1] "of" "the" "United" "States" "of"
[1] "of" "these" "United" "States." ""
[1] "Franklin Pierce, 1855"
[1] "of" "the" "United" "States" "provides"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "or" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "that"
[1] "with" "the" "United" "States" "as"
[1] "to" "the" "United" "States." "<p>"
[1] "with" "the" "United" "States" "as"
[1] "for" "the" "United" "States" "to"
[1] "by" "the" "United" "States." "The"
[1] "America." "The" "United" "States" "can"
[1] "of" "the" "United" "States," "still"
[1] "of" "the" "United" "States," "yet"
[1] "between" "the" "United" "States" "and"
[1] "from" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "national," "the" "United" "States" "will"
[1] "of" "the" "United" "States" "do"
[1] "within" "the" "United" "States" "a"
[1] "which" "the" "United" "States" "are"
[1] "of" "the" "United" "States," "enlist"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States," "no"
[1] "in" "the" "United" "States," "nor"
[1] "within" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "In"
[1] "in" "the" "United" "States" "not"
[1] "in" "the" "United" "States." "The"
[1] "of" "the" "United" "States," "including"
[1] "to" "the" "United" "States," "which"
[1] "with" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "passed"
[1] "and" "the" "United" "States" "whereby"
[1] "engage" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "that" "the" "United" "States" "ought"
[1] "them" "the" "United" "States," "although"
[1] "including" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "so"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "who"
[1] "on" "the" "United" "States." "Thus"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "In"
[1] "America," "these" "United" "States" "are"
[1] "disenthrall" "the" "united" "colonies" "from"
[1] "of" "the" "United" "States" "is"
[1] "no" "longer" "united," "friendly" "States,"
[1] "of" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States," "it"
[1] "of" "the" "United" "States," "with"
[1] "to" "the" "United" "States" "of"
[1] "which" "the" "United" "States" "transferred"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States." "Subsequently"
[1] "Texas" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States.\"" "<p>"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "be"
[1] "in" "the" "United" "States" "as"
[1] "Franklin Pierce, 1856"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "Their"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "as"
[1] "in" "these" "United" "States" "mere"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States,"
[5] "representatives"
[1] "to" "the" "United" "States," "and"
[1] "by" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States;" "and"
[1] "by" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States," "if"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States."
[5] "Revolutionary"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "where,"
[1] "in" "the" "United" "States" "rests"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "as"
[1] "<p>" "The" "United" "States" "continue"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "not"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "the"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "with" "the" "United" "States." "This"
[1] "with" "the" "United" "States" "may"
[1] "of" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States," "this"
[1] "of" "the" "United" "States." "But"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States." "The"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "would"
[1] "by" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "who"
[1] "of" "the" "United" "States" "have,"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "only,"
[1] "of" "the" "United" "States." "<p>"
[1] "which" "the" "United" "States" "now"
[1] "of" "these" "United" "States" "the"
[1] "of" "the" "United" "States." "<p>"
[1] "James Buchanan, 1857"
[1] "and" "our" "united" "prayers" "ought"
[1] "amount" "of" "United" "States" "or"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "abundantly"
[1] "of" "the" "United" "States" "would"
[1] "of" "the" "United" "States" "would"
[1] "throughout" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "we"
[1] "of" "the" "United" "States" "of"
[1] "in" "the" "United" "States" "the"
[1] "in" "the" "United" "States" "was"
[1] "had" "the" "United" "States" "ratified"
[1] "in" "the" "United" "States," "the"
[1] "with" "the" "United" "States," "similar"
[1] "if" "the" "United" "States" "would"
[1] "and" "the" "United" "States," "mutually"
[1] "of" "the" "United" "States" "upon"
[1] "with" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "are"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "left" "the" "United" "States" "for"
[1] "pass." "The" "United" "States" "are"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States,\"" "and"
[1] "from" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "steam," "the" "United" "States" "steamer"
[1] "of" "the" "United" "States" "also"
[1] "were" "cordially" "united" "upon" "the"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States," "judicial"
[1] "of" "the" "United" "States," "become"
[1] "against" "the" "United" "States." "Unless"
[1] "against" "the" "United" "States." "This,"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "when"
[1] "that" "\"the" "United" "States" "shall"
[1] "James Buchanan, 1858"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States.\"" "It"
[1] "of" "the" "United" "States.\"" "The"
[1] "of" "the" "United" "States." "On"
[1] "of" "the" "United" "States?" "<p>"
[1] "of" "the" "United" "States" "troops"
[1] "of" "the" "United" "States" "troops"
[1] "of" "the" "United" "States," "Messrs."
[1] "against" "the" "United" "States," "and"
[1] "against" "the" "United" "States" "that"
[1] "of" "the" "United" "States." "A"
[1] "against" "the" "United" "States" "which"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "upon"
[1] "to" "the" "United" "States" "that"
[1] "invited" "the" "United" "States" "to"
[1] "and" "the" "United" "States" "arising"
[1] "by" "the" "United" "States," "with"
[1] "of" "the" "United" "States." "Instead"
[1] "between" "the" "United" "States" "and"
[1] "that" "the" "United" "States" "have"
[1] "to" "the" "United" "States," "its"
[1] "to" "the" "United" "States." "Jealous"
[1] "until" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "mail"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States," "restraining"
[1] "of" "the" "United" "States." "And"
[1] "To" "the" "United" "States" "these"
[1] "of" "the" "United" "States" "expect"
[1] "These" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "Since"
[1] "to" "the" "United" "States," "but"
[1] "authorizing" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "route," "the" "United" "States," "by"
[1] "of" "the" "United" "States" "a"
[1] "to" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "not"
[1] "of" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "transported"
[1] "that" "the" "United" "States" "would"
[1] "by" "the" "United" "States." "At"
[1] "in" "the" "United" "States." "Whilst"
[1] "in" "the" "United" "States." "This"
[1] "between" "the" "United" "States" "and"
[1] "on" "the" "United" "States" "steamer"
[1] "against" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "because"
[1] "of" "the" "United" "States," "could"
[1] "in" "the" "United" "States" "whether"
[1] "of" "the" "United" "States" "mail"
[1] "should" "be" "united" "by" "a"
[1] "of" "the" "United" "States" "brig"
[1] "of" "the" "United" "States" "Navy,"
[1] "of" "the" "United" "States" "marshal"
[1] "board" "the" "United" "States" "steamer"
[1] "of" "the" "United" "States," "pursuant"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "as"
[1] "commanders" "of" "United" "States" "armed"
[1] "of" "the" "United" "States" "and"
[1] "James Buchanan, 1859"
[1] "tranquil," "prosperous," "united," "and" "powerful."
[1] "of" "the" "United" "States" "of"
[1] "into" "the" "United" "States" "except"
[1] "of" "the" "United" "States" "who"
[1] "into" "the" "United" "States" "was"
[1] "into" "the" "United" "States." "This"
[1] "of" "the" "United" "States," "Great"
[1] "left" "the" "United" "States" "for"
[1] "toward" "the" "United" "States." "It"
[1] "of" "the" "United" "States." "Our"
[1] "of" "the" "United" "States.\"" "<p>"
[1] "\"through" "the" "United" "States" "inspector"
[1] "of" "the" "United" "States" "forces"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "suspended"
[1] "to" "the" "United" "States." "This"
[1] "of" "the" "United" "States." "<p>"
[1] "toward" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "was"
[1] "of" "the" "United" "States,\"" "wrote"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States." "Unless"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "must"
[1] "Can" "the" "United" "States" "especially,"
[1] "on" "the" "United" "States" "steamer"
[1] "against" "the" "United" "States," "which"
[1] "that" "\"the" "United" "States" "shall"
[1] "of" "our" "united," "free," "and"
[1] "James Buchanan, 1860"
[1] "of" "the" "United" "States" "solemnly"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States," "created"
[1] "of" "the" "United" "States," "having"
[1] "to" "the" "United" "States." "And--"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States," "shall"
[1] "of" "the" "United" "States," "all"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "In"
[1] "to" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "to"
[1] "overcome" "a" "united" "opposition" "in"
[1] "of" "the" "United" "States" "in"
[1] "expel" "the" "United" "States" "from"
[1] "for" "the" "United" "States" "formed"
[1] "of" "the" "United" "States." "This"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "still"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "has"
[1] "and" "the" "United" "States" "the"
[1] "or" "the" "United" "States." "These"
[1] "of" "the" "United" "States" "against"
[1] "against" "the" "United" "States," "including"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "upon"
[1] "to" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "toward"
[1] "of" "the" "United" "States." "There"
[1] "between" "the" "United" "States" "of"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "its"
[1] "of" "the" "United" "States," "two"
[1] "into" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "My"
[1] "saved" "the" "United" "States" "public"
[1] "Abraham Lincoln, 1861"
[1] "of" "the" "United" "States" "who"
[1] "by" "the" "United" "States" "steamer"
[1] "make" "of" "United" "States" "vessels"
[1] "of" "the" "United" "States" "appointed"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "at"
[1] "on" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "could"
[1] "Abraham Lincoln, 1862"
[1] "of" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "or"
[1] "from" "the" "United" "States." "<p>"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "connecting" "the" "United" "States" "with"
[1] "of" "the" "United" "States," "with"
[1] "issues" "of" "United" "States" "notes"
[1] "circulation" "of" "United" "States" "notes"
[1] "security" "of" "United" "States" "bonds"
[1] "compensate" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "were"
[1] "with" "the" "United" "States." "He"
[1] "that" "the" "United" "States" "neglected"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "is"
[1] "for" "one" "united" "people." "<p>"
[1] "by" "the" "United"
[4] "States--certainly" "more"
[1] "of" "the" "United" "States:" "Resolved"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States," "all"
[1] "from" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States" "bearing"
[1] "of" "the" "United" "States," "said"
[1] "to" "the" "United" "States" "the"
[1] "without" "the" "United" "States." "I"
[1] "to" "a" "united" "and" "earnest"
[1] "Abraham Lincoln, 1863"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "has"
[1] "from" "the" "United" "States" "of"
[1] "and" "of" "United" "States" "citizens"
[1] "in" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "they"
[1] "of" "the" "United" "States" "residing"
[1] "of" "the" "United" "States," "under"
[1] "to" "the" "United" "States" "if"
[1] "of" "the" "United" "States." "As"
[1] "of" "the" "United" "States," "we"
[1] "of" "the" "United" "States" "upon"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "derived"
[1] "in" "the" "United" "States," "is"
[1] "indicated." "The" "United" "States," "I"
[1] "of" "the" "United" "States" "consists"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States" "military"
[1] "by" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "Abraham Lincoln, 1864"
[1] "which" "the" "United" "States" "of"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States" "are"
[1] "in" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "by"
[1] "toward" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States," "to"
[1] "in" "the" "United" "States." "If"
[1] "of" "the" "United" "States," "destitute,"
[1] "of" "the" "United" "States," "which"
[1] "of" "the" "United" "States," "as"
[1] "Britain," "the" "United" "States" "must"
[1] "through" "the" "United" "States," "as"
[1] "toward" "the" "United" "States," "but,"
[1] "in" "the" "United" "States" "no"
[1] "throughout" "the" "United" "States" "passed"
[1] "Andrew Johnson, 1865"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States," "is"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States,\"" "and"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States," "shall"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States." "At"
[1] "of" "the" "United" "States\"" "ordained"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "endures,"
[1] "itself." "The" "United" "States" "had"
[1] "of" "the" "United" "States." "At"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "may"
[1] "of" "the" "United" "States" "may"
[1] "to" "the" "United" "States," "to"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "and"
[1] "more" "a" "united" "people," "renewed"
[1] "of" "the" "United" "States" "within"
[1] "of" "the" "United" "States" "would"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "instructed"
[1] "of" "the" "United" "States" "recognizes"
[1] "of" "the" "United" "States" "\"the"
[1] "of" "the" "United" "States" "must"
[1] "of" "the" "United" "States" "would"
[1] "to" "the" "United" "States" "than"
[1] "of" "the" "United" "States" "we"
[1] "between" "the" "United" "States" "and"
[1] "for" "the" "United" "States" "and"
[1] "<p>" "The" "United" "States" "did"
[1] "revolutions" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "has,"
[1] "of" "the" "United" "States" "was"
[1] "government." "The" "United" "States" "desire"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "delivered"
[1] "spoken;" "the" "United" "States" "have"
[1] "of" "the" "United" "States?" "Where"
[1] "of" "the" "United" "States" "have"
[1] "Andrew Johnson, 1866"
[1] "of" "the" "United" "States" "resumes"
[1] "of" "the" "United" "States." "In"
[1] "prosperous," "and" "united" "people." "<p>"
[1] "of" "the" "United" "States." "Courts"
[1] "within" "the" "United" "States" "or"
[1] "of" "the" "United" "States." "All"
[1] "upon" "the" "United" "States" "by"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "makes"
[1] "of" "the" "United" "States," "inasmuch"
[1] "through" "the" "United" "Kingdom;" "the"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "Repeated"
[1] "of" "the" "United" "States," "Mr."
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "with"
[1] "by" "the" "United" "States" "in"
[1] "however," "the" "United" "States" "had"
[1] "of" "the" "United" "States." "The"
[1] "and" "the" "United" "States" "would"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "arising"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "against"
[1] "from" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "under"
[1] "of" "the" "United" "States" "are"
[1] "in" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States." "Peace"
[1] "Andrew Johnson, 1867"
[1] "against" "the" "United" "States" "can"
[1] "of" "them" "united." "<p>" "This"
[1] "of" "the" "United" "States," "including"
[1] "by" "the" "United" "States," "and"
[1] "in" "the" "United" "States" "from"
[1] "of" "the" "United" "States," "56,"
[1] "with" "the" "United" "Kingdom" "of"
[1] "which" "the" "United" "States" "has"
[1] "nations," "the" "United" "States" "being"
[1] "within" "the" "United" "States." "An"
[1] "of" "the" "United" "States." "I"
[1] "to" "the" "United" "States" "than"
[1] "of" "the" "United" "States." "We"
[1] "by" "the" "United" "States," "neither"
[1] "in" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "absolves"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "This"
[1] "Andrew Johnson, 1868"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "in"
[1] "by" "the" "United" "States," "and"
[1] "in" "the" "United" "States" "from"
[1] "by" "the" "United" "States." "The"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States"
[5] "transatlantic"
[1] "Washburn," "late" "United" "States" "minister"
[1] "to" "the" "United" "States," "the"
[1] "the" "late" "United" "States" "minister,"
[1] "in" "the" "United" "States" "legation"
[1] "reached" "the" "United" "States." "<p>"
[1] "that" "two" "United" "States" "citizens"
[1] "against" "the" "United" "States" "minister."
[1] "commanding" "the" "United" "States" "South"
[1] "of" "the" "United" "States" "citizens"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States," "or"
[1] "of" "the" "United" "States" "who"
[1] "of" "the" "United" "States." "I"
[1] "by" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "of"
[1] "While" "the" "United" "States" "have"
[1] "of" "the" "United" "States." "Chronic"
[1] "into" "the" "United" "States," "would"
[1] "of" "the" "United" "States" "toward"
[1] "that" "the" "United" "States," "being"
[1] "from" "the" "United" "States" "as"
[1] "of" "the" "United" "States," "would"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "against" "the" "United" "States" "by"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "directly"
[1] "Ulysses S. Grant, 1869"
[1] "of" "the" "United" "States," "at"
[1] "As" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "entertain"
[1] "<p>" "The" "United" "States" "have"
[1] "<p>" "The" "United" "States," "in"
[1] "of" "the" "United" "States" "may"
[1] "last" "the" "United" "States" "schooner"
[1] "assured" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "so"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "The"
[1] "and" "the" "United" "States," "which"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States" "by"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "which" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "would"
[1] "between" "the" "United" "States" "and"
[1] "upon" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "and" "the" "United" "States," "with"
[1] "of" "the" "United" "States" "or"
[1] "by" "the" "United" "States" "authorities"
[1] "of" "the" "United" "States" "from"
[1] "of" "the" "United" "States," "as"
[1] "to" "the" "United" "States" "for"
[1] "from" "the" "United" "States," "they"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "whether"
[1] "with" "the" "United" "States" "conventions"
[1] "As" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "it"
[1] "of" "the" "United" "States" "in"
[1] "Ulysses S. Grant, 1870"
[1] "of" "the" "United" "States" "minister"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "forbade"
[1] "whom" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "can"
[1] "in" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "were"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "by"
[1] "there," "the" "United" "States" "only"
[1] "in" "the" "United" "States" "with"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "for"
[1] "and" "the" "United" "States," "to"
[1] "to" "the" "United" "States" "the"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States." "Pursuant"
[1] "give" "the" "United" "States" "all"
[1] "to" "the" "United" "States" "failed"
[1] "that" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "entitle"
[1] "of" "the" "United" "States," "of"
[1] "and" "the" "United" "States" "have"
[1] "by" "the" "United" "States." "<p>"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "This"
[1] "of" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "has"
[1] "by" "the" "United" "States," "so"
[1] "claims" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "during"
[1] "and" "the" "United" "States" "it"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "a"
[1] "of" "the" "United" "States," "with"
[1] "of" "the" "United" "States." "They"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "has"
[1] "by" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "engaged"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "from"
[1] "of" "the" "United" "States" "to"
[1] "agreement." "The" "United" "States" "are"
[1] "to" "the" "United" "States" "the"
[1] "of" "the" "United" "States." "The"
[1] "between" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "than"
[1] "of" "the" "United" "States." "<p>"
[1] "liberality." "The" "United" "States" "should"
[1] "Ulysses S. Grant, 1871"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "called"
[1] "between" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "toward"
[1] "of" "the" "United" "States" "begin"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "toward" "the" "United" "States," "and"
[1] "by" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "I"
[1] "between" "the" "United" "States" "and"
[1] "powers." "The" "United" "States" "have"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States." "It"
[1] "of" "the" "United" "States," "or"
[1] "of" "the" "United" "States," "are"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "its"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "all"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States." "Territorial"
[1] "of" "the" "United" "States." "It"
[1] "Ulysses S. Grant, 1872"
[1] "to" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "appointed"
[1] "of" "the" "United" "States" "before"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States." "He"
[1] "of" "the" "United" "States," "that"
[1] "and" "the" "United" "States" "should"
[1] "of" "the" "United" "States." "<p>"
[1] "confirms" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "as"
[1] "in" "the" "United" "States" "of"
[1] "leave" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "toward"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States;" "Germany,"
[1] "of" "the" "United" "States" "to"
[1] "in" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "or"
[1] "of" "the" "United" "States." "They"
[1] "to" "the" "United" "States," "which,"
[1] "to" "the" "United" "States" "its"
[1] "of" "the" "United" "States" "destitute"
[1] "Ulysses S. Grant, 1873"
[1] "of" "the" "United" "States," "however,"
[1] "of" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States;" "and"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "should"
[1] "against" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "against"
[1] "against" "the" "United" "States." "<p>"
[1] "upon" "the" "United" "States" "arising"
[1] "of" "the" "United" "States" "who"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "respecting"
[1] "of" "the" "United" "States" "reside"
[1] "of" "the" "United" "States," "but"
[1] "in" "the" "United" "States." "<p>"
[1] "within" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States" "have"
[1] "in" "the" "United" "States," "have"
[1] "<p>" "The" "United" "States," "who"
[1] "of" "the" "United" "States" "may"
[1] "of" "the" "United" "States." "On"
[1] "of" "the" "United" "States." "On"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States," "without"
[1] "by" "the" "United" "States" "from"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "in"
[1] "under" "the" "United" "States" "flag"
[1] "bearing" "a" "United" "States" "registry"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "an"
[1] "so" "many" "United" "States" "bonds"
[1] "of" "the" "United" "States" "ocean"
[1] "establishment" "of" "United" "States"
[5] "postal"
[1] "of" "the" "United" "States," "in"
[1] "that" "the" "United" "States" "marshal"
[1] "throughout" "the" "United" "States,\"" "is"
[1] "against" "the" "United" "States" "cognizable"
[1] "Ulysses S. Grant, 1874"
[1] "in" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "with"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "exceptional"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "under"
[1] "against" "the" "United" "States" "arising"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "483"
[1] "against" "the" "United" "States," "726"
[1] "whom" "the" "United" "States" "are"
[1] "of" "the" "United" "States." "Hopes"
[1] "of" "the" "United" "States." "Congress"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "simply"
[1] "naturalization." "The" "United" "States"
[5] "wisely,"
[1] "within" "the" "United" "States" "at"
[1] "which" "the" "United" "States" "was"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "to"
[1] "in" "the" "United" "States" "to"
[1] "prosperity." "The" "United" "States" "is"
[1] "Ulysses S. Grant, 1875"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "which"
[1] "in" "the" "United" "States," "there"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States" "steamer"
[1] "of" "the" "United" "States" "of"
[1] "to" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "more"
[1] "known" "territory," "united" "under" "some"
[1] "judgment" "the" "United" "States" "should"
[1] "history," "the" "United" "States" "should"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "to"
[1] "draw" "the" "United" "States" "into"
[1] "particularly" "the" "United" "States," "continue."
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "thereby"
[1] "even" "the" "United" "States" "post-offices"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "which"
[1] "to" "the" "United" "States." "At"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "but"
[1] "and" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "or"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "under"
[1] "as" "the" "United" "States" "Direct"
[1] "connecting" "the" "United" "States" "directly"
[1] "of" "the" "United" "States" "under"
[1] "in" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "which"
[1] "<p>" "The" "United" "States," "with"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "should"
[1] "within" "the" "United" "States" "at"
[1] "in" "the" "United" "States;" "in"
[1] "in" "the" "United" "States;" "in"
[1] "<p>" "The" "United" "States" "was"
[1] "allegiance," "the" "United" "States" "has"
[1] "of" "the" "United" "States," "either"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "until"
[1] "and" "the" "United" "States" "\"hewers"
[1] "between" "the" "United" "States" "and"
[1] "as" "the" "United" "States," "with"
[1] "of" "the" "United" "States" "for"
[1] "toward" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "for"
[1] "of" "the" "United" "States," "I"
[1] "Ulysses S. Grant, 1876"
[1] "against" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States" "with"
[1] "but" "the" "United" "States" "have"
[1] "toward" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "at"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "under"
[1] "of" "the" "United" "States," "with"
[1] "of" "the" "United" "States," "will"
[1] "of" "the" "United" "States" "the"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "the"
[1] "message." "The" "United" "States" "has"
[1] "States" "has" "united" "with" "the"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "of"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "which"
[1] "of" "the" "United" "States" "against"
[1] "against" "the" "United" "States" "were"
[1] "against" "the" "United" "States," "amounting"
[1] "to" "the" "United" "States," "leaving"
[1] "leaving" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "on"
[1] "in" "the" "United" "States," "the"
[1] "of" "the" "United" "States," "and"
[1] "infrequently." "The" "United" "States"
[5] "has"
[1] "to" "the" "United" "States," "that"
[1] "of" "the" "United" "States," "it"
[1] "of" "the" "United" "States," "either"
[1] "of" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "within"
[1] "of" "the" "United" "States" "upon"
[1] "by" "the" "United" "States." "A"
[1] "to" "the" "United" "States" "to"
[1] "with" "the" "united" "opposition" "of"
[1] "to" "the" "United" "States," "to"
[1] "which" "the" "United" "States" "use"
[1] "in" "the" "United" "States." "A"
[1] "of" "the" "United" "States," "commerce"
[1] "hands" "of" "United" "States" "capitalists."
[1] "Rutherford B. Hayes, 1877"
[1] "severed" "and" "disunited" "as" "they"
[1] "of" "a" "united" "people" "which"
[1] "of" "the" "United" "States" "would"
[1] "If" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "to"
[1] "If" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "of"
[1] "year" "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States" "and"
[1] "and" "the" "United" "States," "ratified"
[1] "of" "the" "United" "States" "at"
[1] "by" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "when"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "under"
[1] "While" "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "in" "the" "United" "States" "has"
[1] "and" "the" "United" "States" "could"
[1] "of" "the" "United" "States" "amounting"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "with"
[1] "Rutherford B. Hayes, 1878"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States"
[5] "commissioners,"
[1] "of" "the" "United" "States" "at"
[1] "view." "The" "United" "States" "Government"
[1] "to" "the" "United" "States." "They"
[1] "of" "the" "United" "States," "with"
[1] "force" "of" "United" "States" "troops"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "shall"
[1] "exchange" "for" "United" "States" "notes"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "thus"
[1] "of" "the" "United" "States;" "but"
[1] "of" "the" "United" "States." "The"
[1] "in" "the" "United" "States" "entitles"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "for"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "may"
[1] "Rutherford B. Hayes, 1879"
[1] "by" "law," "United" "States" "notes"
[1] "exchange" "for" "United" "States" "notes"
[1] "exchanged" "for" "United" "States" "notes"
[1] "amount" "of" "United" "States" "notes"
[1] "by" "the" "United" "States" "further"
[1] "of" "the" "United" "States" "during"
[1] "between" "the" "United" "States" "and"
[1] "circulation" "of" "United" "States" "notes"
[1] "issue" "of" "United" "States" "notes"
[1] "of" "the" "United" "States," "steadily"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "may"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States." "Congress"
[1] "of" "the" "United" "States" "and"
[1] "fishermen." "The" "United" "States" "minister"
[1] "to" "the" "United" "Kingdom." "<p>"
[1] "represent" "the" "United" "States" "at"
[1] "and" "the" "United" "States" "which"
[1] "and" "the" "United" "States." "The"
[1] "and" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "with"
[1] "to" "the" "United" "States." "The"
[1] "Islands," "the" "United" "States" "Government"
[1] "to" "the" "United" "States." "This"
[1] "of" "the" "United" "States," "but"
[1] "of" "the" "United" "States," "and"
[1] "continues." "The" "United" "States" "have"
[1] "of" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "by"
[1] "useful" "to" "United" "States" "vessels."
[1] "to" "the" "United" "States," "provides"
[1] "of" "the" "United" "States" "and"
[1] "as" "the" "United" "States" "may"
[1] "of" "the" "United" "States" "and"
[1] "appeal" "to" "United" "States" "courts"
[1] "of" "the" "United" "States" "failed"
[1] "of" "the" "United" "States" "to"
[1] "by" "the" "United" "States" "than"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States;" "others"
[1] "throughout" "the" "United" "States" "have"
[1] "by" "the" "United" "States" "a"
[1] "of" "the" "United" "States," "who"
[1] "Rutherford B. Hayes, 1880"
[1] "of" "the" "United" "States" "to"
[1] "should" "be" "united" "in" "solid"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States." "Whatever"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "by" "the" "United" "States" "authorities"
[1] "Melbourne," "the" "United" "States" "have"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States,"
[5] "notwithstanding"
[1] "of" "the" "United" "States." "In"
[1] "against" "the" "United" "States" "under"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States," "which"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "of"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States" "have,"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States," "Great"
[1] "of" "the" "United" "States," "through"
[1] "of" "the" "United" "States," "whether"
[1] "Chester A. Arthur, 1881"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States"
[5] "indispensable,"
[1] "which" "the" "United" "States" "covenanted"
[1] "of" "the" "United" "States" "toward"
[1] "of" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "minister"
[1] "of" "the" "United" "States," "conceded"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "consular"
[1] "which" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "thereto,"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States," "they"
[1] "into" "the" "United" "States" "or"
[1] "Chester A. Arthur, 1882"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "an"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "for"
[1] "invited" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "without"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "as"
[1] "between" "the" "United" "States" "and"
[1] "that" "the" "United" "States" "be"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "Such"
[1] "place" "the" "United" "States" "in"
[1] "Chester A. Arthur, 1883"
[1] "of" "the" "United" "States:" "<p>"
[1] "to" "the" "United" "States" "from"
[1] "from" "the" "United" "States" "has"
[1] "to" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "and"
[1] "in" "the" "United" "States," "has"
[1] "As" "the" "United" "States" "have"
[1] "<p>" "The" "United" "States" "are"
[1] "of" "the" "United" "States" "accused"
[1] "valor" "of" "United" "States" "and"
[1] "in" "the" "United" "States." "A"
[1] "which" "the" "United" "States" "are"
[1] "with" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "the"
[1] "valley." "The" "United" "States" "can"
[1] "through" "the" "United" "States," "imposes"
[1] "Chester A. Arthur, 1884"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States." "Of"
[1] "of" "the" "United" "States" "minister"
[1] "Government." "The" "United" "States" "already"
[1] "of" "the" "United" "States." "<p>"
[1] "that" "the" "United" "States" "should"
[1] "cordial." "The" "United" "States" "have"
[1] "by" "the" "United" "States" "of"
[1] "To" "the" "United" "States," "whose"
[1] "to" "the" "United" "States" "a"
[1] "in" "the" "United" "States" "led"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "was"
[1] "except" "the" "United" "States," "and"
[1] "reason" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "be"
[1] "of" "the" "United" "States" "in"
[1] "within" "the" "United" "States" "subject"
[1] "from" "the" "United" "States" "to"
[1] "from" "the" "United" "States." "As"
[1] "to" "the" "United" "States" "of"
[1] "W." "Greely," "United" "States" "Army,"
[1] "of" "the" "United" "States" "I"
[1] "of" "the" "United" "States" "shall"
[1] "for" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "and"
[1] "Grover Cleveland, 1885"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States." "His"
[1] "of" "the" "United" "States" "with"
[1] "from" "the" "United" "States" "indemnity"
[1] "of" "the" "United" "States" "at"
[1] "under" "the" "United" "States" "as"
[1] "of" "the" "United" "States," "and"
[1] "States" "the" "United" "States" "forebore"
[1] "in" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "were"
[1] "could" "the" "United" "States" "assent."
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "of"
[1] "\"what" "the" "United" "States" "want"
[1] "of" "the" "United" "States" "for"
[1] "into" "the" "United" "States," "individual"
[1] "of" "the" "United" "States" "engaged"
[1] "of" "the" "United" "States" "on"
[1] "as" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "attended,"
[1] "making" "the" "United" "States" "appear,"
[1] "of" "the" "United" "States" "therewith"
[1] "powers" "the" "United" "States" "were"
[1] "of" "the" "United" "States," "by"
[1] "from" "the" "United" "States" "to"
[1] "which" "the" "United" "States" "are"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "engaged"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States," "Pelletier"
[1] "in" "the" "United" "States," "was"
[1] "of" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "from" "the" "United" "States" "continues"
[1] "between" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "attended"
[1] "between" "the" "United" "States" "and"
[1] "concur." "The" "United" "States" "must"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "bearing"
[1] "throughout" "the" "United" "States" "now"
[1] "in" "the" "United" "States," "especially"
[1] "of" "the" "United" "States" "within"
[1] "of" "the" "United" "States" "with"
[1] "by" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "from"
[1] "with" "the" "United" "States," "a"
[1] "to" "the" "United" "States" "from"
[1] "of" "the" "United" "States." "A"
[1] "to" "the" "United" "States" "of"
[1] "from" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "are"
[1] "join" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "is"
[1] "of" "the" "United" "States" "is"
[1] "of" "compensating" "United" "States" "marshals"
[1] "of" "investing" "United" "States"
[5] "commissioners"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States.\"" "By"
[1] "of" "the" "United" "States,\"" "attached"
[1] "of" "the" "United" "States\"" "that"
[1] "of" "the" "United" "States" "passed"
[1] "of" "the" "United" "States" "to"
[1] "Grover Cleveland, 1886"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "against"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "fishermen"
[1] "by" "the" "United" "States" "on"
[1] "and" "the" "United" "States" "present"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "should"
[1] "Japan," "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "voluntarily"
[1] "from" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "and"
[1] "and" "the" "United" "States--whose"
[5] "relations"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "in"
[1] "from" "the" "United" "States" "or"
[1] "in" "the" "United" "States." "It"
[1] "between" "the" "United" "States" "and"
[1] "from" "the" "United" "States" "to"
[1] "withdrawal" "of" "United" "States" "Treasury"
[1] "in" "the" "United" "States" "courts"
[1] "of" "the" "United" "States," "aside"
[1] "in" "the" "United" "States" "of"
[1] "in" "the" "United" "States" "courts,"
[1] "Congressional" "action." "United" "States"
[5] "prisoners"
[1] "must" "be" "United" "States" "prisoners,"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "it"
[1] "of" "the" "United" "States." "These"
[1] "Grover Cleveland, 1887"
[1] "of" "the" "United" "States:" "<p>"
[1] "Grover Cleveland, 1888"
[1] "of" "the" "United" "States:" "<p>"
[1] "confinement" "of" "United" "States" "convicts,"
[1] "of" "the" "United" "States--the" "soldier"
[1] "to" "come" "united," "prosperous," "and"
[1] "finds" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "relating"
[1] "and" "the" "United" "States," "including"
[1] "by" "the" "United" "States"
[5] "consul-general"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "renders"
[1] "which" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "under"
[1] "to" "the" "United" "States," "they"
[1] "in" "the" "United" "States" "would"
[1] "of" "the" "United" "States," "at"
[1] "of" "the" "United" "States." "<p>"
[1] "Benjamin Harrison, 1889"
[1] "Government." "The" "United" "States," "on"
[1] "of" "the" "United" "States," "Germany,"
[1] "and" "the" "United" "States" "are"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States," "their"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States." "Our"
[1] "$14,073,787" "in" "United" "States" "notes,"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States," "at"
[1] "a" "deputy" "United" "States" "marshal"
[1] "in" "the" "United" "States" "courts."
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "The"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "Army,"
[1] "to" "the" "United" "States" "about"
[1] "to" "the" "United" "States" "of"
[1] "themselves." "The" "United" "States" "has"
[1] "by" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "to"
[1] "by" "the" "United" "States" "from"
[1] "to" "the" "United" "States" "of"
[1] "by" "the" "United" "States" "for"
[1] "or" "the" "United" "States" "courts"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "during"
[1] "of" "the" "United" "States," "that"
[1] "of" "the" "United" "States." "No"
[1] "Benjamin Harrison, 1890"
[1] "1884." "The" "United" "States," "not"
[1] "of" "the" "United" "States" "were"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "a"
[1] "of" "the" "United" "States" "was"
[1] "from" "the" "United" "States" "minister."
[1] "of" "the" "United" "States" "of"
[1] "to" "the" "United" "States" "on"
[1] "of" "the" "United" "States," "Germany,"
[1] "to" "the" "United" "States" "a"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "for"
[1] "between" "the" "United" "States" "and"
[1] "Government," "the" "United" "States" "should"
[1] "of" "the" "United" "States," "Great"
[1] "of" "the" "United" "States" "are"
[1] "and" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "while"
[1] "offenses" "against" "United" "States" "officers."
[1] "of" "the" "United" "States," "is"
[1] "to" "the" "United" "States" "of"
[1] "of" "the" "United" "States." "But"
[1] "of" "the" "United" "States" "under"
[1] "are" "of" "United" "States" "registry"
[1] "sea" "and" "United" "States" "inland"
[1] "unless" "the" "United" "States" "shall"
[1] "that" "the" "United" "States" "receives"
[1] "of" "the" "United" "States" "with"
[1] "in" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "district"
[1] "lands." "The" "United" "States" "should"
[1] "of" "deputy" "United" "States" "marshals"
[1] "of" "a" "United" "States" "marshal"
[1] "Benjamin Harrison, 1891"
[1] "of" "the" "United" "States" "during"
[1] "and" "the" "United" "States" "wherever"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "placed"
[1] "upon" "the" "United" "States." "The"
[1] "in" "the" "United" "States" "cognizable"
[1] "if" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "court"
[1] "commanding" "the" "United" "States" "naval"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "the"
[1] "of" "the" "United" "States." "A"
[1] "of" "the" "United" "States" "for"
[1] "judgment" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "steamship"
[1] "of" "the" "United" "States," "wearing"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "on"
[1] "to" "the" "United" "States" "to"
[1] "enable" "the" "United" "States" "to"
[1] "in" "the" "United" "States" "afforded"
[1] "with" "the" "United" "States." "Surveys"
[1] "upon" "the" "United" "States" "to"
[1] "to" "the" "United" "States--many" "other"
[1] "to" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States.\"" "<p>"
[1] "of" "the" "United" "States" "Government."
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States." "It"
[1] "in" "the" "United" "States" "court"
[1] "of" "the" "United" "States" "on"
[1] "to" "the" "United" "States" "under"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States," "every"
[1] "from" "the" "United" "States" "amounted"
[1] "of" "the" "United" "States" "increased"
[1] "of" "the" "United" "States" "was"
[1] "to" "the" "United" "States" "has"
[1] "into" "the" "United" "States" "at"
[1] "entered" "the" "United" "States" "from"
[1] "to" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "courts"
[1] "of" "the" "United" "States." "These"
[1] "and" "the" "United" "States," "evidenced"
[1] "that" "the" "United" "States" "will"
[1] "of" "the" "United" "States," "but"
[1] "to" "the" "United" "States" "is"
[1] "of" "the" "United" "States," "no"
[1] "to" "the" "United" "States." "What"
[1] "to" "the" "United" "States" "for"
[1] "to" "the" "United" "States" "was"
[1] "<p>" "The" "United" "States" "should"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "is"
[1] "have" "been" "united" "to" "make"
[1] "of" "the" "United" "States" "adequacy"
[1] "Benjamin Harrison, 1892"
[1] "of" "the" "United" "States" "are"
[1] "in" "the" "United" "States" "in"
[1] "in" "the" "United" "States" "on"
[1] "in" "the" "United" "States" "has"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "the"
[1] "and" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "do"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States" "in"
[1] "to" "the" "United" "States" "as"
[1] "in" "the" "United" "States." "Canadian"
[1] "of" "the" "United" "States" "for"
[1] "into" "the" "United" "States" "from"
[1] "from" "the" "United" "States," "to"
[1] "from" "the" "United" "States" "over"
[1] "of" "the" "United" "States" "to"
[1] "at" "the" "United" "States" "Eastern"
[1] "in" "the" "United" "States" "across"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "that" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "the"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "its"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "where"
[1] "convicted" "in" "United" "States" "courts"
[1] "Rebellion" "the" "United" "States" "has"
[1] "from" "the" "United" "States." "If"
[1] "that" "the" "United" "States" "is"
[1] "to" "the" "United" "States" "of"
[1] "to" "the" "United" "States" "by"
[1] "of" "the" "United" "States." "I"
[1] "from" "the" "United" "States" "must"
[1] "within" "the" "United" "States." "He"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States." "<p>"
[1] "Grover Cleveland, 1893"
[1] "of" "the" "United" "States:" "<p>"
[1] "found" "the" "United" "States" "alert"
[1] "to" "the" "United" "States" "and"
[1] "the" "late" "United" "States" "minister"
[1] "in" "the" "United" "States" "and"
[1] "upon" "the" "United" "States" "minister"
[1] "Africa," "the" "United" "States" "and"
[1] "to" "the" "United" "States," "in"
[1] "which" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "was"
[1] "Nicaragua." "The" "United" "States" "are"
[1] "strife," "the" "United" "States," "departing"
[1] "by" "the" "United" "States" "against"
[1] "by" "a" "United" "States" "war"
[1] "to" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "at"
[1] "in" "the" "United" "States" "since"
[1] "by" "the" "United" "States," "with"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "which"
[1] "which" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States" "in"
[1] "position" "the" "United" "States" "hold"
[1] "in" "the" "United" "States" "was"
[1] "in" "the" "United" "States," "consisting"
[1] "of" "the" "United" "States" "and"
[1] "compensation" "of" "United" "States" "attorneys,"
[1] "courts," "and" "United" "States"
[5] "commissioners"
[1] "give" "to" "United" "States"
[5] "commissioners"
[1] "of" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "courts,"
[1] "confinement" "of" "United" "States" "convicts."
[1] "in" "the" "United" "States" "on"
[1] "presence" "of" "United" "States" "troops,"
[1] "to" "the" "United" "States" "Civil"
[1] "from" "the" "United" "States" "for"
[1] "line" "the" "United" "Kingdom" "of"
[1] "of" "the" "United" "States," "who"
[1] "Grover Cleveland, 1894"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States," "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States," "it"
[1] "of" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "and"
[1] "in" "the" "United" "States," "we"
[1] "board" "the" "United" "States" "war"
[1] "before" "the" "United" "States" "district"
[1] "of" "the" "United" "States" "have"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "Although"
[1] "of" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "since"
[1] "in" "the" "United" "States" "was"
[1] "in" "the" "United" "States," "consisting"
[1] "of" "the" "United" "States," "aiding"
[1] "powers" "of" "United" "States"
[5] "commissioners,"
[1] "of" "the" "United" "States," "and"
[1] "confinement" "of" "United" "States" "prisoners."
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States" "on"
[1] "of" "the" "United" "States" "or"
[1] "from" "the" "United" "States" "during"
[1] "1894" "the" "United" "Kingdom" "took"
[1] "from" "the" "United" "States," "valued"
[1] "1894," "the" "United" "States" "exported"
[1] "from" "the" "United" "States" "for"
[1] "and" "the" "United" "Kingdom" "of"
[1] "of" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "Department"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "Civil"
[1] "of" "the" "United" "States" "passed"
[1] "of" "the" "United" "States." "I"
[1] "deposit" "of" "United" "States" "bonds"
[1] "fund," "in" "United" "States" "legal-tender"
[1] "by" "the" "United" "States" "in"
[1] "fund" "in" "United" "States" "legal-tender"
[1] "of" "the" "United" "States" "rests"
[1] "Grover Cleveland, 1895"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "Waller," "formerly" "United" "States" "consul"
[1] "of" "the" "United" "States" "to"
[1] "as" "the" "United" "States," "nor"
[1] "which" "the" "United" "States" "was"
[1] "by" "the" "United" "States" "Coast"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "was"
[1] "consequence" "the" "United" "States" "is"
[1] "of" "the" "United" "States," "who"
[1] "trial." "The" "United" "States," "while"
[1] "of" "the" "United" "States," "by"
[1] "of" "the" "United" "States" "minister"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "seized"
[1] "of" "the" "United" "States" "from"
[1] "by" "the" "United" "States" "against"
[1] "of" "the" "United" "States" "in"
[1] "in" "the" "United" "States," "reside"
[1] "thither" "the" "United" "States" "consul"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "currency" "denominated" "United" "States" "notes"
[1] "to" "retire" "United" "States" "notes"
[1] "1879," "the" "United" "States" "notes"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "they"
[1] "the" "outstanding" "United" "States" "notes."
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "notes"
[1] "of" "outstanding" "United" "States" "notes"
[1] "presentation" "of" "United" "States" "notes"
[1] "of" "the" "United" "States" "notes."
[1] "on" "these" "United" "States" "notes,"
[1] "of" "its" "United" "States" "notes"
[1] "of" "our" "United" "States" "notes,"
[1] "notes" "for" "United" "States" "bonds,"
[1] "of" "the" "United" "States" "notes"
[1] "retiring" "the" "United" "States" "notes"
[1] "consist" "of" "United" "States" "notes"
[1] "demand" "upon" "United" "States" "notes"
[1] "and" "with" "United" "States" "notes"
[1] "far" "as" "United" "States" "notes"
[1] "to" "the" "United" "States" "shall"
[1] "pay" "out" "United" "States" "notes"
[1] "Treasury" "upon" "United" "States" "notes"
[1] "the" "Treasury" "United" "States" "notes"
[1] "notes" "and" "United" "States" "notes"
[1] "Treasury" "upon" "United" "States" "notes"
[1] "Grover Cleveland, 1896"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "Cuba," "the" "United" "States" "finds"
[1] "of" "the" "United" "States--a" "proceeding"
[1] "that" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States." "It"
[1] "that" "the" "United" "States" "should"
[1] "between" "the" "United" "States" "and"
[1] "denied." "The" "United" "States" "has,"
[1] "though" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "toward"
[1] "of" "the" "United" "States" "have"
[1] "execution" "the" "United" "States" "would"
[1] "of" "the" "United" "States," "either"
[1] "of" "the" "United" "States" "will"
[1] "and" "the" "United" "States," "their"
[1] "and" "the" "United" "States" "are"
[1] "Both" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "at"
[1] "in" "the" "United" "States" "during"
[1] "of" "the" "United" "States" "during"
[1] "in" "the" "United" "States" "during"
[1] "to" "the" "United" "States" "is"
[1] "convicted" "in" "United" "States" "courts"
[1] "as" "a" "United" "States"
[5] "penitentiary."
[1] "1897." "The" "United" "States" "may"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "is"
[1] "from" "the" "United" "States," "but"
[1] "by" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "by"
[1] "only" "the" "United" "States" "notes"
[1] "retirement" "of" "United" "States" "notes"
[1] "between" "the" "United" "States" "and"
[1] "William McKinley, 1897"
[1] "of" "the" "United" "States" "on"
[1] "$346,681,016" "of" "United" "States" "notes,"
[1] "redeemed" "its" "United" "States" "notes,"
[1] "of" "the" "United" "States" "notes"
[1] "of" "the" "United" "States" "note"
[1] "Government" "a" "United" "States" "note"
[1] "redemption" "of" "United" "States" "notes--a"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "testified"
[1] "of" "the" "United" "States," "had"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "satisfy" "the" "United" "States" "and"
[1] "while" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "Discussion"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "more"
[1] "history," "the" "United" "States" "should"
[1] "of" "the" "United" "States," "to"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "no"
[1] "give" "the" "United" "States" "no"
[1] "by" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "than" "the" "United" "States." "Under"
[1] "of" "the" "United" "States." "What"
[1] "to" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "represent" "the" "United" "States." "They"
[1] "of" "the" "United" "States," "with"
[1] "of" "the" "United" "States." "The"
[1] "represent" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "<p>"
[1] "that" "the" "United" "States" "was"
[1] "that" "the" "United" "States" "would"
[1] "that" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "contained"
[1] "with" "the" "United" "States," "with"
[1] "land." "The" "United" "States" "citizens"
[1] "for" "the" "United" "States" "to"
[1] "to" "the" "United" "States," "or"
[1] "with" "the" "United" "States," "with"
[1] "unless" "the" "United" "States" "Courts"
[1] "of" "the" "United" "States" "by"
[1] "of" "the" "United" "States" "Court"
[1] "William McKinley, 1898"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "toward"
[1] "aided" "by" "united" "American" "and"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "does"
[1] "of" "the" "United" "States" "be,"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "the"
[1] "That" "the" "United" "States" "hereby"
[1] "in" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "maintain"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "alone."
[1] "of" "the" "United" "States" "to"
[1] "the" "First" "United" "States" "Volunteer"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "upon"
[1] "Santiago," "the" "United" "States" "troops"
[1] "to" "the" "United" "States" "as"
[1] "from" "the" "United" "States" "only"
[1] "of" "the" "United" "States." "They"
[1] "inviting" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "signed"
[1] "to" "the" "United" "States" "the"
[1] "by" "the" "United" "States." "<p>"
[1] "III." "The" "United" "States" "will"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "The"
[1] "completed." "The" "United" "States" "flag"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States." "Proceeding"
[1] "of" "the" "United" "States" "with"
[1] "which" "the" "United" "States" "minister"
[1] "to" "the" "United" "States." "Although"
[1] "between" "the" "United" "States" "and"
[1] "from" "the" "United" "States," "originally"
[1] "board" "the" "United" "States" "steamer"
[1] "toward" "the" "United" "States" "remained"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "of"
[1] "and" "the" "United" "States" "Congress"
[1] "newly" "formed" "United" "States" "of"
[1] "the" "late" "United" "States" "and"
[1] "<p>" "The" "United" "States" "has"
[1] "of" "the" "United" "States." "Action"
[1] "1895," "the" "United" "States" "minister"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "exhibit"
[1] "to" "the" "United" "States" "has"
[1] "of" "four" "United" "States" "revenue"
[1] "between" "the" "United" "States" "and"
[1] "provided" "the" "United" "States" "Government"
[1] "to" "a" "United" "States" "port"
[1] "of" "the" "United" "States" "and"
[1] "directed" "the" "United" "States" "steamship"
[1] "and" "the" "United" "States" "minister"
[1] "to" "the" "United" "States." "This"
[1] "of" "the" "United" "States" "the"
[1] "to" "the" "United" "States," "thus"
[1] "with" "the" "United" "States" "and"
[1] "while" "the" "United" "States" "consulate"
[1] "of" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "to"
[1] "into" "the" "United" "States" "along"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "as"
[1] "of" "the" "United" "States" "district"
[1] "which" "the" "United" "States" "became"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "in" "the" "United" "States" "since"
[1] "of" "the" "United" "States" "in"
[1] "in" "the" "United" "States" "has"
[1] "powers." "The" "United" "States" "Government"
[1] "liabilities," "including" "United" "States" "notes,"
[1] "of" "the" "United" "States" "notes"
[1] "of" "the" "United" "States" "note"
[1] "Government" "a" "United" "States" "note"
[1] "redemption" "of" "United" "States" "notes--a"
[1] "of" "the" "United" "States" "to"
[1] "by" "the" "United" "States." "There"
[1] "by" "the" "United" "States," "under"
[1] "Government." "The" "United" "States" "will"
[1] "and" "the" "United" "States" "which"
[1] "which" "the" "United" "States" "may"
[1] "of" "the" "United" "States" "court"
[1] "of" "the" "United" "States," "was"
[1] "thereupon" "the" "United" "States" "might"
[1] "of" "the" "United" "States" "required"
[1] "to" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "by"
[1] "William McKinley, 1899"
[1] "of" "the" "United" "States" "to"
[1] "to" "sell" "United" "States" "bonds"
[1] "we" "sell" "United" "States" "bonds"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "with"
[1] "the" "several" "United" "States" "district"
[1] "of" "the" "United" "States" "without"
[1] "by" "the" "United" "States" "of"
[1] "between" "the" "United" "States" "and"
[1] "throughout" "the" "United" "States" "adequate"
[1] "which" "the" "United" "States" "minister"
[1] "by" "the" "United" "States" "Senate"
[1] "from" "the" "United" "States," "to"
[1] "which" "the" "United" "States" "was"
[1] "insurrection." "The" "United" "States"
[5] "minister"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States" "minister"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "Senate."
[1] "of" "the" "United" "States," "should"
[1] "are" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "at"
[1] "to" "the" "United" "States" "a"
[1] "<p>" "The" "United" "States" "Government"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "with"
[1] "tendered." "The" "United" "States"
[5] "representative"
[1] "Pretoria" "the" "United" "States" "consul"
[1] "in" "the" "United" "States" "cognizable"
[1] "if" "the" "United" "States" "had"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "against" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "jurisdiction"
[1] "in" "the" "United" "States," "may"
[1] "between" "the" "United" "States" "and"
[1] "4," "the" "United" "States" "being,"
[1] "to" "the" "United" "States" "transport"
[1] "and" "the" "United" "States" "into"
[1] "of" "the" "United" "States," "charged"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "Government"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "Germany,"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "all"
[1] "which" "the" "United" "States" "disclaimed"
[1] "in" "the" "United" "States" "on"
[1] "by" "the" "United" "States." "The"
[1] "while" "the" "United" "States" "transferred"
[1] "in" "the" "United" "States," "the"
[1] "which" "the" "United" "States" "assured"
[1] "<p>" "The" "United" "States" "minister"
[1] "of" "the" "United" "States" "official"
[1] "than" "the" "United" "States," "which"
[1] "of" "the" "United" "States" "that"
[1] "of" "the" "United" "States" "from"
[1] "Museum," "the" "United" "States" "Commission"
[1] "of" "the" "United" "States" "in"
[1] "lessons" "to" "United" "States"
[5] "manufacturers"
[1] "from" "the" "United" "States" "consisted"
[1] "of" "the" "United" "States" "Navy,"
[1] "of" "the" "United" "States" "Army,"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "by"
[1] "require" "the" "United" "States" "of"
[1] "by" "the" "United." "States" "of"
[1] "of" "the" "United" "States," "whose"
[1] "throughout" "the" "United" "States" "are"
[1] "and" "who" "united" "large" "experience"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States," "yet,"
[1] "of" "the" "United" "States" "numbered"
[1] "deficiency" "due" "United" "States," "cash"
[1] "William McKinley, 1900"
[1] "of" "the" "United" "States" "was"
[1] "solicitude." "The" "United" "States" "from"
[1] "would" "hasten" "united" "action" "of"
[1] "<p>" "The" "United" "States," "while"
[1] "of" "the" "United" "States" "Marine"
[1] "arriving." "The" "United" "States" "contingent,"
[1] "brought" "the" "united" "forces" "to"
[1] "saved." "The" "United" "States" "soldiers,"
[1] "of" "the" "United" "States" "through"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States." "<p>"
[1] "cases," "the" "United" "States" "minister"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "naval"
[1] "between" "the" "United" "States" "and"
[1] "like" "the" "United" "States;" "courts,"
[1] "of" "the" "United" "States" "and"
[1] "namely," "the" "United" "States," "Austria,"
[1] "of" "the" "United" "States;" "Hon."
[1] "of" "the" "United" "States;" "Hon."
[1] "of" "the" "United" "States;" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "with" "the" "United" "States" "or"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "and"
[1] "cession" "the" "United" "States" "is"
[1] "which" "the" "United" "States" "assumed"
[1] "of" "the" "United" "States," "Germany,"
[1] "of" "the" "United" "States" "that"
[1] "for" "the" "United" "States" "but"
[1] "between" "the" "United" "States" "and"
[1] "redemption" "of" "United" "States" "notes."
[1] "of" "the" "United" "States" "bonds"
[1] "in" "the" "United" "States" "is"
[1] "in" "the" "United" "States." "While"
[1] "place" "the" "United" "States" "in"
[1] "throughout" "the" "United" "States" "adequate"
[1] "of" "the" "United" "States," "I"
[1] "by" "the" "United" "States" "forces"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States," "shall"
[1] "to" "the" "United" "States," "and"
[1] "pledging" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "both"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "by"
[1] "\"That" "the" "United" "States" "hereby"
[1] "of" "the" "United" "States" "upon"
[1] "of" "the" "United" "States," "I"
[1] "and" "the" "United" "States." "<p>"
[1] "and" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "will"
[1] "between" "the" "United" "States" "and"
[1] "in" "the" "United" "States" "other"
[1] "of" "the" "United" "States," "of"
[1] "into" "the" "United" "States." "Inquiry"
[1] "order:" "The" "United" "States" "Civil"
[1] "of" "the" "United" "States" "Philippine"
[1] "the" "said" "United" "States" "Civil"
[1] "Theodore Roosevelt, 1901"
[1] "all" "the" "United" "States;" "while"
[1] "life" "he" "united" "the" "tender"
[1] "in" "the" "United" "States," "is"
[1] "in" "the" "United" "States" "than"
[1] "for" "the" "United" "States" "Government"
[1] "for" "the" "United" "States" "to"
[1] "throughout" "the" "United" "States" "has"
[1] "with" "the" "United" "States" "Geological"
[1] "in" "the" "United" "States." "These"
[1] "should" "be" "united" "in" "the"
[1] "of" "the" "United" "States" "would"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States." "I"
[1] "into" "the" "United" "States." "Cuba"
[1] "that" "the" "United" "States" "alone"
[1] "of" "the" "United" "States." "Just"
[1] "people" "are" "united" "in" "demanding,"
[1] "us" "a" "united" "Nation," "but"
[1] "was" "kept" "united." "We" "are"
[1] "we" "are" "united" "in" "our"
[1] "crisis" "the" "United" "States" "must"
[1] "of" "the" "United" "States." "We"
[1] "to" "the" "United" "States." "The"
[1] "by" "the" "United" "States" "have"
[1] "in" "the" "United" "States," "the"
[1] "of" "the" "United" "States." "Already"
[1] "of" "the" "United" "States," "Mr."
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "deep"
[1] "Theodore Roosevelt, 1902"
[1] "country" "have" "united" "in" "requesting"
[1] "last" "the" "United" "States" "kept"
[1] "between" "the" "United" "States" "and"
[1] "that" "the" "United" "States" "and"
[1] "only" "the" "United" "States" "but"
[1] "from" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "available"
[1] "Theodore Roosevelt, 1903"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States," "an"
[1] "of" "the" "United" "States;" "and"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States," "was"
[1] "by" "the" "United" "States," "of"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States," "while"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "at"
[1] "to" "the" "United" "States," "France,"
[1] "Mexico," "the" "United" "States," "and"
[1] "powers." "The" "United" "States" "Government"
[1] "of" "the" "United" "States" "Civil"
[1] "of" "the" "United" "States" "qualified"
[1] "of" "the" "United" "States," "by"
[1] "of" "the" "United" "States" "should"
[1] "in" "the" "United" "States" "a"
[1] "which" "the" "United" "States" "entered"
[1] "to" "the" "United" "States," "whose"
[1] "<p>" "\"The" "United" "States" "have"
[1] "of" "the" "United" "States" "of"
[1] "altercations." "The" "United" "States"
[5] "will,"
[1] "which" "the" "United" "States" "engages"
[1] "of" "the" "United" "States" "of"
[1] "invited" "the" "United" "States" "to"
[1] "did" "the" "United" "States" "become"
[1] "Granada." "The" "United" "States" "did"
[1] "of" "the" "United" "States" "in"
[1] "quoted," "the" "United" "States" "gave"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States," "in"
[1] "since" "the" "United" "States" "had"
[1] "native" "parties." "United" "States" "forces"
[1] "1860.--Landing" "of" "United" "States"
[5] "forces"
[1] "of" "the" "United" "States" "forces"
[1] "1865.--Revolution," "and" "United"
[4] "States" "troops"
[1] "of" "the" "United" "States" "has"
[1] "by" "the" "United" "States" "of"
[1] "marines" "from" "United" "States" "war"
[1] "that" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "prefers,"
[1] "to" "the" "United" "States." "We"
[1] "Spain" "the" "United" "States" "would"
[1] "that" "the" "United" "States" "could"
[1] "that" "the" "United" "States" "has"
[1] "by" "the" "United" "States," "the"
[1] "of" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "would"
[1] "by" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "treaty" "the" "United" "States" "guarantees"
[1] "to" "the" "United" "States" "in"
[1] "but" "the" "United" "States" "assumes"
[1] "therein;" "the" "United" "States" "enjoys"
[1] "to" "the" "United" "States," "including"
[1] "by" "the" "United" "States" "for"
[1] "by" "the" "United" "States" "and"
[1] "Theodore Roosevelt, 1904"
[1] "which" "the" "United" "States" "has"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "organizations." "The" "United" "States"
[5] "is"
[1] "become" "the" "United" "States" "really"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "Action"
[1] "of" "the" "United" "States" "decorates"
[1] "in" "the" "United" "States" "having"
[1] "of" "the" "United" "States" "ought"
[1] "of" "the" "United" "States" "but"
[1] "of" "the" "United" "States" "should"
[1] "throughout" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States" "after"
[1] "practice;" "that" "United" "States"
[5] "commissioners"
[1] "that" "the" "United" "States" "feels"
[1] "from" "the" "United" "States." "Chronic"
[1] "of" "the" "United" "States" "to"
[1] "force" "the" "United" "States," "however"
[1] "of" "the" "United" "States" "or"
[1] "of" "the" "United" "States." "I"
[1] "years" "the" "United" "States" "has"
[1] "to" "the" "United" "States" "as"
[1] "in" "the" "United" "States."
[5] "Unfortunately"
[1] "to" "the" "United" "States;" "if"
[1] "Theodore Roosevelt, 1905"
[1] "of" "the" "United" "States" "and"
[1] "throughout" "the" "United" "States." "I"
[1] "country." "The" "United" "States" "should"
[1] "for" "the" "United" "States" "Land"
[1] "in" "the" "United" "States," "and"
[1] "1904," "the" "United" "States" "Government"
[1] "called." "The" "United" "States" "Government"
[1] "if" "the" "United" "States" "alone,"
[1] "of" "the" "United" "States" "may"
[1] "will" "the" "United" "States" "use"
[1] "for" "the" "United" "States" "to"
[1] "confined" "to" "United" "States" "district"
[1] "inhabitants" "the" "United" "States" "district"
[1] "of" "the" "United" "States" "stands"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "which"
[1] "of" "a" "United" "States" "Attorney"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "to" "the" "United" "States" "1,026,000"
[1] "to" "the" "United" "States." "Moreover,"
[1] "upon" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "Supreme"
[1] "defrauding" "the" "United" "States" "Treasury"
[1] "have" "been" "united" "as" "causes"
[1] "of" "the" "United" "States" "are"
[1] "entering" "the" "United" "States." "I"
[1] "and" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "upon"
[1] "and" "the" "United" "States" "until"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "will"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "making"
[1] "and" "the" "United" "States," "however,"
[1] "of" "the" "United" "States" "are"
[1] "between" "the" "United" "States" "and"
[1] "by" "the" "United" "States" "Senate"
[1] "to" "the" "United" "States" "on"
[1] "Theodore Roosevelt, 1906"
[1] "when" "a" "United" "States" "circuit"
[1] "of" "the" "United" "States" "are"
[1] "in" "the" "United" "States." "More"
[1] "in" "the" "United" "States," "which"
[1] "of" "the" "United" "States" "Supreme"
[1] "in" "the" "United" "States," "where"
[1] "of" "the" "United" "States" "2"
[1] "of" "the" "United" "States" "at"
[1] "of" "the" "United" "States" "is"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "have"
[1] "of" "the" "United" "States" "are"
[1] "power," "through" "United" "States" "courts"
[1] "of" "the" "United" "States" "be"
[1] "for" "the" "United" "States" "Government,"
[1] "of" "the" "United" "States" "which"
[1] "of" "the" "United" "States" "Government."
[1] "and" "the" "United" "States" "Government"
[1] "Island." "The" "United" "States" "wishes"
[1] "and" "the" "United" "States," "which"
[1] "of" "the" "United" "States" "of"
[1] "the" "people" "united" "everywhere" "in"
[1] "of" "the" "United" "States" "towards"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "(which)"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "not"
[1] "between" "the" "United" "States" "and"
[1] "board" "a" "United" "States" "warship"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "can"
[1] "examples" "of" "united" "action" "by"
[1] "by" "the" "United" "States" "as"
[1] "by" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "season" "a" "United" "States" "war"
[1] "of" "the" "United" "States" "need"
[1] "<p>" "The" "United" "States" "Navy"
[1] "Theodore Roosevelt, 1907"
[1] "of" "the" "United" "States" "Supreme"
[1] "of" "the" "United" "States" "2"
[1] "in" "the" "United" "States" "the"
[1] "which" "the" "United" "States" "stands"
[1] "of" "the" "United" "States" "should"
[1] "in" "the" "United" "States," "deserves"
[1] "of" "the" "United" "States" "perhaps"
[1] "in" "the" "United" "States," "is"
[1] "in" "the" "United" "States;" "and"
[1] "in" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "to"
[1] "the" "eastern" "United" "States" "the"
[1] "all" "previous" "United" "States" "records,"
[1] "by" "the" "United" "States" "Government."
[1] "between" "the" "United" "States" "exchange"
[1] "and" "the" "United" "States" "post-offices"
[1] "of" "the" "United" "States," "having"
[1] "in" "the" "United" "States" "now"
[1] "of" "the" "United" "States." "The"
[1] "be" "speedily" "united." "Our" "coast"
[1] "peace." "The" "United" "States" "Navy"
[1] "the" "world" "united" "in" "a"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "worthily"
[1] "island," "the" "United" "States" "intervened,"
[1] "of" "the" "United" "States" "to"
[1] "and" "the" "United" "States" "as"
[1] "from" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "from" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "at"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "toward" "the" "United" "States." "<p>"
[1] "and" "the" "United" "States" "are"
[1] "with" "the" "United" "States." "Under"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "about"
[1] "making" "the" "United" "States" "known"
[1] "Theodore Roosevelt, 1908"
[1] "redemptions" "of" "United" "States" "bonds;"
[1] "of" "the" "United" "States" "from"
[1] "Constitution" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "towards"
[1] "except" "the" "United" "States," "only"
[1] "accidents" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "in"
[1] "in" "the" "United" "States." "All"
[1] "of" "the" "United" "States" "Department"
[1] "in" "the" "United" "States" "where"
[1] "of" "the" "United" "States." "<p>"
[1] "throughout" "the" "United" "States," "the"
[1] "in" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States." "The"
[1] "if" "the" "United" "States" "Government"
[1] "for" "the" "United" "States" "to"
[1] "in" "the" "United" "States" "Bureau"
[1] "by" "the" "United" "States;" "problems"
[1] "of" "the" "United" "States." "It"
[1] "Asia." "The" "United" "States," "because"
[1] "representing" "the" "United" "States" "won"
[1] "William H. Taft, 1909"
[1] "of" "the" "United" "States" "with"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "is"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "France,"
[1] "participated:" "the" "United" "States,"
[5] "Austria-Hungary,"
[1] "1909," "the" "United" "States" "was"
[1] "1910." "The" "United" "States" "will"
[1] "of" "the" "United" "States" "is"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "which" "the" "United" "States" "may"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "was"
[1] "by" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "was"
[1] "which" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "which" "the" "United" "States" "is"
[1] "and" "the" "United" "States" "assurance"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "as"
[1] "from" "the" "United" "States" "on"
[1] "to" "the" "United" "States" "a"
[1] "by" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "have"
[1] "in" "the" "United" "States" "should"
[1] "with" "the" "United" "States," "are"
[1] "to" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "against" "the" "United" "States" "in"
[1] "in" "the" "United" "States." "The"
[1] "of" "the" "United" "States," "and"
[1] "against" "the" "United" "States," "the"
[1] "of" "the" "United" "States," "but"
[1] "of" "the" "United" "States" "proper"
[1] "of" "the" "United" "States" "to"
[1] "not" "be" "united" "in" "a"
[1] "of" "the" "United" "States" "Civil"
[1] "of" "the" "United" "States" "Government"
[1] "William H. Taft, 1910"
[1] "of" "the" "United" "States" "have"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "<p>" "The" "United" "States" "was"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "recognized"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States," "has"
[1] "and" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "in"
[1] "people." "The" "United" "States" "in"
[1] "to" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "and"
[1] "which" "the" "United" "States" "together"
[1] "of" "the" "United" "States" "assurances"
[1] "and" "the" "United" "States," "relations"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "States-Mexican"
[5] "Boundary"
[1] "factions" "have" "united" "to" "maintain"
[1] "toward" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "which"
[1] "against" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "were"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States," "to"
[1] "entering" "the" "United" "States." "In"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "equal"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "jurisdiction"
[1] "with" "the" "United" "States," "in"
[1] "of" "the" "United" "States" "shall"
[1] "in" "the" "United" "States," "freedom"
[1] "of" "the" "United" "States," "in"
[1] "William H. Taft, 1911"
[1] "by" "the" "United" "States" "to"
[1] "corporation" "of" "United" "Cigar" "Stores,"
[1] "of" "the" "United" "States.\"" "<p>"
[1] "throughout" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "and"
[1] "with" "the" "United" "States," "Great"
[1] "and" "the" "United" "States" "the"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States," "who"
[1] "of" "the" "United" "States," "by"
[1] "independence." "The" "United" "States"
[5] "sent,"
[1] "and" "the" "United" "States." "MEXICO."
[1] "of" "the" "United" "States," "in"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "had"
[1] "of" "the" "United" "States" "in"
[1] "with" "the" "United" "States" "the"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States," "Great"
[1] "of" "the" "United" "States" "in"
[1] "between" "the" "United" "States" "and"
[1] "with" "the" "United" "States"
[5] "simultaneously"
[1] "Japan." "The" "United" "States" "consented"
[1] "to" "the" "United" "States" "as"
[1] "represent" "the" "United" "States" "at"
[1] "to" "the" "United" "States." "<p>"
[1] "commerce," "the" "United" "States" "has"
[1] "with" "the" "United" "States" "through"
[1] "visited" "the" "United" "States" "to"
[1] "and" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "and" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States," "together"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "has"
[1] "between" "the" "United" "States," "Great"
[1] "of" "the" "United" "States" "for"
[1] "<p>" "The" "United" "States" "is"
[1] "of" "the" "United" "States," "had"
[1] "in" "the" "United" "States" "should"
[1] "nations," "the" "United" "States" "proposed"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "OF" "THE" "UNITED" "STATES." "<p>"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States." "While"
[1] "of" "the" "United" "States" "should"
[1] "into" "the" "United" "States" "are"
[1] "of" "the" "United" "States," "have"
[1] "in" "the" "United" "States," "in"
[1] "of" "the" "United" "States," "we"
[1] "Congress" "the" "United" "States" "must"
[1] "of" "the" "United" "States," "in"
[1] "of" "the" "United" "States" "June"
[1] "OF" "THE" "UNITED" "STATES." "<p>"
[1] "of" "the" "United" "States" "is"
[1] "that" "the" "United" "States" "has"
[1] "which" "the" "United" "States" "may"
[1] "of" "the" "United" "States," "whether"
[1] "of" "the" "United" "States." "<p>"
[1] "deposits" "into" "United" "States" "bonds"
[1] "William H. Taft, 1912"
[1] "of" "the" "United" "States" "actually"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "must"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "should"
[1] "affairs" "the" "United" "States" "should"
[1] "world" "a" "united" "front." "The"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "administration" "the" "United" "States,"
[5] "having"
[1] "of" "the" "United" "States" "a"
[1] "of" "the" "United" "States" "should"
[1] "of" "the" "United" "States" "shall"
[1] "of" "the" "United" "States." "Because"
[1] "of" "the" "United" "States" "can"
[1] "and" "the" "United" "States" "between"
[1] "of" "the" "United" "States" "was"
[1] "of" "the" "United" "States" "is"
[1] "China" "the" "United" "States" "successfully"
[1] "of" "the" "United" "States" "in"
[1] "with" "the" "United" "States" "and"
[1] "that" "the" "United" "States" "might"
[1] "to" "the" "United" "States" "is"
[1] "upon" "the" "United" "States." "It"
[1] "Hence" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "navy"
[1] "of" "the" "United" "States," "the"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "bear"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "has"
[1] "against" "the" "United" "States," "a"
[1] "into" "the" "United" "States" "are"
[1] "in" "the" "United" "States" "for"
[1] "of" "the" "United" "States."
[5] "Consideration"
[1] "between" "the" "United" "States" "and"
[1] "and" "the" "United" "States" "provided"
[1] "between" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "including" "the" "United" "States," "and"
[1] "in" "the" "United" "States" "as"
[1] "other." "The" "United" "States" "has"
[1] "and" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "to"
[1] "represent" "the" "United" "States." "Our"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "to"
[1] "obligations," "the" "United" "States" "is,"
[1] "by" "the" "United" "States," "in"
[1] "as" "a" "united" "provisional" "Government"
[1] "assured," "the" "United" "States" "joined"
[1] "of" "the" "United" "States," "France,"
[1] "of" "the" "United" "States" "to"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "Coast"
[1] "in" "the" "United" "States," "had"
[1] "which" "the" "United" "States" "may"
[1] "July" "the" "United" "States" "sent"
[1] "with" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "with"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States" "does"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "the"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "continues"
[1] "of" "the" "United" "States" "so"
[1] "spirit" "of" "united" "effort" "and"
[1] "the" "whole" "United" "States," "State"
[1] "the" "continental" "United" "States" "a"
[1] "in" "the" "United" "States" "are"
[1] "been" "a" "united" "organization" "but"
[1] "in" "the" "United" "States." "In"
[1] "within" "the" "United" "States." "The"
[1] "in" "the" "United" "States," "it"
[1] "of" "the" "United" "States" "of"
[1] "from" "the" "United" "States," "will"
[1] "are" "being" "united" "into" "a"
[1] "of" "the" "United" "States," "and"
[1] "in" "the" "United" "States" "or"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "is"
[1] "has" "the" "United" "States" "had"
[1] "customs" "officers," "United" "States" "marshals,"
[1] "of" "the" "United" "States" "to"
[1] "Government." "The" "United" "States" "can"
[1] "enable" "the" "United" "States" "to"
[1] "of" "the" "United" "States," "selected"
[1] "of" "the" "United" "States," "who"
[1] "Woodrow Wilson, 1913"
[1] "far" "the" "United" "States" "has"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "We"
[1] "of" "the" "United" "States" "has,"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States," "the"
[1] "Woodrow Wilson, 1914"
[1] "action." "The" "United" "States," "this"
[1] "by" "the" "United" "States;" "the"
[1] "of" "the" "United" "States" "played"
[1] "of" "the" "United" "States" "themselves,"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "do"
[1] "Woodrow Wilson, 1915"
[1] "of" "the" "United" "States" "looked"
[1] "hostile" "rivalries;" "united" "in" "spirit"
[1] "that" "the" "United" "States" "should"
[1] "of" "the" "United" "States," "I"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "They"
[1] "Woodrow Wilson, 1916"
[1] "of" "the" "United" "States" "such"
[1] "Woodrow Wilson, 1917"
[1] "we" "are" "united" "in" "spirit"
[1] "declare" "the" "United" "States" "in"
[1] "from" "the" "United" "States." "<p>"
[1] "Woodrow Wilson, 1918"
[1] "of" "your" "united" "support?" "I"
[1] "Woodrow Wilson, 1919"
[1] "responsibility." "The" "United" "States"
[5] "must"
[1] "market." "The" "United" "States" "desires"
[1] "Although" "the" "United" "States" "will"
[1] "Woodrow Wilson, 1920"
[1] "of" "the" "United" "States" "to"
[1] "which" "the" "United" "States" "can"
[1] "<p>" "The" "United" "States" "cannot"
[1] "world." "The" "United" "States" "is"
[1] "of" "the" "United" "States" "as"
[1] "throughout" "the" "United" "States," "I"
[1] "of" "the" "United" "States" "to"
[1] "from" "the" "United" "States" "in"
[1] "Warren Harding, 1921"
[1] "in" "the" "United" "States" "equality"
[1] "Warren Harding, 1922"
[1] "of" "the" "United" "States" "has"
[1] "for" "the" "United" "States" "burdens"
[1] "in" "the" "United" "States" "to"
[1] "in" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "in"
[1] "Calvin Coolidge, 1923"
[1] "But" "the" "United" "States" "sees"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "than"
[1] "Calvin Coolidge, 1924"
[1] "of" "the" "United" "States:" "<p>"
[1] "determined." "The" "United" "States" "ought"
[1] "of" "the" "United" "States" "has"
[1] "Calvin Coolidge, 1925"
[1] "be" "said" "United" "States" "judges"
[1] "to" "the" "United" "States" "under"
[1] "of" "the" "United" "States" "Chamber"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "requisite"
[1] "of" "the" "United" "States" "has"
[1] "Calvin Coolidge, 1926"
[1] "that" "the" "United" "States" "affords"
[1] "of" "the" "United" "States" "to"
[1] "<p>" "The" "United" "States" "promises"
[1] "of" "the" "United" "States" "Government."
[1] "of" "the" "United" "States," "issued"
[1] "between" "the" "United" "States" "and"
[1] "Calvin Coolidge, 1927"
[1] "<p>" "The" "United" "States" "Government"
[1] "have" "the" "United" "States" "take"
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "is"
[1] "and" "the" "United" "States," "has"
[1] "in" "the" "United" "States" "since"
[1] "<p>" "The" "United" "States" "Employment"
[1] "of" "the" "United" "States" "to"
[1] "Calvin Coolidge, 1928"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "ever"
[1] "R." "McCoy," "United" "States" "Army,"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States," "the"
[1] "to" "the" "United" "States," "and"
[1] "maintaining" "the" "United" "States" "Government"
[1] "putting" "the" "United" "States" "Government"
[1] "in" "the" "United" "States" "has"
[1] "to" "the" "United" "States." "Our"
[1] "Herbert Hoover, 1929"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States" "now"
[1] "Governments." "The" "United" "States" "denied"
[1] "between" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "now"
[1] "issue" "of" "United" "States" "Government"
[1] "by" "the" "United" "States" "Government"
[1] "in" "the" "United" "States." "The"
[1] "in" "the" "United" "States," "of"
[1] "of" "the" "United" "States," "and"
[1] "of" "the" "United" "States" "for"
[1] "through" "the" "United" "States" "Public"
[1] "through" "the" "United" "States" "Public"
[1] "offices" "of" "United" "States" "attorneys,"
[1] "Herbert Hoover, 1930"
[1] "of" "the" "United" "States," "and"
[1] "to" "the" "United" "States" "seeking"
[1] "of" "the" "United" "States" "with"
[1] "Herbert Hoover, 1931"
[1] "in" "the" "United" "States." "No"
[1] "of" "the" "United" "States" "Government."
[1] "Herbert Hoover, 1932"
[1] "due" "the" "United" "States" "on"
[1] "Franklin D. Roosevelt, 1934"
[1] "representing" "the" "United" "States" "has"
[1] "that" "the" "United" "States" "cannot"
[1] "Franklin D. Roosevelt, 1935"
[1] "by" "the" "United" "States." "<p>"
[1] "for" "the" "United" "States" "to"
[1] "shall" "be" "united" "in" "a"
[1] "of" "the" "United" "States" "are"
[1] "Franklin D. Roosevelt, 1936"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States," "I"
[1] "of" "the" "United" "States" "has"
[1] "policy," "the" "United" "States" "is"
[1] "from" "the" "United" "States." "Second,"
[1] "to" "the" "United" "States." "Peace"
[1] "then" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "for"
[1] "of" "the" "United" "States." "Let"
[1] "of" "the" "United" "States" "well"
[1] "Franklin D. Roosevelt, 1937"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "as"
[1] "of" "the" "United" "States." "It"
[1] "<p>" "The" "United" "States" "of"
[1] "of" "the" "United" "States" "have"
[1] "Franklin D. Roosevelt, 1938"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "have"
[1] "in" "the" "United" "States" "where"
[1] "of" "the" "United" "States;" "nor"
[1] "of" "the" "United" "States," "that"
[1] "of" "the" "United" "States" "Government"
[1] "of" "the" "United" "States" "today"
[1] "throughout" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "will"
[1] "Franklin D. Roosevelt, 1939"
[1] "Peace." "The" "United" "States" "rejects"
[1] "of" "the" "United" "States" "if"
[1] "strong" "and" "united" "nation" "may"
[1] "into" "a" "united" "patriotism." "If"
[1] "present" "a" "united" "front" "in"
[1] "by" "a" "united" "democracy." "Such"
[1] "in" "the" "United" "States." "<p>"
[1] "But" "the" "united" "strength" "of"
[1] "Franklin D. Roosevelt, 1940"
[1] "that" "the" "United" "States" "of"
[1] "that" "the" "United" "States" "will"
[1] "in" "the" "United" "States," "as"
[1] "the" "whole" "United" "States" "and"
[1] "of" "the" "United" "States" "of"
[1] "that" "the" "United" "States" "has"
[1] "in" "the" "United" "States" "and"
[1] "comes," "the" "United" "States" "must"
[1] "of" "the" "United" "States" "warned"
[1] "of" "the" "United" "States" "subscribes"
[1] "as" "a" "disunited" "people." "<p>"
[1] "as" "a" "united" "people" "keep"
[1] "world--including" "the" "United" "States"
[5] "of"
[1] "Franklin D. Roosevelt, 1941"
[1] "1914" "the" "United" "States" "often"
[1] "that" "the" "United" "States" "as"
[1] "of" "the" "United" "States" "because"
[1] "in" "the" "United" "States" "from"
[1] "in" "the" "United" "States," "fitting"
[1] "Franklin D. Roosevelt, 1942"
[1] "of" "the" "United" "Nations'" "total"
[1] "26" "Nations" "united" "against" "the"
[1] "and" "those" "united" "with" "us"
[1] "all" "the" "United"
[4] "Nations--military" "action"
[1] "Nations" "are" "united--not" "in" "spirit"
[1] "of" "the" "United" "Nations" "will"
[1] "of" "the" "United" "States." "<p>"
[1] "the" "other" "United" "Nations" "to"
[1] "of" "the" "United" "Nations" "in"
[1] "superiority" "the" "United" "States" "must"
[1] "in" "the" "United" "States" "must"
[1] "in" "a" "united" "country." "<p>"
[1] "As" "the" "United" "States" "goes"
[1] "the" "other" "United" "Nations." "We"
[1] "to" "the" "United" "Nations." "<p>"
[1] "some" "400" "United" "States" "Marines"
[1] "of" "the" "United" "Nations" "are"
[1] "Franklin D. Roosevelt, 1943"
[1] "to" "the" "United" "Nations." "<p>"
[1] "from" "the" "United" "States" "and"
[1] "and" "the" "United" "Kingdom" "in"
[1] "of" "the" "United" "Nations." "<p>"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "Nations" "whose"
[1] "with" "the" "United" "Nations" "forces."
[1] "of" "the" "United" "Nations." "This"
[1] "where" "the" "United" "Nations" "are"
[1] "for" "the" "United" "States" "Government,"
[1] "all" "the" "United" "Nations," "want"
[1] "Today" "the" "United" "Nations" "are"
[1] "neighbors," "the" "United" "Nations" "can"
[1] "must" "remain" "united" "for" "the"
[1] "to" "the" "United" "Nations" "a"
[1] "Franklin D. Roosevelt, 1944"
[1] "We" "are" "united" "in"
[5] "determination"
[1] "all" "the" "United" "Nations," "can"
[1] "are" "truly" "united" "with" "Britain"
[1] "always" "been" "united" "in" "purpose"
[1] "Franklin D. Roosevelt, 1945"
[1] "from" "other" "United" "Nations," "including"
[1] "in" "the" "United" "States" "there"
[1] "of" "the" "United" "States.'" "<p>"
[1] "with" "the" "United" "Nations" "not"
[1] "by" "the" "united" "determination"
[5] "of"
[1] "Declaration" "by" "United" "Nations" "of"
[1] "danger," "the" "United" "Nations" "joined"
[1] "the" "other" "United" "Nations" "are"
[1] "of" "the" "United" "Nations." "Far"
[1] "declaration" "by" "United" "Nations" "a"
[1] "to" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "of"
[1] "Harry S. Truman, 1946"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "Nations" "and"
[1] "by" "the" "United" "Nations." "<p>"
[1] "finds" "the" "United" "States" "strong"
[1] "in" "the" "United" "States" "Government"
[1] "<p>" "The" "United" "Nations" "Organization"
[1] "develop" "the" "United" "Nations" "Organization"
[1] "society." "The" "United" "Nations"
[5] "Organization,"
[1] "of" "the" "United" "Nations" "and"
[1] "of" "the" "United" "States" "that"
[1] "and" "the" "United" "States" "conferred"
[1] "which" "the" "United" "States" "has"
[1] "of" "the" "United" "Nations" "to"
[1] "us," "the" "United" "States" "does"
[1] "of" "the" "United" "Nations"
[5] "Organization."
[1] "of" "the" "United" "Nations" "now"
[1] "of" "the" "United" "Nations"
[5] "Organization."
[1] "Finland." "The" "United" "States" "intends"
[1] "of" "the" "United" "States" "to"
[1] "develop" "the" "United" "Nations" "Organization"
[1] "of" "the" "United" "Nations" "to"
[1] "through" "the" "United" "Nations" "Organization"
[1] "which" "the" "United" "States" "demonstrated"
[1] "objective" "of" "United" "States" "foreign"
[1] "which" "the" "United" "States" "adheres"
[1] "of" "the" "United" "States." "I"
[1] "of" "the" "United" "States." "I"
[1] "But" "the" "United" "States" "will"
[1] "requires" "a" "United" "Nations" "Organization"
[1] "execution" "of" "United" "States"
[5] "participation"
[1] "control," "the" "United" "States," "with"
[1] "strong," "independent," "united," "and" "democratic"
[1] "of" "the" "United" "States." "<p>"
[1] "Moscow" "the" "United" "States," "the"
[1] "of" "the" "United" "States" "to"
[1] "of" "the" "United" "Nations" "Relief"
[1] "Administration" "the" "United" "States"
[5] "has"
[1] "to" "the" "United" "Nations" "Relief"
[1] "to" "the" "United" "States" "of"
[1] "of" "the" "United" "Nations" "have"
[1] "choosing" "the" "United" "States" "as"
[1] "of" "the" "United" "Nations"
[5] "headquarters."
[1] "of" "the" "United" "States" "is"
[1] "to" "the" "United" "Nations" "Relief"
[1] "with" "the" "United" "Kingdom." "Negotiations"
[1] "to" "the" "United" "Kingdom," "which"
[1] "enable" "the" "United" "Kingdom" "to"
[1] "<p>" "The" "United" "States" "Government"
[1] "of" "the" "United" "Kingdom" "has"
[1] "of" "the" "United" "States." "To"
[1] "in" "the" "United" "States." "A"
[1] "in" "the" "United" "States" "zone"
[1] "to" "the" "United" "Nations" "Relief"
[1] "that" "the" "United" "States" "could"
[1] "<p>" "The" "United" "States" "Conciliation"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "Employment"
[1] "which" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "are"
[1] "the" "total" "United" "States" "food"
[1] "in" "the" "United" "States." "It"
[1] "of" "the" "United" "States" "can"
[1] "in" "continental" "United" "States" "has"
[1] "to" "the" "United" "States." "I"
[1] "upon" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "are"
[1] "as" "the" "United" "States" "Maritime"
[1] "to" "the" "United" "Nations" "Relief"
[1] "for" "the" "United" "Nations" "Relief"
[1] "for" "the" "United" "States" "Maritime"
[1] "for" "the" "United" "Nations" "Relief"
[1] "of" "the" "United" "States" "Maritime"
[1] "lend-lease," "the" "United" "Nations" "Relief"
[1] "<p>" "The" "United" "States" "now"
[1] "for" "the" "United" "States" "Maritime"
[1] "Water" "Commission," "United" "States" "and"
[1] "from" "the" "United" "States" "or"
[1] "to" "the" "United" "States." "Credits"
[1] "to" "the" "United" "Kingdom" "includes"
[1] "by" "the" "United" "Kingdom" "from"
[1] "by" "the" "United" "Kingdom" "to"
[1] "to" "the" "United" "States" "since"
[1] "to" "the" "United" "Kingdom" "is"
[1] "appropriations" "to" "United" "Nations"
[5] "Relief"
[1] "of" "the" "United" "States." "In"
[1] "from" "the" "United" "States." "The"
[1] "to" "the" "United" "Kingdom" "will"
[1] "assist" "the" "United" "Kingdom" "in"
[1] "which" "the" "United" "Kingdom" "will"
[1] "that" "the" "United" "States" "will"
[1] "of" "the" "United" "Nations" "and"
[1] "for" "the" "United" "Nations" "has"
[1] "Harry S. Truman, 1947"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "who,"
[1] "of" "the" "United" "States." "The"
[1] "of" "the" "United" "States." "What"
[1] "that" "the" "United" "States" "is"
[1] "that" "the" "United" "States" "will"
[1] "of" "the" "United" "Nations." "<p>"
[1] "<p>" "The" "United" "States" "can"
[1] "that" "the" "United" "States" "has"
[1] "<p>" "The" "United" "States" "has"
[1] "under" "the" "United" "Nations" "has"
[1] "Harry S. Truman, 1948"
[1] "of" "the" "United" "States." "<p>"
[1] "<p>" "The" "United" "States" "has"
[1] "<p>" "The" "United" "States" "has"
[1] "in" "the" "United" "States." "The"
[1] "of" "the" "United" "States" "and"
[1] "reasons" "the" "United" "States" "is"
[1] "to" "the" "United" "Nations." "While"
[1] "that" "the" "United" "States" "can"
[1] "<p>" "The" "United" "States" "is"
[1] "<p>" "The" "United" "States" "has"
[1] "into" "the" "United" "States." "I"
[1] "for" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "that"
[1] "Harry S. Truman, 1949"
[1] "of" "the" "United" "States" "are"
[1] "of" "the" "United" "States" "of"
[1] "of" "the" "United" "States," "going"
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "Nations," "we"
[1] "of" "the" "United" "States." "<p>"
[1] "Harry S. Truman, 1950"
[1] "of" "the" "United" "Nations." "<p>"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "States" "in"
[1] "to" "the" "United" "Nations." "We"
[1] "of" "the" "United" "Nations" "in"
[1] "of" "the" "United" "Nations" "have"
[1] "when" "the" "United" "Nations" "will"
[1] "of" "the" "United" "Nations" "Charter"
[1] "which" "the" "United" "States" "has"
[1] "from" "the" "United" "States," "to"
[1] "in" "the" "United" "States" "today"
[1] "Harry S. Truman, 1951"
[1] "alongside" "their" "United" "Nations" "allies,"
[1] "of" "the" "United" "Nations," "would"
[1] "in" "the" "United" "Nations." "<p>"
[1] "attack" "the" "United" "States" "to"
[1] "to" "the" "United" "States," "Europe"
[1] "of" "the" "united" "forces" "of"
[1] "under" "the" "United" "Nations," "to"
[1] "through" "the" "United" "Nations," "are"
[1] "as" "the" "United" "Nations" "has"
[1] "support" "the" "United" "Nations" "and"
[1] "Harry S. Truman, 1952"
[1] "<p>" "The" "United" "States" "and"
[1] "of" "the" "United" "Nations" "turned"
[1] "of" "the" "United" "Nations" "in"
[1] "<p>" "The" "United" "Nations," "the"
[1] "of" "the" "United" "Nations" "in"
[1] "If" "the" "United" "States" "had"
[1] "of" "the" "United" "Nations." "<p>"
[1] "under" "the" "United" "Nations." "These"
[1] "strong" "and" "united" "Europe." "<p>"
[1] "Harry S. Truman, 1953"
[1] "of" "the" "United" "States:" "<p>"
[1] "of" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "continues"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "<p>"
[1] "situation," "the" "United" "States" "and"
[1] "idea." "The" "United" "States" "has"
[1] "in" "the" "United" "Nations," "to"
[1] "remains" "the" "United" "Nations." "<p>"
[1] "of" "the" "United" "Nations" "to"
[1] "before" "the" "United" "Nations" "could"
[1] "sabotage" "the" "United" "Nations." "It"
[1] "of" "the" "United" "Nations" "to"
[1] "through" "the" "United" "Nations" "itself"
[1] "through" "the" "United" "Nations" "to"
[1] "of" "the" "United" "Nations." "The"
[1] "by" "the" "United" "Nations" "to"
[1] "of" "the" "United" "States." "<p>"
[1] "1949," "the" "United" "States" "was"
[1] "from" "the" "United" "States," "to"
[1] "of" "the" "United" "States," "these"
[1] "in" "the" "United" "Nations" "to"
[1] "in" "the" "United" "Nations," "striving"
[1] "of" "the" "United" "States." "<p>"
[1] "stronger," "more" "united," "more" "attractive"
[1] "of" "a" "united" "people," "a"
[1] "Dwight D. Eisenhower, 1953.5"
[1] "For" "the" "United" "States," "this"
[1] "Korea," "the" "United" "States" "Seventh"
[1] "that" "the" "United" "States" "Navy"
[1] "attack" "the" "United" "Nations" "forces"
[1] "of" "the" "United" "Nations" "Command"
[1] "in" "the" "United" "Nations" "by"
[1] "by" "the" "United" "States" "and"
[1] "required" "the" "United" "States" "Navy"
[1] "of" "our" "United" "Nations" "allies"
[1] "by" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "and"
[1] "between" "the" "United" "States" "and"
[1] "Dwight D. Eisenhower, 1954"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "a" "united" "European" "community,"
[1] "whole," "the" "United" "Nations," "admittedly"
[1] "to" "the" "United" "States." "It"
[1] "peace." "The" "United" "Nations" "deserves"
[1] "of" "the" "United" "States" "were"
[1] "to" "the" "United" "Nations" "General"
[1] "in" "the" "United" "States" "has"
[1] "to" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "who"
[1] "to" "the" "United" "States" "and"
[1] "forfeited" "his" "United" "States" "citizenship."
[1] "Dwight D. Eisenhower, 1955"
[1] "will" "meet" "united" "response." "The"
[1] "of" "the" "United" "Nations," "there"
[1] "under" "the" "United" "Nations" "Charter"
[1] "strengthen" "the" "United" "Nations." "At"
[1] "of" "the" "United" "Nations" "General"
[1] "all" "other" "United" "Nations" "prisoners"
[1] "in" "the" "United" "Nations" "to"
[1] "which" "the" "United" "States" "and"
[1] "through" "the" "United" "Nations," "to"
[1] "Tirelessly," "with" "united" "purpose," "we"
[1] "Dwight D. Eisenhower, 1956"
[1] "of" "the" "United" "States:" "<p>"
[1] "and" "the" "United" "Kingdom." "In"
[1] "of" "the" "United" "Nations," "now"
[1] "Geneva" "under" "United" "Nations" "auspices"
[1] "of" "the" "United" "States" "to"
[1] "In" "the" "United" "Nations" "Subcommittee"
[1] "and" "the" "United" "States" "also"
[1] "7," "the" "United" "Nations" "on"
[1] "friends." "The" "United" "States" "is"
[1] "truly" "reciprocal." "United" "States" "membership"
[1] "of" "the" "United" "States." "<p>"
[1] "Japan" "from" "United" "Nations" "membership."
[1] "of" "the" "United" "States" "Information"
[1] "defenses" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "must"
[1] "of" "the" "United" "States." ""
[1] "Dwight D. Eisenhower, 1957"
[1] "of" "the" "United" "States:" "<p>"
[1] "is" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "will"
[1] "of" "the" "United" "Nations," "serves"
[1] "authorization" "for" "United" "States"
[5] "membership"
[1] "authorize" "full" "United" "States"
[5] "participation"
[1] "of" "the" "United" "States" "Information"
[1] "in" "the" "United" "States" "of"
[1] "neighbors," "the" "United" "States" "cannot"
[1] "within" "the" "United" "Nations." "There,"
[1] "of" "the" "United" "States" "is"
[1] "Dwight D. Eisenhower, 1958"
[1] "to" "the" "United" "States." "Of"
[1] "of" "the" "United" "States." "Rather,"
[1] "of" "the" "United" "States" "to"
[1] "years," "under" "United" "Nations" "auspices,"
[1] "August" "the" "United" "Nations" "General"
[1] "by" "the" "United" "Nations." "As"
[1] "Dwight D. Eisenhower, 1959"
[1] "the" "entire" "United" "States." "<p>"
[1] "of" "a" "united" "people." "<p>"
[1] "as" "the" "United" "States" "is"
[1] "of" "the" "United" "States" "is"
[1] "in" "the" "United" "States." "In"
[1] "government" "is" "united" "in" "the"
[1] "of" "the" "United" "Nations" "and"
[1] "Dwight D. Eisenhower, 1960"
[1] "that" "the" "United" "States" "shall"
[1] "<p>" "The" "United" "States" "is"
[1] "that" "the" "United" "States" "has"
[1] "is" "the" "United" "States" "the"
[1] "attack" "the" "United" "States," "even"
[1] "that" "the" "United" "States," "except"
[1] "Third," "the" "United" "States" "is"
[1] "for" "the" "United" "States" "to"
[1] "of" "the" "United" "States" "will"
[1] "by" "the" "United" "Nations" "to"
[1] "of" "the" "United" "Nations." "<p>"
[1] "Dwight D. Eisenhower, 1961"
[1] "of" "the" "United" "States:" "<p>"
[1] "in" "a" "united" "determination"
[5] "to"
[1] "period," "the" "United" "States" "has"
[1] "office," "the" "United" "States" "was"
[1] "crisis," "the" "United" "States" "government"
[1] "strongly" "supported" "United"
[4] "Nations'" "action--resulting"
[1] "to" "the" "United" "Nations" "led"
[1] "<p>" "The" "United" "Nations" "has"
[1] "<p>" "The" "United" "States" "took"
[1] "<p>" "The" "United" "States" "Information"
[1] "into" "the" "United" "Nations." "Red"
[1] "nations." "The" "United" "States" "government"
[1] "established." "The" "United" "States" "also"
[1] "Today" "the" "United" "States" "has"
[1] "and" "the" "United" "States" "is"
[1] "expected." "<p>" "United" "States" "civil"
[1] "John F. Kennedy, 1961.5"
[1] "of" "the" "United" "Nations" "to"
[1] "of" "the" "United" "Nations" "as"
[1] "War." "The" "United" "States" "would"
[1] "served" "the" "United" "States" "government"
[1] "John F. Kennedy, 1962"
[1] "of" "the" "United" "States;" "<p>"
[1] "<p>" "--the" "united" "strength" "of"
[1] "of" "the" "United" "Nations." "<p>"
[1] "VI." "THE" "UNITED" "NATIONS" "<p>"
[1] "is" "the" "United" "Nations--and" "I"
[1] "of" "the" "United" "Nations," "or"
[1] "than" "the" "United" "States" "of"
[1] "of" "the" "United" "Nations" "was"
[1] "within" "a" "united" "Congo." "This"
[1] "of" "the" "United" "States" "and"
[1] "to" "the" "United" "Nations." "Our"
[1] "Finally," "the" "united" "strength" "of"
[1] "of" "the" "United" "Kingdom," "there"
[1] "in" "the" "United" "States" "if"
[1] "Congress:" "The" "United" "States" "did"
[1] "in" "the" "United" "States" "and"
[1] "over" "the" "United" "States" "of"
[1] "John F. Kennedy, 1963"
[1] "of" "the" "United" "States." "In"
[1] "of" "a" "united" "people" "in"
[1] "and" "the" "United" "States." "For"
[1] "through" "the" "United" "Nations" "of"
[1] "name" "for" "United" "States"
[5] "handouts--that"
[1] "quest," "the" "United" "Nations" "requires"
[1] "Today" "the" "United" "Nations" "is"
[1] "end," "the" "United" "States" "will"
[1] "Lyndon B. Johnson, 1964"
[1] "in" "these" "United" "States;" "as"
[1] "make" "the" "United" "Nations" "a"
[1] "Lyndon B. Johnson, 1965"
[1] "period," "the" "United" "States" "has"
[1] "of" "the" "United" "States." "And"
[1] "of" "the" "United" "Nations." "The"
[1] "of" "the" "United" "Nations" "are"
[1] "of" "the" "United" "States." "<p>"
[1] "Lyndon B. Johnson, 1966"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States--the" "welfare"
[1] "of" "the" "United" "States." "But"
[1] "supreme" "association--the" "United" "Nations."
[5] "<p>"
[1] "of" "the" "United" "States." "<p>"
[1] "that" "the" "United" "States" "lacked"
[1] "to" "the" "United" "Nations" "and"
[1] "Lyndon B. Johnson, 1967"
[1] "at" "the" "United" "Nations" "on"
[1] "and" "the" "United" "States" "is"
[1] "because" "the" "United" "States" "of"
[1] "by" "the" "United" "States," "North"
[1] "by" "the" "United" "Nations," "and"
[1] "Lyndon B. Johnson, 1968"
[1] "borders." "The" "United" "States," "however,"
[1] "last," "the" "United" "States" "and"
[1] "in" "the" "United" "States" "are"
[1] "100" "assistant" "United" "States" "attorneys"
[1] "Lyndon B. Johnson, 1969"
[1] "facing" "the" "United" "States.\"" "Two"
[1] "in" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "to"
[1] "in" "the" "United" "States." "I"
[1] "believe," "are" "united" "in" "the"
[1] "with" "a" "united" "Europe," "to"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States," "Senator"
[1] "Richard Nixon, 1970"
[1] "between" "the" "United" "States" "and"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "should"
[1] "in" "the" "United" "States." "Where"
[1] "Richard Nixon, 1971"
[1] "of" "the" "United" "States" "Congress."
[1] "of" "the" "United" "States" "to"
[1] "Richard Nixon, 1972"
[1] "of" "the" "United" "States." "As"
[1] "of" "the" "United" "States" "or"
[1] "of" "the" "United" "States." "This"
[1] "Richard Nixon, 1973"
[1] "of" "the" "United" "States:" "<p>"
[1] "Richard Nixon, 1974"
[1] "of" "the" "United" "States" "can"
[1] "of" "the" "United" "States." "And"
[1] "in" "the" "United" "States" "of"
[1] "that" "the" "United" "States" "will"
[1] "in" "the" "United" "States" "of"
[1] "1980," "the" "United" "States" "will"
[1] "that" "the" "United" "States" "can"
[1] "as" "the" "United" "States" "is"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States" "or"
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States" "of"
[1] "Gerald R. Ford, 1975"
[1] "spending," "the" "United" "States" "Treasury"
[1] "We," "the" "United" "States," "are"
[1] "Even" "the" "United" "States," "our"
[1] "that" "the" "United" "States" "has"
[1] "in" "the" "United" "States;" "a"
[1] "make" "the" "United" "States" "invulnerable"
[1] "that" "the" "United" "States" "will"
[1] "Gerald R. Ford, 1976"
[1] "is" "the" "United" "States" "of"
[1] "in" "the" "United" "States" "attorneys"
[1] "number" "of" "United" "States" "marshals."
[1] "of" "the" "United" "States" "can"
[1] "world," "our" "United" "States" "intelligence"
[1] "capability," "the" "United" "States" "stands"
[1] "see" "these" "United" "States" "of"
[1] "Gerald R. Ford, 1977"
[1] "that" "the" "United" "States" "has"
[1] "of" "the" "United" "States," "including"
[1] "point." "The" "United" "States," "in"
[1] "with" "the" "United" "Kingdom," "is"
[1] "period" "the" "United" "States" "real"
[1] "by" "the" "United" "States," "our"
[1] "<p>" "The" "United" "States" "can"
[1] "us." "The" "United" "States" "would"
[1] "of" "the" "United" "States" "of"
[1] "Jimmy Carter, 1978"
[1] "of" "the" "United" "States." "I"
[1] "for" "the" "United" "States." "We"
[1] "rights," "the" "United" "States" "will"
[1] "with" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "<p>"
[1] "of" "the" "United" "States." "<p>"
[1] "again," "and" "united" "once" "again."
[1] "of" "the" "United" "States" "flew"
[1] "Jimmy Carter, 1979"
[1] "strong" "and" "united" "America" "still"
[1] "by" "the" "United" "States" "alone."
[1] "as" "a" "united" "people," "working"
[1] "as" "a" "united" "people." "<p>"
[1] "ago," "the" "United" "States" "and"
[1] "self-interest--of" "the" "United"
[4] "States" "and"
[1] "of" "the" "United" "States" "resolve"
[1] "Jimmy Carter, 1980"
[1] "to" "the" "United" "States" "of"
[1] "that" "the" "United" "States" "will"
[1] "clear." "The" "United" "States" "will"
[1] "of" "the" "United" "States;" "secondly,"
[1] "with" "the" "United" "States" "hampers"
[1] "country," "the" "United" "States" "of"
[1] "why" "the" "United" "States" "has"
[1] "of" "the" "United" "States." "I've"
[1] "of" "the" "United" "States" "of"
[1] "integrity." "The" "United" "States" "will"
[1] "for" "the" "United" "States." "<p>"
[1] "in" "the" "United" "States," "and"
[1] "in" "the" "United" "States"
[5] "Constitution--an"
[1] "Jimmy Carter, 1981"
[1] "of" "the" "United" "States:" "<p>"
[1] "Israel," "with" "United" "States'" "assistance,"
[1] "areas" "the" "United" "States" "recorded"
[1] "that" "the" "United" "States" "will"
[1] "in" "the" "United" "States" "have"
[1] "for" "the" "United" "States," "and"
[1] "and" "the" "United" "States" "must"
[1] "of" "the" "United" "States" "has"
[1] "which" "the" "United" "States" "continues"
[1] "developing" "the" "United" "States'" "coal"
[1] "in" "the" "United" "States." "Our"
[1] "leaves" "the" "United" "States" "dependent"
[1] "of" "the" "United" "States" "as"
[1] "developing" "the" "United" "States'" "coal"
[1] "Women." "This" "United" "Nations" "document"
[1] "that" "the" "United" "States" "leads"
[1] "to" "the" "United" "States" "which"
[1] "policy." "The" "United" "States" "Government"
[1] "in" "the" "United" "States" "possessed"
[1] "<p>" "The" "United" "States" "has"
[1] "purpose." "The" "United" "States" "is"
[1] "for" "the" "United" "States" "to"
[1] "includes" "the" "United" "States," "on"
[1] "of" "the" "United" "States." "We"
[1] "that" "the" "United" "States" "has"
[1] "and" "the" "United" "Nations" "Charter,"
[1] "ultimately" "the" "United" "States." "<p>"
[1] "of" "the" "United" "Nations" "General"
[1] "of" "the" "United" "States" "could"
[1] "to" "the" "United" "States." "<p>"
[1] "these," "the" "United" "States" "has"
[1] "<p>" "The" "United" "States" "is"
[1] "for" "the" "United" "States" "in"
[1] "cooperate." "<p>" "United" "States" "relations"
[1] "to" "the" "United" "States," "our"
[1] "<p>" "The" "United" "States" "has"
[1] "to" "the" "United" "States." "<p>"
[1] "to" "the" "United" "States." "During"
[1] "Africa" "the" "United" "States" "continues"
[1] "and" "the" "United" "States." "<p>"
[1] "hope" "the" "United" "States" "this"
[1] "of" "the" "United" "States," "I"
[1] "one," "the" "United" "States" "will"
[1] "in" "the" "United" "States." "And"
[1] "of" "the" "United" "States," "the"
[1] "by" "the" "United" "States," "Japan"
[1] "a" "reliable" "United" "States" "steam"
[1] "<p>" "The" "United" "States" "joined"
[1] "of" "the" "United" "Nations" "Conference"
[1] "to" "the" "United" "States." "The"
[1] "way" "the" "United" "States" "can"
[1] "in" "the" "United" "Nations," "agreement"
[1] "pressures." "The" "United" "States" "continues"
[1] "of" "the" "United" "States" "has"
[1] "of" "the" "United" "States" "in"
[1] "of" "the" "United" "Nations" "have"
[1] "<p>" "--The" "United" "States" "was"
[1] "<p>" "The" "United" "States," "of"
[1] "<p>" "The" "United" "States" "has"
[1] "1980," "the" "United" "States" "provided"
[1] "addition," "the" "United" "States" "joined"
[1] "in" "the" "United" "States." "Although"
[1] "in" "the" "United" "States" "with"
[1] "for" "the" "United" "States" "in"
[1] "year," "the" "United" "States" "accepted"
[1] "into" "the" "United" "States" "125,000"
[1] "by" "the" "United" "States," "we"
[1] "<p>" "The" "United" "States" "has"
[1] "Here" "again," "United" "States" "efforts"
[1] "Pakistan." "The" "United" "States" "is"
[1] "of" "the" "United" "States" "Coordinator"
[1] "and" "the" "United" "States." "<p>"
[1] "by" "the" "United" "States" "Senate."
[1] "Ronald Reagan, 1982"
[1] "Ronald Reagan, 1983"
[1] "of" "the" "United" "States" "has"
[1] "from" "the" "United" "States" "Code."
[1] "of" "the" "United" "States" "to"
[1] "year," "the" "United" "States" "played"
[1] "Ronald Reagan, 1984"
[1] "of" "the" "United" "States" "and"
[1] "change:" "The" "United" "States" "is"
[1] "Ronald Reagan, 1985"
[1] "years" "of" "united" "effort," "the"
[1] "with" "the" "united" "support" "of"
[1] "to" "the" "United" "States" "with"
[1] "from" "the" "United" "States" "Military"
[1] "Ronald Reagan, 1986"
[1] "of" "heart," "united" "in" "spirit,"
[1] "march." "The" "United" "States" "is"
[1] "If" "the" "United" "States" "can"
[1] "Ronald Reagan, 1987"
[1] "of" "the" "United" "States" "of"
[1] "forward." "The" "United" "States" "has"
[1] "and" "the" "United" "States." "Our"
[1] "of" "the" "United" "States" "should"
[1] "hopes." "The" "United" "States" "Constitution"
[1] "of" "the" "United" "States" "so"
[1] "Ronald Reagan, 1988"
[1] "contributions" "the" "United" "States"
[5] "can"
[1] "George H.W. Bush, 1989"
[1] "of" "the" "United" "States" "of"
[1] "George H.W. Bush, 1990"
[1] "learn." "The" "United" "States" "must"
[1] "stronger," "more" "united," "more" "attractive"
[1] "nation," "the" "United" "States" "of"
[1] "George H.W. Bush, 1991"
[1] "of" "the" "United" "States" "Congress."
[1] "with" "12" "United" "Nations" "resolutions,"
[1] "Germany" "is" "united." "Europe" "has"
[1] "and" "the" "United" "Nations," "tried"
[1] "we've" "been" "united" "in" "principle"
[1] "to" "the" "United" "States," "to"
[1] "community" "is" "united." "The" "leadership"
[1] "of" "the" "United" "Nations," "once"
[1] "Yes," "the" "United" "States" "bears"
[1] "only" "the" "United" "States" "of"
[1] "freedom" "are" "united." "We" "move"
[1] "bless" "the" "United" "States" "of"
[1] "George H.W. Bush, 1992"
[1] "power," "the" "United" "States" "of"
[1] "are" "the" "United" "States" "of"
[1] "William J. Clinton, 1993"
[1] "face" "the" "United" "States." "But"
[1] "and" "the" "United" "States" "Congress"
[1] "asking" "the" "United" "States" "Congress"
[1] "of" "the" "United" "States." "And"
[1] "William J. Clinton, 1994"
[1] "in" "the" "United" "States" "of"
[1] "to" "the" "United" "States" "Congress."
[1] "at" "the" "United" "States." "Nor"
[1] "stop" "the" "United" "States" "Congress"
[1] "William J. Clinton, 1995"
[1] "warheads." "The" "United" "States" "will"
[1] "in" "the" "United" "States" "of"
[1] "that" "the" "United" "States" "has"
[1] "the" "entire" "United" "States." "It"
[1] "William J. Clinton, 1996"
[1] "the" "entire" "United" "States" "by"
[1] "in" "the" "United" "States;" "to"
[1] "of" "the" "United" "States" "Military"
[1] "of" "the" "United" "States--to" "honor"
[1] "bless" "the" "United" "States" "of"
[1] "William J. Clinton, 1997"
[1] "King" "and" "United" "Airlines--will"
[5] "be"
[1] "of" "the" "United" "States." "<p>"
[1] "repaid" "the" "United" "States," "three"
[1] "a" "reforming" "United" "Nations." "Every"
[1] "William J. Clinton, 1998"
[1] "of" "the" "United" "States" "wrote:"
[1] "ask" "the" "United" "States" "Senate"
[1] "<p>" "The" "United" "Nations" "weapons"
[1] "to" "the" "United" "Nations." "<p>"
[1] "in" "the" "United" "States" "military,"
[1] "bless" "the" "United" "States." ""
[1] "William J. Clinton, 1999"
[1] "join" "the" "United" "States" "in"
[1] "security." "The" "United" "Nations" "plays"
[1] "and" "more" "united." "This" "year,"
[1] "William J. Clinton, 2000"
[1] "in" "the" "United" "States" "is"
[1] "in" "the" "United" "States" "and"
[1] "George W. Bush, 2001"
[1] "of" "the" "United" "States:" "<p>"
[1] "in" "the" "United" "States" "military."
[1] "George W. Bush, 2001.5"
[1] "of" "the" "United" "States:" "<p>"
[1] "<p>" "The" "United" "States" "respects"
[1] "tonight," "the" "United" "States" "of"
[1] "Deliver" "to" "United" "States" "authorities"
[1] "Give" "the" "United" "States" "full"
[1] "by" "the" "United" "States" "as"
[1] "world." "The" "United" "States" "is"
[1] "as" "the" "United" "States" "of"
[1] "over" "the" "United" "States" "of"
[1] "George W. Bush, 2002"
[1] "of" "the" "United" "States" "military."
[1] "of" "the" "United" "States:" "Even"
[1] "threatening" "the" "United" "States" "and"
[1] "blackmail" "the" "United" "States." "In"
[1] "closer." "The" "United" "States" "of"
[1] "to" "the" "United" "States." "<p>"
[1] "George W. Bush, 2003"
[1] "of" "the" "United" "States." "As"
[1] "to" "the" "United" "States" "and"
[1] "of" "the" "United" "States" "of"
[1] "on" "the" "United" "Nations" "to"
[1] "and" "the" "United" "States" "supports"
[1] "1990s," "the" "United" "States" "relied"
[1] "threaten" "the" "United" "States." "<p>"
[1] "ago," "the" "United" "Nations" "Security"
[1] "for" "the" "United" "Nations" "and"
[1] "<p>" "The" "United" "Nations" "concluded"
[1] "it." "The" "United" "Nations" "concluded"
[1] "by" "the" "United" "Nations." "Iraqi"
[1] "allies." "The" "United" "States" "will"
[1] "of" "the" "United" "States" "military,"
[1] "bless" "the" "United" "States" "of"
[1] "George W. Bush, 2004"
[1] "Inside" "the" "United" "States," "where"
[1] "weapons." "The" "United" "States" "and"
[1] "of" "the" "United" "States," "Great"
[1] "of" "the" "United" "Nations," "ended"
[1] "and" "the" "United" "Nations" "to"
[1] "but" "the" "United" "States" "of"
[1] "involving" "the" "United" "States" "and"
[1] "on" "the" "United" "States," "and"
[1] "from" "the" "United" "Nations." "Had"
[1] "weakening" "the" "United" "Nations" "and"
[1] "George W. Bush, 2005"
[1] "alone," "the" "United" "States" "has"
[1] "to" "the" "United" "States" "Congress."
[1] "ground," "the" "United" "Nations" "and"
[1] "<p>" "The" "United" "States" "has"
[1] "East," "the" "United" "States" "will"
[1] "George W. Bush, 2006"
[1] "so" "the" "United" "States" "of"
[1] "certain:" "the" "United" "States" "will"
[1] "So" "the" "United" "States" "of"
[1] "everywhere," "the" "United" "States" "is"
[1] "in" "the" "United" "States" "placed"
[1] "Nation," "the" "United" "States" "is"
[1] "segregation." "The" "United" "States" "could"
[1] "George W. Bush, 2007"
[1] "OF" "THE" "UNITED" "STATES:" "<p>"
[1] "in" "the" "United" "States" "by"
[1] "And" "the" "United" "States" "Senate"
[1] "inside" "the" "United" "States." "We"
[1] "additional" "4,000" "United" "States" "marines,"
[1] "this" "largely" "united," "in" "our"
[1] "we" "are" "united" "in" "the"
[1] "from" "the" "United" "Nations," "and"
[1] "government." "The" "United" "Nations" "has"
[1] "of" "the" "United" "States." "But"
[1] "of" "the" "United" "States" "of"
[1] "in" "the" "United" "States" "Army."
[1] "George W. Bush, 2008"
[1] "ride." "The" "United" "States" "is"
[1] "and" "the" "United" "States" "in"
[1] "of" "the" "United" "States" "that"
[1] "from" "the" "United" "States." "And"
[1] "Barack Obama, 2009"
[1] "of" "the" "United" "States:" "<p>"
[1] "and" "the" "United" "States" "of"
[1] "Americans" "are" "united" "in" "sending"
[1] "that" "the" "United" "States" "of"
[1] "Bless" "the" "United" "States" "of"
[1] "Barack Obama, 2010"
[1] "in" "the" "United" "States" "of"
[1] "for" "the" "United" "States" "of"
[1] "in" "the" "United" "States" "of"
[1] "issue" "has" "united" "this" "country"
[1] "deterrent," "the" "United" "States" "and"
[1] "is" "more" "united," "and" "the"
[1] "Bless" "the" "United" "States" "of"
[1] "Barack Obama, 2011"
[1] "in" "the" "United" "States." "And"
[1] "clear:" "The" "United" "States" "of"
[1] "nation" "is" "united" "in" "support"
[1] "bless" "the" "United" "States" "of"
[1] "Barack Obama, 2012"
[1] "made" "the" "United" "States" "safer"
[1] "in" "the" "United" "States" "but"
[1] "whether" "the" "United" "States" "would"
[1] "nothing" "the" "United" "States" "of"
[1] "of" "the" "United" "States" "of"
[1] "bless" "the" "United" "States" "of"
[1] "Barack Obama, 2013"
[1] "of" "the" "United" "States" "of"
[1] "than" "the" "United" "States" "of"
[1] "we" "stand" "united" "in" "saluting"
[1] "coalition" "stands" "united" "in" "demanding"
[1] "So" "the" "United" "States" "will"
[1] "in" "the" "United" "States." "I"
[1] "of" "the" "United" "States" "Armed"
[1] "of" "these" "United" "States," "to"
[1] "bless" "the" "United" "States" "of"
[1] "Barack Obama, 2014"
[1] "effort," "the" "United" "States" "is"
[1] "of" "the" "United" "States" ""
[1] "years," "the" "United" "States" "has"
[1] "of" "the" "United" "States" "Armed"
[1] "free," "the" "United" "States" "is"
[1] "bless" "the" "United" "States" "of"
[1] "Barack Obama, 2015"
[1] "defend" "the" "United" "States" "of"
[1] "we" "stand" "united" "with" "people"
[1] "we" "are" "united" "in" "this"
[1] "strong" "and" "united" "with" "our"
[1] "announcement:" "The" "United" "States"
[5] "will"
[1] "but" "a" "United" "States" "of"
[1] "are" "the" "United" "States" "of"
[1] "Barack Obama, 2016"
[1] "fact:" "the" "United" "States" "of"
[1] "weaker." "The" "United" "States" "of"
[1] "bless" "the" "United" "States" "of"
[1] "Donald J. Trump, 2017"
[1] "of" "the" "United" "States" "..."
[1] "that" "stands" "united" "in" "condemning"
[1] "years," "the" "United" "States" "will"
[1] "were" "all" "united" "by" "one"
[1] "in" "the" "United" "States" "and"
[1] "withdrawn" "the" "United" "States" "from"
[1] "of" "the" "United" "States." "We"
[1] "to" "the" "United" "States" "should"
[1] "to" "the" "United" "States" "Supreme"
[1] "in" "the" "United" "States" "and"
[1] "of" "the" "United" "States," "financed"
[1] "of" "the" "United" "States" "military"
[1] "represent" "the" "United" "States" "of"
[1] "bless" "the" "United" "States." ""
[1] "Donald J. Trump, 2018"
[1] "of" "the" "United" "States," "and"
[1] "in" "the" "United" "States" "—"
[1] "in" "the" "United" "States." ""
[1] "<p>" "The" "United" "States" "is"
[1] "of" "the" "United" "States," "my"
[1] "of" "the" "United" "States." "<p>"
[1] "in" "the" "United" "Nations" "General"
[1] "Donald J. Trump, 2019"
[1] "of" "the" "United" "States," "and"
[1] "" "The" "United" "States" "economy"
[1] "American" "energy—the" "United" "States" "is"
[1] "in" "the" "United" "States" "—"
[1] "must" "be" "united" "at" "home"
[1] "both" "parties" "united" "for"
[5] "groundbreaking"
[1] "we" "are" "united," "we" "can"
[1] "to" "the" "United" "States." "We"
[1] "into" "the" "United" "States" "and"
[1] "to" "the" "United" "States" "from"
[1] "pass" "the" "United" "States" "Reciprocal"
[1] "in" "the" "United" "States" "within"
[1] "rebuild" "the" "United" "States"
[5] "military—with"
[1] "years," "the" "United" "States" "was"
[1] "buildup," "the" "United" "States" "is"
[1] "ago" "the" "United" "States" "entered"
[1] "that" "the" "United" "States" "is"
[1] "of" "the" "United" "States," "we"
[1] "ago," "the" "United" "States" "officially"
[1] "in" "the" "United" "States," "we"
[1] "withdrew" "the" "United" "States" "from"
We can turn this into a general function and write it to a file.
kwic <- function(word, filename, n) {
out <- ""
for(i in 1:nrow(sotu)){
out <- str_c(out, "\n", sotu$pres[i], ", ", sotu$year[i], "\n")
text <- str_split(sotu$text[i], " ") %>% unlist()
locations <- tolower(text) %>% str_which(word)
if(length(locations) > 0) {
for(l in 1:length(locations)) {
start <- ifelse(locations[l] > n, locations[l] - n, 1)
end <- ifelse(locations[l] + n <= length(text), locations[l] + n, length(text))
line <- str_c(text[start:end], collapse = " ")
out <- str_c(out, line, "\n", collapse = " ")
}
}
}
write(out, filename)
}
kwic("united", "united_5.txt", 2)
kwic("economic", "economic_7.txt", 3)