Problem Set 6: Working with messy data

Overview

This problem set is an opportunity to practice working with real world datasets. You can use a dataset of choice (e.g. from social media, webscraping, from a database, from whitepapers) as an example. With your dataset, complete at least 3 of the following exercises. Document the process of transforming and cleaning the data.

Make a new column based on subsetting or grouping the original data. Use string searches to help with this.

Pivot all or part of the dataframe into either wide or long format.

Using cleaned and wrangled data either a) make a table of the new categories or b) analyze word frequencies.

With an unstructured text field, convert text to lowercase, remove stopwords and analyze the sentiments. Make a custom stopword list to augment an existing stopword list.

Create a clearly labeled, multi-color plot based on your dataset.

Problem Set 6:

This problem set is an opportunity to practice working with real world datasets. You can use a dataset of choice (e.g. from social media, webscraping, from a database, from whitepapers) as an example. With your dataset, complete at least 3 of the following exercises. Document the process of transforming and cleaning the data.

#Installed Packages install.packages(readr)  install.packages(tidyverse) install.packages("janitor") install.packages("data.table")
library(readr)
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.1     ✔ purrr     1.0.1
## ✔ forcats   1.0.0     ✔ stringr   1.5.0
## ✔ ggplot2   3.4.2     ✔ tibble    3.2.1
## ✔ lubridate 1.9.2     ✔ tidyr     1.3.0
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(janitor)
## 
## Attaching package: 'janitor'
## 
## The following objects are masked from 'package:stats':
## 
##     chisq.test, fisher.test
library(data.table)
## 
## Attaching package: 'data.table'
## 
## The following objects are masked from 'package:lubridate':
## 
##     hour, isoweek, mday, minute, month, quarter, second, wday, week,
##     yday, year
## 
## The following objects are masked from 'package:dplyr':
## 
##     between, first, last
## 
## The following object is masked from 'package:purrr':
## 
##     transpose
library(wordcloud2)
library(tm)
## Loading required package: NLP
## 
## Attaching package: 'NLP'
## 
## The following object is masked from 'package:ggplot2':
## 
##     annotate
library(tidytext)
library(dplyr)

Downloading the dataset

The dataset can be downloaded using the following URL: https://dataverse.harvard.edu/api/access/datafile/:persistentId?persistentId=doi:10.7910/DVN/ITLGQV/R6AQQH

Cleaning the dataset

+I was having issues knitting with the TransComp_metadata file data. I don’t know why. It works when I run it, just not when knitting.

TransComp_metadata <- read.csv("C:\\Users\\Test\\OneDrive - University of Maryland\\UMD\\Spring 2023\\ANTH630\\TransComp_metadata.csv")
head(TransComp_metadata)
##                      docid translation final_lang             author authordate
## 1 aeu.ark+=13960=t5h99mx6s           0        eng Saunders, Marshall 1861-1947.
## 2 aeu.ark+=13960=t6nz8zx54           0        eng   Richardson, John 1796-1852.
## 3             chi.48050846           1        dan Rink, H. (Hinrich) 1819-1893.
## 4       coo.31924002883613           1        ger Sanden, Walter von      1888-
## 5       coo.31924003396573           0        eng      Anderson, Ken      1910-
## 6       coo.31924006114809           1        rus    Sologub, Fyodor 1863-1927.
##   latestcomp datetype startdate enddate
## 1       1900        r      1998    1900
## 2       1840        r      1998    1840
## 3       1875        r      1974    1875
## 4       1959        s      1959        
## 5       1961        s      1961        
## 6       1916        r      1975    1916
##                                    imprint imprintdate            locnum
## 1                   Boston|L.C. Page|1900.        1900                  
## 2 Montreal|A.H. Armour and H. Ramsay|1840.        1840                  
## 3                    London|C. Hurst|1974.        1974 E99.E7R5413 1974b
## 4            New York|Longmans Green|1959.        1959      QL737.C2S313
## 5               London|Allen & Unwin|c1961        1961                  
## 6    Westport, Conn.|Greenwood Press|1975.        1975                  
##       oclc place  recordid
## 1 70581082   mau 100310375
## 2 70580854   quc 100310933
## 3  1452182   enk 100731071
## 4  1736670   nyu   9085033
## 5  2200113   enk   9087510
## 6  1322104   ctu  12202855
##                                                                                                                             title
## 1                                                                         Her sailor | a love story / | $c: by Marshall Saunders.
## 2                The Canadian brothers, or, The prophecy fulfilled | a tale of the late American war / | $c: by Major Richardson.
## 3                           Tales and traditions of the Eskimo / | $c: by Henrik Rink ; translated from the Danish by the author.
## 4                                            Ingo; | the story of my otter. | $c: Translated from the German by Desmond I. Vesey]
## 5                                                                                                      The call of the man-eater.
## 6 The created legend / | $c: by Feodor Sologub [i.e. F. K. Teternikov] ; authorized translation from the Russian by John Cournos.
##                                                                          shorttitle
## 1                                                           Her sailor a love story
## 2 The Canadian brothers, or, The prophecy fulfilled a tale of the late American war
## 3                                                Tales and traditions of the Eskimo
## 4                                                       Ingo; the story of my otter
## 5                                                         The call of the man-eater
## 6                                                                The created legend
##   juvenileprob nonficprob decade lang_region lang_subregion pagecount
## 1   0.10537430 0.26527320   1990         eng                      353
## 2   0.02865719 0.21227600   1990         eng                      245
## 3   0.08446701 0.54822934   1970         eur            eur       512
## 4   0.02294549 0.31699282   1950         eur            eur       118
## 5   0.40658520 0.78155110   1960         eng                      296
## 6   0.10764857 0.05050007   1970         eur            eur       328
##   mean_sent_length mean_word_length type_token_ratio inferreddate
## 1         10.18441         4.058808        0.4729950         1998
## 2         23.40611         4.361483        0.4785426         1998
## 3         18.17475         4.184482        0.4303490         1974
## 4         16.88389         4.183326        0.4598292         1959
## 5         16.83707         4.277024        0.4559455         1961
## 6         11.68088         4.479392        0.4689663         1975
view(TransComp_metadata)

?data.frame
## starting httpd help server ... done
tibble(TransComp_metadata)
## # A tibble: 21,313 × 27
##    docid  translation final_lang author authordate latestcomp datetype startdate
##    <chr>        <int> <chr>      <chr>  <chr>           <int> <chr>    <chr>    
##  1 aeu.a…           0 eng        Saund… 1861-1947.       1900 r        1998     
##  2 aeu.a…           0 eng        Richa… 1796-1852.       1840 r        1998     
##  3 chi.4…           1 dan        Rink,… 1819-1893.       1875 r        1974     
##  4 coo.3…           1 ger        Sande… 1888-            1959 s        1959     
##  5 coo.3…           0 eng        Ander… 1910-            1961 s        1961     
##  6 coo.3…           1 rus        Solog… 1863-1927.       1916 r        1975     
##  7 coo.3…           1 fre        Verne… 1828-1905.       1878 r        1976     
##  8 coo.3…           0 eng        Graha… 1859-1932.       1902 r        1976     
##  9 coo.3…           1 fre        Gonco… 1822-1896.       1896 r        1976     
## 10 coo.3…           0 eng        Eliot… 1819-1880.       1880 r        1976     
## # ℹ 21,303 more rows
## # ℹ 19 more variables: enddate <chr>, imprint <chr>, imprintdate <chr>,
## #   locnum <chr>, oclc <dbl>, place <chr>, recordid <int>, title <chr>,
## #   shorttitle <chr>, juvenileprob <dbl>, nonficprob <dbl>, decade <int>,
## #   lang_region <chr>, lang_subregion <chr>, pagecount <int>,
## #   mean_sent_length <dbl>, mean_word_length <dbl>, type_token_ratio <dbl>,
## #   inferreddate <int>
TC_data <- data.frame(TransComp_metadata, row.names = NULL, check.rows = FALSE,
           check.names = TRUE, fix.empty.names = TRUE,
           stringsAsFactors = FALSE)

# Remove whitespace from column names
TC_clean <- clean_names(TC_data)

# Remove rows with missing values
TC_clean <- TC_clean %>% 
  drop_na()
head(TC_clean)
##                      docid translation final_lang             author authordate
## 1 aeu.ark+=13960=t5h99mx6s           0        eng Saunders, Marshall 1861-1947.
## 2 aeu.ark+=13960=t6nz8zx54           0        eng   Richardson, John 1796-1852.
## 3             chi.48050846           1        dan Rink, H. (Hinrich) 1819-1893.
## 4       coo.31924002883613           1        ger Sanden, Walter von      1888-
## 5       coo.31924003396573           0        eng      Anderson, Ken      1910-
## 6       coo.31924006114809           1        rus    Sologub, Fyodor 1863-1927.
##   latestcomp datetype startdate enddate
## 1       1900        r      1998    1900
## 2       1840        r      1998    1840
## 3       1875        r      1974    1875
## 4       1959        s      1959        
## 5       1961        s      1961        
## 6       1916        r      1975    1916
##                                    imprint imprintdate            locnum
## 1                   Boston|L.C. Page|1900.        1900                  
## 2 Montreal|A.H. Armour and H. Ramsay|1840.        1840                  
## 3                    London|C. Hurst|1974.        1974 E99.E7R5413 1974b
## 4            New York|Longmans Green|1959.        1959      QL737.C2S313
## 5               London|Allen & Unwin|c1961        1961                  
## 6    Westport, Conn.|Greenwood Press|1975.        1975                  
##       oclc place  recordid
## 1 70581082   mau 100310375
## 2 70580854   quc 100310933
## 3  1452182   enk 100731071
## 4  1736670   nyu   9085033
## 5  2200113   enk   9087510
## 6  1322104   ctu  12202855
##                                                                                                                             title
## 1                                                                         Her sailor | a love story / | $c: by Marshall Saunders.
## 2                The Canadian brothers, or, The prophecy fulfilled | a tale of the late American war / | $c: by Major Richardson.
## 3                           Tales and traditions of the Eskimo / | $c: by Henrik Rink ; translated from the Danish by the author.
## 4                                            Ingo; | the story of my otter. | $c: Translated from the German by Desmond I. Vesey]
## 5                                                                                                      The call of the man-eater.
## 6 The created legend / | $c: by Feodor Sologub [i.e. F. K. Teternikov] ; authorized translation from the Russian by John Cournos.
##                                                                          shorttitle
## 1                                                           Her sailor a love story
## 2 The Canadian brothers, or, The prophecy fulfilled a tale of the late American war
## 3                                                Tales and traditions of the Eskimo
## 4                                                       Ingo; the story of my otter
## 5                                                         The call of the man-eater
## 6                                                                The created legend
##   juvenileprob nonficprob decade lang_region lang_subregion pagecount
## 1   0.10537430 0.26527320   1990         eng                      353
## 2   0.02865719 0.21227600   1990         eng                      245
## 3   0.08446701 0.54822934   1970         eur            eur       512
## 4   0.02294549 0.31699282   1950         eur            eur       118
## 5   0.40658520 0.78155110   1960         eng                      296
## 6   0.10764857 0.05050007   1970         eur            eur       328
##   mean_sent_length mean_word_length type_token_ratio inferreddate
## 1         10.18441         4.058808        0.4729950         1998
## 2         23.40611         4.361483        0.4785426         1998
## 3         18.17475         4.184482        0.4303490         1974
## 4         16.88389         4.183326        0.4598292         1959
## 5         16.83707         4.277024        0.4559455         1961
## 6         11.68088         4.479392        0.4689663         1975
view(TC_clean)

1. Make a new column based on subsetting or grouping the original data. Use string searches to help with this.

Read in the new Data

ma <- read.delim("C:\\Users\\Test\\OneDrive - University of Maryland\\UMD\\Spring 2023\\ANTH630\\TransComp_metadata.csv") 

ma$author <- ma$Notable.Authors
ma$Movement <- ma$Movements



# Create a new column called "grouping"
TC_clean$grouping <- paste(TC_clean$final_language, TC_clean$decade)

# View the first 10 rows of the new column
head(TC_clean$grouping, n = 10)
##  [1] " 1990" " 1990" " 1970" " 1950" " 1960" " 1970" " 1970" " 1970" " 1970"
## [10] " 1970"

Me trying to be clever

I was trying to linking the data to literary movements and find a way to use data online to do so. I feel like it is possible but too time intensive. I eventually got my dataset to add a new column called Movement but it was largely useless, only matching one row of data Add a new column called Movement to TC_clean dataset Loop through each row in TC_clean dataset. Then Extract the author name from the Author column in TC_clean dataset. Then Search for a row in ma where the author names match. If a matching row is found, set the Movement value in TC_clean to the Movement value in ma

TC_clean$Movement <- NA

for (i in 1:nrow(TC_clean)) {
  author <- TC_clean[i, "author"]
  matching_row <- ma[grep(author, ma$Notable.Authors, ignore.case = TRUE), ]
  if (!is.null(matching_row) && !is.data.frame(matching_row) && length(matching_row) > 0) {
    TC_clean[i, "Movement"] <- matching_row$Movement
  }
}

grep
## function (pattern, x, ignore.case = FALSE, perl = FALSE, value = FALSE, 
##     fixed = FALSE, useBytes = FALSE, invert = FALSE) 
## {
##     pattern <- as.character(pattern)
##     if (is.factor(x) && length(levx <- levels(x)) < length(x) && 
##         !is.na(pattern[1L])) {
##         value <- is.character(idxna <- suppressWarnings(grep(pattern, 
##             NA_character_, ignore.case, perl, value, fixed, useBytes, 
##             invert)))
##         idx <- logical(length(levx))
##         idx[grep(pattern, levx, ignore.case, perl, FALSE, fixed, 
##             useBytes, invert)] <- TRUE
##         idx <- idx[x]
##         if (length(idxna)) 
##             idx[is.na(x)] <- TRUE
##         idx <- which(idx)
##         if (value) {
##             idx <- x[idx]
##             structure(as.character(idx), names = names(idx))
##         }
##         else idx
##     }
##     else {
##         if (!is.character(x)) 
##             x <- structure(as.character(x), names = names(x))
##         .Internal(grep(pattern, x, ignore.case, value, perl, 
##             fixed, useBytes, invert))
##     }
## }
## <bytecode: 0x000001cb54c45078>
## <environment: namespace:base>

Save the updated TC_clean dataset as a new CSV file

write.csv(TC_clean, "TC_c_w.movement.csv", row.names = FALSE)

#Here's what this code does:
 #Create new column using string searches

?str_detect
?case_when
TC_clean <- TC_clean %>% 
  mutate(category = case_when(
    str_detect(author, "Huysmans, J.-K. (Joris-Karl)|Wilde, Oscar") ~ "Decadent",
    str_detect(author, "Dalí, Salvador") ~ "Magical Realism",
    str_detect(author, "Gorky, Maxim|Ostrovsky, Nikola|Sholokhov, Mikhail, Lu Xun, Takiji Kobayashi, Mike Gold") ~ "Socialist Realism",
    TRUE ~ "Other"
  ))
TC_clean
##                         docid translation final_lang
## 1    aeu.ark+=13960=t5h99mx6s           0        eng
## 2    aeu.ark+=13960=t6nz8zx54           0        eng
## 3                chi.48050846           1        dan
## 4          coo.31924002883613           1        ger
## 5          coo.31924003396573           0        eng
## 6          coo.31924006114809           1        rus
## 7          coo.31924006462125           1        fre
## 8          coo.31924006516466           0        eng
## 9          coo.31924007738903           1        fre
## 10         coo.31924008071254           0        eng
## 11         coo.31924008977138           0        eng
## 12         coo.31924009546130           0        eng
## 13         coo.31924013439819           0        eng
## 14         coo.31924013798933           0        eng
## 15         coo.31924014412450           1        fre
## 16         coo.31924021941814           0        eng
## 17         coo.31924022055648           0        eng
## 18         coo.31924022067627           0        eng
## 19         coo.31924032267050           0        eng
## 20         coo.31924051742124           0        eng
## 21         coo.31924059363949           1        rus
## 22         coo.31924060290628           0        eng
## 23         coo.31924062293430           0        eng
## 24         coo.31924064354255           1        rus
## 25         coo.31924064354263           1        rus
## 26         coo.31924064432275           0        eng
## 27         coo.31924067412498           0        eng
## 28         coo.31924070489962           1        sco
## 29         coo.31924075067284           0        eng
## 30         coo.31924077188054           0        eng
## 31         coo.31924085482507           0        eng
## 32         coo.31924090292255           0        eng
## 33         coo.31924091236699           1        ger
## 34         coo.31924094625708           0        eng
## 35         coo.31924102150962           0        eng
## 36         coo.31924108226998           0        eng
## 37         coo.31924109516181           0        eng
## 38         hvd.32044009786534           0        eng
## 39         hvd.32044014321285           0        eng
## 40         hvd.32044019238450           0        eng
## 41         hvd.32044020403630           0        eng
## 42                 hvd.hn1pd6           0        eng
## 43                 hvd.hw6ykc           1        ger
## 44                 hvd.hwki32           1        fre
## 45                 hvd.hx55av           0        eng
## 46         iau.31858004394759           0        eng
## 47         iau.31858004708438           0        eng
## 48         iau.31858005158310           1        fre
## 49         iau.31858007903804           1        rus
## 50         iau.31858009640883           0        eng
## 51         iau.31858013344530           1        chi
## 52         iau.31858014807618           0        eng
## 53         iau.31858014841245           1        ben
## 54         iau.31858015292489           1        fre
## 55         iau.31858015989779           1        ger
## 56         iau.31858026760581           1        ger
## 57         iau.31858054686708           1        nor
## 58         ien.35556016363830           0        eng
## 59         ien.35556025932039           0        eng
## 60         inu.30000000123392           1        fre
## 61         inu.30000000194575           1        rus
## 62         inu.30000000217509           1        rus
## 63         inu.30000000217731           1        rus
## 64         inu.30000000274047           0        eng
## 65         inu.30000000311328           1        heb
## 66         inu.30000000328025           0        eng
## 67         inu.30000000342158           0        eng
## 68         inu.30000000353023           0        eng
## 69         inu.30000000724009           1        rus
## 70         inu.30000000772883           0        eng
## 71         inu.30000000787295           0        eng
## 72         inu.30000000891204           1        rus
## 73         inu.30000000898381           1        fre
## 74         inu.30000000912984           1        ita
## 75         inu.30000000922926           1        fre
## 76         inu.30000000957484           0        eng
## 77         inu.30000000984132           0        eng
## 78         inu.30000000990394           1        ger
## 79         inu.30000000992812           0        eng
## 80         inu.30000001007149           1        rus
## 81         inu.30000001247513           1        ger
## 82         inu.30000001259435           1        rus
## 83         inu.30000001277775           1        fre
## 84         inu.30000001282130           0        eng
## 85         inu.30000001695794           0        eng
## 86         inu.30000001699994           1        fre
## 87         inu.30000001714033           1        fre
## 88         inu.30000002140113           1        por
## 89         inu.30000002144784           1        slv
## 90         inu.30000002186975           0        eng
## 91         inu.30000002192064           1        fre
## 92         inu.30000003097742           1        fre
## 93         inu.30000003128893           1        ger
## 94         inu.30000003137332           1        ger
## 95         inu.30000003139429           0        eng
## 96         inu.30000003515321           0        eng
## 97         inu.30000003923673           0        eng
## 98         inu.30000003956111           0        eng
## 99         inu.30000003977638           1        spa
## 100        inu.30000003986464           1        rus
## 101        inu.30000004055152           1        nor
## 102        inu.30000004084822           1        rus
## 103        inu.30000004272534           1        fre
## 104        inu.30000004283952           0        eng
## 105        inu.30000004303594           1        fre
## 106        inu.30000004317420           0        eng
## 107        inu.30000004357251           1        rus
## 108        inu.30000004375345           0        eng
## 109        inu.30000004380105           0        eng
## 110        inu.30000004394205           0        eng
## 111        inu.30000004401018           0        eng
## 112        inu.30000005020940           1        fre
## 113        inu.30000005053420           0        eng
## 114        inu.30000005069699           1        ger
## 115        inu.30000005082692           1        fre
## 116        inu.30000005092410           0        eng
## 117        inu.30000005098144           0        eng
## 118        inu.30000005342617           1        ger
## 119        inu.30000005346733           0        eng
## 120        inu.30000005374982           0        eng
## 121        inu.30000005477777           0        eng
## 122        inu.30000005484153           0        eng
## 123        inu.30000005495555           1        ger
## 124        inu.30000005497320           0        eng
## 125        inu.30000006111086           1        fre
## 126        inu.30000006173920           0        eng
## 127        inu.30000006225399           1        chi
## 128        inu.30000006633618           0        eng
## 129        inu.30000006742211           0        eng
## 130        inu.30000007046091           0        eng
## 131        inu.30000007066859           1        fre
## 132        inu.30000007088887           0        eng
## 133        inu.30000007095734           0        eng
## 134        inu.30000007136017           1        fre
## 135        inu.30000007136488           1        fre
## 136        inu.30000007137676           0        eng
## 137        inu.30000007149796           1        fre
## 138        inu.30000007157138           0        eng
## 139        inu.30000007162740           1        ger
## 140        inu.30000007179629           1        fre
## 141        inu.30000007182508           0        eng
## 142        inu.30000007185329           0        eng
## 143        inu.30000007188141           1        ara
## 144        inu.30000007188760           0        eng
## 145        inu.30000007190295           0        eng
## 146        inu.30000007199932           0        eng
## 147        inu.30000007200805           1        fre
## 148        inu.30000007222270           1        rus
## 149        inu.30000007691797           1        ger
## 150        inu.30000007709359           1        cze
## 151        inu.30000007714557           0        eng
## 152        inu.30000008566279           1        fre
## 153        inu.30000008735916           0        eng
## 154        inu.30000008749933           0        eng
## 155        inu.30000009096516           1        fre
## 156        inu.30000009102066           1        ara
## 157        inu.30000009109889           1        fre
## 158        inu.30000009170220           0        eng
## 159        inu.30000009570122           1        wel
## 160        inu.30000009584610           1        yid
## 161        inu.30000009587555           1        ara
## 162        inu.30000009613047           0        eng
## 163        inu.30000009621628           1        fre
## 164        inu.30000009629514           0        eng
## 165        inu.30000009648548           1        fre
## 166        inu.30000009660212           0        eng
## 167        inu.30000009665203           0        eng
## 168        inu.30000009687884           1        spa
## 169        inu.30000009698071           1        fre
## 170        inu.30000010393795           0        eng
## 171        inu.30000010406233           1        fre
## 172        inu.30000011355223           1        ger
## 173        inu.30000011366121           0        eng
## 174        inu.30000011374307           0        eng
## 175        inu.30000011383118           0        eng
## 176        inu.30000011395781           1        ger
## 177        inu.30000011411919           0        eng
## 178        inu.30000011493958           0        eng
## 179        inu.30000011497991           1        chi
## 180        inu.30000011510157           1        ita
## 181        inu.30000011523267           0        eng
## 182        inu.30000011761321           0        eng
## 183        inu.30000011763913           0        eng
## 184        inu.30000011772567           1        fre
## 185        inu.30000011860297           1        fre
## 186        inu.30000011913179           0        eng
## 187        inu.30000011918004           0        eng
## 188        inu.30000011921511           0        eng
## 189        inu.30000011922139           1        ger
## 190        inu.30000020655209           0        eng
## 191        inu.30000020674721           0        eng
## 192        inu.30000020678045           0        eng
## 193        inu.30000020698845           1        fre
## 194        inu.30000020699017           1        fre
## 195        inu.30000021359751           0        eng
## 196        inu.30000021397793           1        fre
## 197        inu.30000021405885           1        rus
## 198        inu.30000021407683           1        fre
## 199        inu.30000022298669           1        fre
## 200        inu.30000022305761           0        eng
## 201        inu.30000022631893           1        fre
## 202        inu.30000022645232           0        eng
## 203        inu.30000022660991           1        fre
## 204        inu.30000022684801           0        eng
## 205        inu.30000025839428           0        eng
## 206        inu.30000025844899           0        eng
## 207        inu.30000025845409           1        fre
## 208        inu.30000025849286           0        eng
## 209        inu.30000025858170           0        eng
## 210        inu.30000025865274           1        ukr
## 211        inu.30000025887302           1        chi
## 212        inu.30000025896469           0        eng
## 213        inu.30000025899661           1        ger
## 214        inu.30000026022164           1        ger
## 215        inu.30000026023311           0        eng
## 216        inu.30000026024061           1        spa
## 217        inu.30000026032056           0        eng
## 218        inu.30000026041230           0        eng
## 219        inu.30000026046338           0        eng
## 220        inu.30000026047922           0        eng
## 221        inu.30000026052260           1        fre
## 222        inu.30000026075030           0        eng
## 223        inu.30000026196695           0        eng
## 224        inu.30000026290134           1        nor
## 225        inu.30000026313316           0        eng
## 226        inu.30000026335004           1        fre
## 227        inu.30000026335319           1        ita
## 228        inu.30000026344097           1        fre
## 229        inu.30000027074198           1        ita
## 230        inu.30000027114325           1        fre
## 231        inu.30000027132566           0        eng
## 232        inu.30000027155435           0        eng
## 233        inu.30000027170327           1        rus
## 234        inu.30000027193766           0        eng
## 235        inu.30000027225055           1        cze
## 236        inu.30000027246952           1        spa
## 237        inu.30000027270366           0        eng
## 238        inu.30000027289606           0        eng
## 239        inu.30000027289853           1        ger
## 240        inu.30000027302680           0        eng
## 241        inu.30000027317498           0        eng
## 242        inu.30000027563521           0        eng
## 243        inu.30000028599573           0        eng
## 244        inu.30000029301235           0        eng
## 245        inu.30000029305418           0        eng
## 246        inu.30000029310947           0        eng
## 247        inu.30000029431610           1        ita
## 248        inu.30000029438227           1        fre
## 249        inu.30000029442948           0        eng
## 250        inu.30000029457581           0        eng
## 251        inu.30000029457938           0        eng
## 252        inu.30000029459595           0        eng
## 253        inu.30000029479650           0        eng
## 254        inu.30000029497140           0        eng
## 255        inu.30000029804725           0        eng
## 256        inu.30000029839853           0        eng
## 257        inu.30000029840364           1        fre
## 258        inu.30000029843996           1        fre
## 259        inu.30000029950429           0        eng
## 260        inu.30000035042351           0        eng
## 261        inu.30000035049968           1        gre
## 262        inu.30000035052913           0        eng
## 263        inu.30000035070063           1        rus
## 264        inu.30000035086549           1        gle
## 265        inu.30000035403876           0        eng
## 266        inu.30000035427859           1        dan
## 267        inu.30000035441025           0        eng
## 268        inu.30000035563315           0        eng
## 269        inu.30000035573546           0        eng
## 270        inu.30000035588155           0        eng
## 271        inu.30000035590144           0        eng
## 272        inu.30000035604705           0        eng
## 273        inu.30000036424657           1        rus
## 274        inu.30000036543555           0        eng
## 275        inu.30000036578189           1        rus
## 276        inu.30000036578213           1        pol
## 277        inu.30000036583502           1        ger
## 278        inu.30000036592388           1        fin
## 279        inu.30000036595498           0        eng
## 280        inu.30000036612392           0        eng
## 281        inu.30000036890238           1        rus
## 282        inu.30000036908808           1        cze
## 283        inu.30000036952871           0        eng
## 284        inu.30000036961849           1        rus
## 285        inu.30000036968232           1        srp
## 286        inu.30000037264557           1        rus
## 287        inu.30000037306952           1        rus
## 288        inu.30000037306978           0        eng
## 289        inu.30000037307232           1        rum
## 290        inu.30000037326075           0        eng
## 291        inu.30000037327834           1        rus
## 292        inu.30000037334988           1        hrv
## 293        inu.30000037367731           0        eng
## 294        inu.30000037370461           1        mon
## 295        inu.30000037402074           1        ger
## 296        inu.30000037475500           0        eng
## 297        inu.30000038066969           0        eng
## 298        inu.30000038161802           1        cze
## 299        inu.30000038171710           0        eng
## 300        inu.30000038180323           1        swe
## 301        inu.30000038180703           0        eng
## 302        inu.30000038184283           0        eng
## 303        inu.30000038208058           1        rus
## 304        inu.30000038216788           1        swe
## 305        inu.30000038703165           1        ger
## 306        inu.30000038705707           1        ita
## 307        inu.30000038729186           1        cze
## 308        inu.30000038732156           0        eng
## 309        inu.30000038734996           1        rus
## 310        inu.30000038744680           0        eng
## 311        inu.30000038749259           0        eng
## 312        inu.30000038752162           0        eng
## 313        inu.30000039104595           1        swe
## 314        inu.30000039110865           1        ger
## 315        inu.30000039132257           0        eng
## 316        inu.30000039149848           1        pol
## 317        inu.30000039156389           1        dut
## 318        inu.30000039165398           1        tha
## 319        inu.30000039204940           0        eng
## 320        inu.30000039229756           0        eng
## 321        inu.30000039872555           0        eng
## 322        inu.30000039883941           1        nor
## 323        inu.30000039899012           1        spa
## 324        inu.30000039970862           0        eng
## 325        inu.30000039980044           0        eng
## 326        inu.30000041096318           0        eng
## 327        inu.30000041110531           0        eng
## 328        inu.30000041117528           1        ger
## 329        inu.30000041548490           1        fre
## 330        inu.30000041640875           0        eng
## 331        inu.30000041655147           1        lat
## 332        inu.30000041682075           0        eng
## 333        inu.30000041714811           1        fre
## 334        inu.30000041992367           0        eng
## 335        inu.30000042055453           0        eng
## 336        inu.30000042186399           0        eng
## 337        inu.30000042196935           1        por
## 338        inu.30000042211007           1        vie
## 339        inu.30000042624605           0        eng
## 340        inu.30000042635007           1        nor
## 341        inu.30000042660278           1        chi
## 342        inu.30000042662282           1        fre
## 343        inu.30000042720155           0        eng
## 344        inu.30000042720171           1        ger
## 345        inu.30000042725667           0        eng
## 346        inu.30000042743116           0        eng
## 347        inu.30000042744742           0        eng
## 348        inu.30000042774533           0        eng
## 349        inu.30000042816102           0        eng
## 350        inu.30000042864334           0        eng
## 351        inu.30000042880983           0        eng
## 352        inu.30000042882567           0        eng
## 353        inu.30000043458250           1        ara
## 354        inu.30000043479777           0        eng
## 355        inu.30000043494537           1        hrv
## 356        inu.30000043736507           0        eng
## 357        inu.30000043745011           1        fre
## 358        inu.30000043777162           0        eng
## 359        inu.30000043777170           0        eng
## 360        inu.30000044425795           1        fre
## 361        inu.30000044438459           1        ara
## 362        inu.30000044491003           1        chi
## 363        inu.30000044501546           0        eng
## 364        inu.30000044714826           0        eng
## 365        inu.30000044725970           1        por
## 366        inu.30000044733792           1        fre
## 367        inu.30000044768467           1        spa
## 368        inu.30000044773293           0        eng
## 369        inu.30000044775025           0        eng
## 370        inu.30000045056037           1        jpn
## 371        inu.30000045068065           0        eng
## 372        inu.30000045070913           0        eng
## 373        inu.30000045083668           0        eng
## 374        inu.30000045132705           1        cze
## 375        inu.30000045714122           1        ita
## 376        inu.30000045728684           0        eng
## 377        inu.30000045736588           0        eng
## 378        inu.30000045754318           1        por
## 379        inu.30000047382027           0        eng
## 380        inu.30000047574847           0        eng
## 381        inu.30000047579770           1        fre
## 382        inu.30000047605609           0        eng
## 383        inu.30000047607175           0        eng
## 384        inu.30000047618552           1        ita
## 385        inu.30000047754159           1        fre
## 386        inu.30000047774249           0        eng
## 387        inu.30000047789270           1        cze
## 388        inu.30000047892918           0        eng
## 389        inu.30000048050110           0        eng
## 390        inu.30000048140911           0        eng
## 391        inu.30000048147551           1        fin
## 392        inu.30000048151009           1        rus
## 393        inu.30000048891463           0        eng
## 394        inu.30000048897650           1        swe
## 395        inu.30000048900074           1        fre
## 396        inu.30000048917409           1        fre
## 397        inu.30000050285828           1        fre
## 398        inu.30000050295231           0        eng
## 399        inu.30000050328461           0        eng
## 400        inu.30000050646995           1        pol
## 401        inu.30000050836554           0        eng
## 402        inu.30000050863699           0        eng
## 403        inu.30000050890692           0        eng
## 404        inu.30000050921331           0        eng
## 405        inu.30000052095563           0        eng
## 406        inu.30000052153271           1        fro
## 407        inu.30000053035725           1        gre
## 408        inu.30000053300863           1        ice
## 409        inu.30000053369009           0        eng
## 410        inu.30000054040575           0        eng
## 411        inu.30000054046655           0        eng
## 412        inu.30000054411180           1        fre
## 413        inu.30000054420827           0        eng
## 414        inu.30000054425727           1        grc
## 415        inu.30000054442391           1        fre
## 416        inu.30000054535434           1        fre
## 417        inu.30000055037125           1        fre
## 418        inu.30000055039188           1        heb
## 419        inu.30000055341147           0        eng
## 420        inu.30000055380509           1        fre
## 421        inu.30000055893006           0        eng
## 422        inu.30000055893832           0        eng
## 423        inu.30000055970234           1        fre
## 424        inu.30000056018702           0        eng
## 425        inu.30000056128246           1        fre
## 426        inu.30000056193604           0        eng
## 427        inu.30000056328788           0        eng
## 428        inu.30000056346707           1        fre
## 429        inu.30000056354859           0        eng
## 430        inu.30000056361615           1        dan
## 431        inu.30000056366762           1        rus
## 432        inu.30000056655693           1        zul
## 433        inu.30000056789757           1        spa
## 434        inu.30000056822509           1        fre
## 435        inu.30000057086633           1        fre
## 436        inu.30000057337838           1        chi
## 437        inu.30000057526448           0        eng
## 438        inu.30000060902594           0        eng
## 439        inu.30000060919176           1        fre
## 440        inu.30000061221127           0        eng
## 441        inu.30000061582304           1        fre
## 442        inu.30000061597831           0        eng
## 443        inu.30000061706366           1        fre
## 444        inu.30000062255637           1        fre
## 445        inu.30000062303163           0        eng
## 446        inu.30000064243193           0        eng
## 447        inu.30000064256161           0        eng
## 448        inu.30000064292125           0        eng
## 449        inu.30000065025425           1        ger
## 450        inu.30000065072641           0        eng
## 451        inu.30000066006655           0        eng
## 452        inu.30000066055785           1        rus
## 453        inu.30000066065800           0        eng
## 454        inu.30000067189047           1        dut
## 455        inu.30000067189674           1        por
## 456        inu.30000067202618           0        eng
## 457        inu.30000067228340           1        fre
## 458        inu.30000067279939           0        eng
## 459        inu.30000067339469           0        eng
## 460        inu.30000067702609           1        ven
## 461        inu.30000067765259           0        eng
## 462        inu.30000067779011           0        eng
## 463        inu.30000068229586           1        dut
## 464        inu.30000068558372           1        fre
## 465        inu.30000068573405           1        ger
## 466        inu.30000068976590           0        eng
## 467        inu.30000070190057           1        rus
## 468        inu.30000070190065           1        rus
## 469        inu.30000070190073           1        rus
## 470        inu.30000071010791           1        hun
## 471        inu.30000076343411           1        hun
## 472        inu.30000076362973           1        spa
## 473        inu.30000076384464           0        eng
## 474        inu.30000076444284           1        rus
## 475        inu.30000077024291           0        eng
## 476        inu.30000077053035           0        eng
## 477        inu.30000077664641           1        hun
## 478        inu.30000077664765           1        hun
## 479        inu.30000077664781           1        hun
## 480        inu.30000077954893           1        tur
## 481        inu.30000078189549           1        afr
## 482        inu.30000078361874           1        fre
## 483        inu.30000078382425           1        spa
## 484        inu.30000078382508           0        eng
## 485        inu.30000078405804           1        slo
## 486        inu.30000078415803           0        eng
## 487        inu.30000078422924           0        eng
## 488        inu.30000078540733           0        eng
## 489        inu.30000078588286           1        heb
## 490        inu.30000079150011           1        rom
## 491        inu.30000079169649           1        fre
## 492        inu.30000079189456           1        dut
## 493        inu.30000079324954           1        dut
## 494        inu.30000079573741           0        eng
## 495        inu.30000080783172           1        chi
## 496        inu.30000080787025           1        fre
## 497        inu.30000080921681           1        fry
## 498        inu.30000081073177           1        spa
## 499        inu.30000081078010           1        spa
## 500        inu.30000081189213           0        eng
## 501        inu.30000081664744           0        eng
## 502        inu.30000081676581           1        rus
## 503        inu.30000081685111           0        eng
## 504        inu.30000081815049           0        eng
## 505        inu.30000082068531           1        spa
## 506        inu.30000082099163           0        eng
## 507        inu.30000082138185           1        rus
## 508        inu.30000082138573           1        lat
## 509        inu.30000082331616           1        ara
## 510        inu.30000082344098           1        gre
## 511        inu.30000082355367           1        ara
## 512        inu.30000083465660           1        mon
## 513        inu.30000083636724           0        eng
## 514        inu.30000083637722           1        ger
## 515        inu.30000083740377           1        ita
## 516        inu.30000083742985           1        ger
## 517        inu.30000083803282           1        nor
## 518        inu.30000083806756           0        eng
## 519        inu.30000083996623           1        ger
## 520        inu.30000084014038           1        ger
## 521        inu.30000084024185           1        rus
## 522        inu.30000084044233           1        fre
## 523        inu.30000084048507           1        ger
## 524        inu.30000084051147           1        ita
## 525        inu.30000084065691           1        ger
## 526        inu.30000084066384           1        ita
## 527        inu.30000085200875           1        tiv
## 528        inu.30000085373219           1        ger
## 529        inu.30000085861015           0        eng
## 530        inu.30000086188426           0        eng
## 531        inu.30000086814096           0        eng
## 532        inu.30000086817388           0        eng
## 533        inu.30000086821372           0        eng
## 534        inu.30000086883620           1        ice
## 535        inu.30000086914417           0        eng
## 536        inu.30000087182360           0        eng
## 537        inu.30000087183665           0        eng
## 538        inu.30000087202325           0        eng
## 539        inu.30000087210492           0        eng
## 540        inu.30000087224949           0        eng
## 541        inu.30000087279331           0        eng
## 542        inu.30000087312512           0        eng
## 543        inu.30000087312926           0        eng
## 544        inu.30000087410985           0        eng
## 545        inu.30000087659094           1        ara
## 546        inu.30000087763235           1        fre
## 547        inu.30000087763318           1        ger
## 548        inu.30000087806026           0        eng
## 549        inu.30000087814954           1        swe
## 550        inu.30000087819359           1        ita
## 551        inu.30000087826388           0        eng
## 552        inu.30000087934737           0        eng
## 553        inu.30000088034354           1        fre
## 554        inu.30000088050178           1        ger
## 555        inu.30000088073204           1        ara
## 556        inu.30000088073212           1        ara
## 557        inu.30000088073246           1        ara
## 558        inu.30000088073311           1        ara
## 559        inu.30000088085224           1        cat
## 560        inu.30000092510852           1        dan
## 561        inu.30000092515968           0        eng
## 562        inu.30000092565518           1        fre
## 563        inu.30000092630494           1        ger
## 564        inu.30000092631989           0        eng
## 565        inu.30000092634629           0        eng
## 566        inu.30000092634710           1        spa
## 567        inu.30000092650880           1        fre
## 568        inu.30000092654007           0        eng
## 569        inu.30000092661192           1        fre
## 570        inu.30000092664691           0        eng
## 571        inu.30000092664709           0        eng
## 572        inu.30000092684665           0        eng
## 573        inu.30000092688823           1        ita
## 574        inu.30000092699192           1        ger
## 575        inu.30000092761851           0        eng
## 576        inu.30000092761927           0        eng
## 577        inu.30000092770795           1        ukr
## 578        inu.30000092770803           1        ukr
## 579        inu.30000092821457           0        eng
## 580        inu.30000092836323           0        eng
## 581        inu.30000092845373           1        por
## 582        inu.30000092853443           0        eng
## 583        inu.30000092854615           0        eng
## 584        inu.30000092855992           1        ben
## 585        inu.30000093027864           1        nor
## 586        inu.30000093060261           1        fre
## 587        inu.30000093738437           1        rus
## 588        inu.30000093784712           0        eng
## 589        inu.30000093786220           0        eng
## 590        inu.30000093906695           1        rus
## 591        inu.30000094620832           0        eng
## 592        inu.30000094621509           0        eng
## 593        inu.30000094672601           1        fre
## 594        inu.30000094706227           0        eng
## 595        inu.30000094739921           0        eng
## 596        inu.30000094749052           1        ara
## 597        inu.30000094749227           1        ara
## 598        inu.30000094770587           1        per
## 599        inu.30000094814419           1        rus
## 600        inu.30000094863168           0        eng
## 601        inu.30000094865627           0        eng
## 602        inu.30000095170142           1        fre
## 603        inu.30000095199513           0        eng
## 604        inu.30000095225169           0        eng
## 605        inu.30000095317008           0        eng
## 606        inu.30000095371450           0        eng
## 607        inu.30000095390260           0        eng
## 608        inu.30000095630327           1        ger
## 609        inu.30000095823070           0        eng
## 610        inu.30000095824110           0        eng
## 611        inu.30000095833764           0        eng
## 612        inu.30000095840868           0        eng
## 613        inu.30000096418565           1        fre
## 614        inu.30000096504950           0        eng
## 615        inu.30000096578699           0        eng
## 616        inu.30000099842787           0        eng
## 617        inu.30000100437411           0        eng
## 618        inu.30000100478084           0        eng
## 619        inu.30000100487986           0        eng
## 620        inu.30000100570880           0        eng
## 621        inu.30000100601784           0        eng
## 622        inu.30000100604226           0        eng
## 623        inu.30000100608615           1        fre
## 624        inu.30000100612799           1        lit
## 625        inu.30000100635840           1        fre
## 626        inu.30000100681471           0        eng
## 627        inu.30000100685415           1        fre
## 628        inu.30000100855364           1        ger
## 629        inu.30000101073611           1        ara
## 630        inu.30000101080020           0        eng
## 631        inu.30000101101719           0        eng
## 632        inu.30000101130379           0        eng
## 633        inu.30000101585028           0        eng
## 634        inu.30000101870990           1        dut
## 635        inu.30000101897720           1        dut
## 636        inu.30000101927675           1        rus
## 637        inu.30000101956237           1        nor
## 638        inu.30000102860396           1        urd
## 639        inu.30000103028167           0        eng
## 640        inu.30000103141283           0        eng
## 641        inu.30000103145904           1        tur
## 642        inu.30000103162024           0        eng
## 643        inu.30000103165225           1        ara
## 644        inu.30000103174557           0        eng
## 645        inu.30000103174581           1        fre
## 646        inu.30000103852194           1        fre
## 647        inu.30000104170646           0        eng
## 648        inu.30000104203603           1        chi
## 649        inu.30000107245098           0        eng
## 650        inu.30000107312468           0        eng
## 651        inu.30000107314613           0        eng
## 652        inu.30000107316949           1        dut
## 653        inu.30000107317632           0        eng
## 654        inu.30000107354841           1        tur
## 655        inu.30000107357992           1        tur
## 656        inu.30000107358040           1        tur
## 657        inu.30000107358404           1        tur
## 658        inu.30000107358412           1        tur
## 659        inu.30000107358651           0        eng
## 660        inu.30000107389540           0        eng
## 661        inu.30000107396693           0        eng
## 662        inu.30000107490215           0        eng
## 663        inu.30000107497921           0        eng
## 664        inu.30000107603726           1        heb
## 665        inu.30000107604849           1        chi
## 666        inu.30000107609558           0        eng
## 667        inu.30000107641361           0        eng
## 668        inu.30000107642575           1        fre
## 669        inu.30000107644589           0        eng
## 670        inu.30000107647764           1        fin
## 671        inu.30000109105183           0        eng
## 672        inu.30000109119275           1        por
## 673        inu.30000109142582           0        eng
## 674        inu.30000109147219           0        eng
## 675        inu.30000109166615           1        ara
## 676        inu.30000109206866           1        rus
## 677        inu.30000109261119           1        tur
## 678        inu.30000109261127           1        tur
## 679        inu.30000109302723           0        eng
## 680        inu.30000109307763           0        eng
## 681        inu.30000109311500           1        fre
## 682        inu.30000109317507           0        eng
## 683        inu.30000109326144           1        fre
## 684        inu.30000109346381           0        eng
## 685        inu.30000109349682           1        por
## 686        inu.30000109870661           0        eng
## 687        inu.30000109964779           1        nor
## 688        inu.30000109970230           0        eng
## 689        inu.30000109973788           0        eng
## 690        inu.30000110361817           1        ara
## 691        inu.30000110370636           1        fre
## 692        inu.30000110370768           0        eng
## 693        inu.30000110371238           0        eng
## 694        inu.30000110371311           0        eng
## 695        inu.30000110545443           1        nor
## 696        inu.30000110569674           0        eng
## 697        inu.30000110573494           1        chi
## 698        inu.30000110575184           1        ger
## 699        inu.30000110597360           0        eng
## 700        inu.30000110597576           0        eng
## 701        inu.30000110600701           0        eng
## 702        inu.30000110600941           1        ger
## 703        inu.30000110601857           1        dut
## 704        inu.30000111078394           1        swe
## 705        inu.30000111192971           0        eng
## 706        inu.30000111247999           1        dan
## 707        inu.30000111282442           1        fre
## 708        inu.30000111286070           1        nor
## 709        inu.30000111286807           0        eng
## 710        inu.30000111352807           0        eng
## 711        inu.30000111374439           0        eng
## 712        inu.30000111462705           1        ger
## 713        inu.30000111567495           0        eng
## 714        inu.30000111569806           1        hin
## 715        inu.30000111577759           1        urd
## 716        inu.30000111727370           0        eng
## 717        inu.30000111827857           0        eng
## 718        inu.30000111962829           0        eng
## 719        inu.30000111985713           0        eng
## 720        inu.30000111985739           0        eng
## 721        inu.30000111986315           0        eng
## 722        inu.30000111995050           0        eng
## 723        inu.30000113283539           0        eng
## 724        inu.30000113542785           0        eng
## 725        inu.30000114155934           0        eng
## 726        inu.30000114156890           0        eng
## 727        inu.30000114157351           0        eng
## 728        inu.30000114174216           0        eng
## 729        inu.30000114176104           0        eng
## 730        inu.30000114180619           0        eng
## 731        inu.30000114180940           0        eng
## 732        inu.30000114183464           0        eng
## 733        inu.30000114306479           0        eng
## 734        inu.30000114316692           0        eng
## 735        inu.30000114316791           0        eng
## 736        inu.30000114317583           0        eng
## 737        inu.30000114317922           0        eng
## 738        inu.30000114318532           0        eng
## 739        inu.30000114319019           0        eng
## 740        inu.30000114319936           0        eng
## 741        inu.30000114341906           0        eng
## 742        inu.30000114344454           0        eng
## 743        inu.30000114412533           0        eng
## 744        inu.30000114412590           0        eng
## 745        inu.30000114413499           0        eng
## 746        inu.30000114418449           0        eng
## 747        inu.30000114421096           0        eng
## 748        inu.30000114422938           0        eng
## 749        inu.30000114425774           0        eng
## 750        inu.30000114426103           0        eng
## 751        inu.30000114426988           0        eng
## 752        inu.30000114434974           0        eng
## 753        inu.30000114578077           0        eng
## 754        inu.30000114582459           0        eng
## 755        inu.30000114588647           0        eng
## 756        inu.30000115511234           0        eng
## 757        inu.30000115607289           0        eng
## 758        inu.30000115651212           1        fre
## 759        inu.30000115655668           1        fre
## 760        inu.30000115702726           0        eng
## 761        inu.30000115723227           1        cze
## 762        inu.30000115723995           1        nor
## 763        inu.30000115725636           0        eng
## 764        inu.30000116095633           0        eng
## 765        inu.30000116117148           1        spa
## 766        inu.30000116408745           1        hin
## 767        inu.30000116518378           1        vie
## 768        inu.30000116727730           1        fre
## 769        inu.30000116732904           0        eng
## 770        inu.30000116732938           1        rus
## 771        inu.30000116780796           0        eng
## 772        inu.30000116819628           0        eng
## 773        inu.30000116819636           0        eng
## 774        inu.30000116832266           1        srp
## 775        inu.30000116863154           0        eng
## 776        inu.30000117260459           0        eng
## 777        inu.30000117260483           0        eng
## 778        inu.30000117260525           0        eng
## 779        inu.30000117260566           1        pol
## 780        inu.30000117260640           0        eng
## 781        inu.30000117260798           1        rus
## 782        inu.30000117260889           0        eng
## 783        inu.30000117261069           1        rus
## 784        inu.30000117261143           1        rus
## 785        inu.30000117261242           0        eng
## 786        inu.30000117261267           0        eng
## 787        inu.30000117261614           0        eng
## 788        inu.30000117261648           0        eng
## 789        inu.30000117261747           1        rus
## 790        inu.30000117261812           1        rus
## 791        inu.30000117261960           0        eng
## 792        inu.30000117262018           0        eng
## 793        inu.30000117262059           0        eng
## 794        inu.30000117262117           0        eng
## 795        inu.30000117262125           0        eng
## 796        inu.30000117926539           1        ger
## 797        inu.30000118311483           1        pol
## 798        inu.30000118390370           1        nep
## 799        inu.30000118517519           1        hun
## 800        inu.30000118601073           1        fre
## 801        inu.30000118957434           0        eng
## 802        inu.30000120306604           0        eng
## 803        inu.30000120961028           0        eng
## 804        inu.30000120966423           0        eng
## 805        inu.30000120967363           0        eng
## 806        inu.30000122414034           0        eng
## 807        inu.30000122434636           0        eng
## 808        inu.30000122448479           1        slv
## 809        inu.30000122452414           1        afr
## 810        inu.30000122493665           1        rom
## 811        inu.30000122549797           1        ara
## 812        inu.30000122873783           0        eng
## 813        inu.30000122894524           1        ara
## 814        inu.30000122978616           1        jpn
## 815        inu.30000123932448           0        eng
## 816        inu.30000123932455           0        eng
## 817        inu.30000123932513           0        eng
## 818        inu.30000123932638           0        eng
## 819        inu.30000123932737           1        dan
## 820        inu.30000123932745           1        rus
## 821        inu.30000123932752           1        ger
## 822        inu.30000123932786           0        eng
## 823        inu.30000123932844           1        ara
## 824        inu.30000123932927           1        rus
## 825        inu.30000123932992           0        eng
## 826        inu.30000123933024           0        eng
## 827        inu.30000123933057           0        eng
## 828        inu.30000123933073           1        dan
## 829        inu.30000124487749           0        eng
## 830        inu.30000124594304           0        eng
## 831        inu.30000124783501           1        swe
## 832        inu.30000124808860           0        eng
## 833        inu.30000124812276           1        rus
## 834        inu.30000124990932           1        afr
## 835        inu.30000125178271           0        eng
## 836        inu.30000125236913           0        eng
## 837        inu.30000125280895           1        afr
## 838        inu.30000126660459           0        eng
## 839        inu.30000126688328           1        per
## 840        inu.30000126982374           1        dut
## 841        inu.30000127832362           1        rus
## 842        inu.30000128155516           1        dan
## 843        inu.30000128173402           1        nor
## 844        inu.30000128181405           1        dan
## 845        inu.30000130751864           0        eng
## 846        inu.30000132383690           0        eng
## 847        inu.32000000113417           0        eng
## 848        inu.32000000131294           1        fre
## 849        inu.32000000332736           0        eng
## 850        inu.32000000341224           0        eng
## 851        inu.32000000355083           0        eng
## 852        inu.32000000650970           0        eng
## 853        inu.32000000662462           0        eng
## 854        inu.32000000668634           0        eng
## 855        inu.32000000672230           0        eng
## 856        inu.32000000672420           0        eng
## 857        inu.32000000672461           0        eng
## 858        inu.32000000869760           0        eng
## 859        inu.32000000872137           1        pol
## 860        inu.32000000893083           0        eng
## 861        inu.32000000898108           0        eng
## 862        inu.32000000946022           1        ger
## 863        inu.32000000989279           0        eng
## 864        inu.32000000989949           1        ger
## 865        inu.32000000992778           0        eng
## 866        inu.32000001029240           1        eng
## 867        inu.32000001182148           1        ger
## 868        inu.32000001228370           1        ger
## 869        inu.32000001277732           0        eng
## 870        inu.32000001279605           1        rus
## 871        inu.32000001293622           1        swe
## 872        inu.32000001301730           1        ita
## 873        inu.32000001352097           1        ger
## 874        inu.32000001370669           1        fre
## 875        inu.32000001534397           1        ger
## 876        inu.32000001616103           1        ita
## 877        inu.32000001706649           0        eng
## 878        inu.32000001828617           1        fre
## 879        inu.32000001857640           0        eng
## 880        inu.32000002525576           1        ger
## 881        inu.32000002539601           0        eng
## 882        inu.32000002540344           0        eng
## 883        inu.32000002543876           0        eng
## 884        inu.32000002543934           0        eng
## 885        inu.32000002544007           0        eng
## 886        inu.32000002548420           0        eng
## 887        inu.32000002548487           0        eng
## 888        inu.32000002625723           1        fre
## 889        inu.32000002639005           0        eng
## 890        inu.32000002737684           1        geo
## 891        inu.32000002824094           1        ger
## 892        inu.32000002886606           1        fre
## 893        inu.32000002899369           1        fre
## 894        inu.32000002913186           1        rus
## 895        inu.32000002920975           0        eng
## 896        inu.32000002972513           1        fre
## 897        inu.32000002973651           0        eng
## 898        inu.32000003200708           0        eng
## 899        inu.32000003236454           0        eng
## 900        inu.32000003250455           1        ger
## 901        inu.32000003263326           1        rus
## 902        inu.32000003267137           1        ger
## 903        inu.32000003273291           0        eng
## 904        inu.32000003405307           0        eng
## 905        inu.32000003474733           0        eng
## 906        inu.32000003474824           0        eng
## 907        inu.32000004061869           0        eng
## 908        inu.32000004283398           1        yid
## 909        inu.32000004283992           1        dan
## 910        inu.32000004559037           1        tur
## 911        inu.32000004771806           1        por
## 912        inu.32000005545043           1        fre
## 913        inu.32000005556503           0        eng
## 914        inu.32000005755022           1        rus
## 915        inu.32000006188124           0        eng
## 916        inu.32000006215398           1        fre
## 917        inu.32000006225058           1        fre
## 918        inu.32000006226940           1        ger
## 919        inu.32000006230694           1        ger
## 920        inu.32000006459798           1        fre
## 921        inu.32000006708491           0        eng
## 922        inu.32000006712584           1        fre
## 923        inu.32000006723094           0        eng
## 924        inu.32000006737318           0        eng
## 925        inu.32000006738159           1        nor
## 926        inu.32000006742417           1        dan
## 927        inu.32000006902292           0        eng
## 928        inu.32000007068176           1        ara
## 929        inu.32000007189667           0        eng
## 930        inu.32000007264858           0        eng
## 931        inu.32000007280375           1        chi
## 932        inu.32000007285408           1        ger
## 933        inu.32000007295274           0        eng
## 934        inu.32000007300413           0        eng
## 935        inu.32000007300850           1        ger
## 936        inu.32000007350582           1        ger
## 937        inu.32000007357744           0        eng
## 938        inu.32000007357793           1        fre
## 939        inu.32000007383914           1        ger
## 940        inu.32000007470240           0        eng
## 941        inu.32000007536644           0        eng
## 942        inu.32000007577812           0        eng
## 943        inu.32000007703517           1        fre
## 944        inu.32000007704945           0        eng
## 945        inu.32000007715644           0        eng
## 946        inu.32000007722517           1        gre
## 947        inu.32000007748983           1        rus
## 948        inu.32000007753470           1        fre
## 949        inu.32000007775333           0        eng
## 950        inu.32000007933270           0        eng
## 951        inu.32000009077365           0        eng
## 952        inu.32000009079213           0        eng
## 953        inu.32000009098031           0        eng
## 954        inu.32000009187404           0        eng
## 955        inu.32000009262991           0        eng
## 956        inu.32000009290091           0        eng
## 957        inu.32000009374606           0        eng
## 958        inu.32000009471212           1        yid
## 959        inu.32000009524747           1        luo
## 960        inu.32000009526486           0        eng
## 961        inu.32000009526544           0        eng
## 962        inu.32000009540487           0        eng
## 963        inu.32000009545544           0        eng
## 964        inu.32000009559560           0        eng
## 965        inu.32000009614910           0        eng
## 966        inu.32000009634207           0        eng
## 967        inu.32000009842123           1        bul
## 968        inu.32000009850498           0        eng
## 969        inu.32000010045559           0        eng
## 970        inu.32000011205491           1        rus
## 971        inu.32000011206408           1        rus
## 972        inu.32000011331313           0        eng
## 973        inu.32000011506682           0        eng
## 974        inu.32000011584762           0        eng
## 975        inu.32000013140498           0        eng
## 976        inu.32000013140647           1        nor
## 977        inu.32000013150752           1        cze
## 978        inu.32000014236865           0        eng
## 979        inu.32000014248886           1        ger
## 980        inu.32000014254751           1        ger
## 981        inu.32000014440657           1        ger
## 982        inu.39000000059019           0        eng
## 983        inu.39000000059332           0        eng
## 984        inu.39000000079454           1        jpn
## 985        inu.39000000121041           1        ger
## 986        inu.39000000123575           1        ger
## 987        inu.39000000134622           1        rus
## 988        inu.39000000135983           1        yid
## 989        inu.39000000138169           0        eng
## 990        inu.39000000146808           1        ger
## 991        inu.39000000155361           1        rus
## 992        inu.39000000158191           0        eng
## 993        inu.39000000175047           1        afr
## 994        inu.39000000192240           0        eng
## 995        inu.39000000197660           1        ger
## 996        inu.39000000210083           1        fre
## 997        inu.39000000231501           0        eng
## 998        inu.39000000234471           0        eng
## 999        inu.39000000259718           1        ger
## 1000       inu.39000000272356           1        gre
## 1001       inu.39000000300553           0        eng
## 1002       inu.39000000313218           1        ger
## 1003       inu.39000000329636           0        eng
## 1004       inu.39000000338553           1        fre
## 1005       inu.39000000342811           0        eng
## 1006       inu.39000000350780           0        eng
## 1007       inu.39000000359765           0        eng
## 1008       inu.39000000366794           1        rus
## 1009       inu.39000000391446           0        eng
## 1010       inu.39000000468921           1        ger
## 1011       inu.39000000514427           0        eng
## 1012       inu.39000000525985           1        ger
## 1013       inu.39000000530415           0        eng
## 1014       inu.39000000557517           1        fre
## 1015       inu.39000000559570           0        eng
## 1016       inu.39000000600770           1        por
## 1017       inu.39000000611546           1        fre
## 1018       inu.39000000646161           1        fre
## 1019       inu.39000000646567           1        fre
## 1020       inu.39000000663828           1        fre
## 1021       inu.39000000664321           0        eng
## 1022       inu.39000000674551           0        eng
## 1023       inu.39000000675608           1        ger
## 1024       inu.39000000678271           0        eng
## 1025       inu.39000000685862           1        fre
## 1026       inu.39000000687264           0        eng
## 1027       inu.39000000737531           1        cze
## 1028       inu.39000000767181           1        ita
## 1029       inu.39000000774815           0        eng
## 1030       inu.39000000826235           1        afr
## 1031       inu.39000000829940           1        fre
## 1032       inu.39000000836101           1        fre
## 1033       inu.39000000885611           0        eng
## 1034       inu.39000000890728           1        fre
## 1035       inu.39000000905641           0        eng
## 1036       inu.39000000912381           0        eng
## 1037       inu.39000000915889           0        eng
## 1038       inu.39000000933114           0        eng
## 1039       inu.39000000945951           1        fre
## 1040       inu.39000000964671           0        eng
## 1041       inu.39000000965561           1        rus
## 1042       inu.39000000965579           0        eng
## 1043       inu.39000000965595           0        eng
## 1044       inu.39000000965629           1        fre
## 1045       inu.39000000970074           1        rus
## 1046       inu.39000000979737           1        tgk
## 1047       inu.39000000982988           1        ita
## 1048       inu.39000000983929           1        rus
## 1049       inu.39000000984323           1        fre
## 1050       inu.39000000984885           1        rus
## 1051       inu.39000000985460           0        eng
## 1052       inu.39000000985668           1        fre
## 1053       inu.39000000986575           1        ger
## 1054       inu.39000000987003           1        rus
## 1055       inu.39000001000947           0        eng
## 1056       inu.39000001003693           1        fre
## 1057       inu.39000001006282           1        rus
## 1058       inu.39000001006712           1        ita
## 1059       inu.39000001015085           1        rus
## 1060       inu.39000001019822           0        eng
## 1061       inu.39000001020226           0        eng
## 1062       inu.39000001027940           0        eng
## 1063       inu.39000001030548           1        fre
## 1064       inu.39000001030688           1        rus
## 1065       inu.39000001037436           1        fre
## 1066       inu.39000001047393           0        eng
## 1067       inu.39000001049829           1        ger
## 1068       inu.39000001061378           0        eng
## 1069       inu.39000001062152           0        eng
## 1070       inu.39000001094593           1        fre
## 1071       inu.39000001095046           1        ita
## 1072       inu.39000001102792           1        cze
## 1073       inu.39000001119309           1        rus
## 1074       inu.39000001121099           1        fre
## 1075       inu.39000001130710           0        eng
## 1076       inu.39000001134712           1        rus
## 1077       inu.39000001136287           0        eng
## 1078       inu.39000001144422           1        fre
## 1079       inu.39000001160014           1        rus
## 1080       inu.39000001169064           0        eng
## 1081       inu.39000001174544           0        eng
## 1082       inu.39000001180046           1        fre
## 1083       inu.39000001205710           1        rum
## 1084       inu.39000001209886           1        spa
## 1085       inu.39000001229405           0        eng
## 1086       inu.39000001277644           0        eng
## 1087       inu.39000001297642           1        fre
## 1088       inu.39000001302913           0        eng
## 1089       inu.39000001332969           1        rus
## 1090       inu.39000001350128           1        fre
## 1091       inu.39000001399299           0        eng
## 1092       inu.39000001404818           1        ita
## 1093       inu.39000001408884           1        rus
## 1094       inu.39000001415863           0        eng
## 1095       inu.39000001420509           0        eng
## 1096       inu.39000001441737           1        rus
## 1097       inu.39000001478705           1        chi
## 1098       inu.39000001479927           1        ukr
## 1099       inu.39000001502009           1        fre
## 1100       inu.39000001537047           0        eng
## 1101       inu.39000001554596           1        bel
## 1102       inu.39000001592133           1        may
## 1103       inu.39000001596266           1        fre
## 1104       inu.39000001596407           1        fre
## 1105       inu.39000001603765           0        eng
## 1106       inu.39000001606644           0        eng
## 1107       inu.39000001612097           0        eng
## 1108       inu.39000001683379           0        eng
## 1109       inu.39000001731038           1        rus
## 1110       inu.39000001735138           0        eng
## 1111       inu.39000001735179           0        eng
## 1112       inu.39000001737324           1        dan
## 1113       inu.39000001791503           1        ukr
## 1114       inu.39000001799407           1        rus
## 1115       inu.39000001810311           0        eng
## 1116       inu.39000001819015           1        dan
## 1117       inu.39000001834766           1        ukr
## 1118       inu.39000001845168           0        eng
## 1119       inu.39000001857452           1        ice
## 1120       inu.39000001866404           0        eng
## 1121       inu.39000001901532           0        eng
## 1122       inu.39000001919773           1        rus
## 1123       inu.39000001926810           0        eng
## 1124       inu.39000001943385           1        swe
## 1125       inu.39000001956940           1        rus
## 1126       inu.39000001997407           1        luo
## 1127       inu.39000002010242           1        ukr
## 1128       inu.39000002017361           1        fre
## 1129       inu.39000002021447           1        fre
## 1130       inu.39000002050370           0        eng
## 1131       inu.39000002132806           1        fre
## 1132       inu.39000002138969           0        eng
## 1133       inu.39000002159106           0        eng
## 1134       inu.39000002201098           1        ger
## 1135       inu.39000002220668           0        eng
## 1136       inu.39000002220718           1        fre
## 1137       inu.39000002222953           0        eng
## 1138       inu.39000002249733           1        slv
## 1139       inu.39000002293640           1        lat
## 1140       inu.39000002326820           1        fre
## 1141       inu.39000002375496           0        eng
## 1142       inu.39000002429434           1        fre
## 1143       inu.39000002429467           1        fre
## 1144       inu.39000002487671           1        kor
## 1145       inu.39000002531536           1        fro
## 1146       inu.39000002532237           0        eng
## 1147       inu.39000002559065           1        rus
## 1148       inu.39000002591076           0        eng
## 1149       inu.39000002612310           0        eng
## 1150       inu.39000002612757           0        eng
## 1151       inu.39000002619554           1        ger
## 1152       inu.39000002756281           0        eng
## 1153       inu.39000002758519           0        eng
## 1154       inu.39000002769441           1        rus
## 1155       inu.39000002793128           1        rus
## 1156       inu.39000002793136           1        rus
## 1157       inu.39000002802861           0        eng
## 1158       inu.39000002811102           0        eng
## 1159       inu.39000002814346           0        eng
## 1160       inu.39000002815863           1        fre
## 1161       inu.39000002822281           1        luo
## 1162       inu.39000002851082           0        eng
## 1163       inu.39000002901937           1        rus
## 1164       inu.39000002910078           0        eng
## 1165       inu.39000002917081           0        eng
## 1166       inu.39000002929649           0        eng
## 1167       inu.39000002932536           0        eng
## 1168       inu.39000002956220           1        fre
## 1169       inu.39000002997224           1        ita
## 1170       inu.39000003061186           1        fre
## 1171       inu.39000003065534           1        fre
## 1172       inu.39000003093965           0        eng
## 1173       inu.39000003100059           0        eng
## 1174       inu.39000003115107           0        eng
## 1175       inu.39000003121220           1        lat
## 1176       inu.39000003135188           0        eng
## 1177       inu.39000003156127           0        eng
## 1178       inu.39000003184145           0        eng
## 1179       inu.39000003194367           0        eng
## 1180       inu.39000003219339           0        eng
## 1181       inu.39000003231359           1        ger
## 1182       inu.39000003233652           1        fre
## 1183       inu.39000003251019           1        spa
## 1184       inu.39000003273724           0        eng
## 1185       inu.39000003288201           0        eng
## 1186       inu.39000003302531           1        rus
## 1187       inu.39000003348757           1        fre
## 1188       inu.39000003367807           0        eng
## 1189       inu.39000003370579           0        eng
## 1190       inu.39000003374092           1        ita
## 1191       inu.39000003383374           1        ger
## 1192       inu.39000003395287           0        eng
## 1193       inu.39000003441982           1        fre
## 1194       inu.39000003461964           0        eng
## 1195       inu.39000003472425           1        ger
## 1196       inu.39000003472433           1        ita
## 1197       inu.39000003478125           0        eng
## 1198       inu.39000003490237           1        ger
## 1199       inu.39000003512154           0        eng
## 1200       inu.39000003535965           0        eng
## 1201       inu.39000003567521           0        eng
## 1202       inu.39000003569436           0        eng
## 1203       inu.39000003576993           0        eng
## 1204       inu.39000003577892           0        eng
## 1205       inu.39000003578593           0        eng
## 1206       inu.39000003610719           1        dut
## 1207       inu.39000003612632           0        eng
## 1208       inu.39000003673741           0        eng
## 1209       inu.39000003767303           0        eng
## 1210       inu.39000003769721           0        eng
## 1211       inu.39000003774465           1        gre
## 1212       inu.39000003777179           0        eng
## 1213       inu.39000003781478           1        nor
## 1214       inu.39000003797672           0        eng
## 1215       inu.39000003801771           1        chi
## 1216       inu.39000003834384           0        eng
## 1217       inu.39000003856700           0        eng
## 1218       inu.39000003886814           0        eng
## 1219       inu.39000003895609           0        eng
## 1220       inu.39000003946121           0        eng
## 1221       inu.39000003950255           0        eng
## 1222       inu.39000003978702           1        tur
## 1223       inu.39000003982860           0        eng
## 1224       inu.39000003999773           1        ger
## 1225       inu.39000004008970           1        rus
## 1226       inu.39000004019696           1        fre
## 1227       inu.39000004106204           1        pol
## 1228       inu.39000004106758           0        eng
## 1229       inu.39000004120742           0        eng
## 1230       inu.39000004120981           1        est
## 1231       inu.39000004122433           0        eng
## 1232       inu.39000004175233           1        fre
## 1233       inu.39000004198888           0        eng
## 1234       inu.39000004199720           1        por
## 1235       inu.39000004209081           1        fre
## 1236       inu.39000004218520           0        eng
## 1237       inu.39000004244880           0        eng
## 1238       inu.39000004249640           1        fre
## 1239       inu.39000004273715           0        eng
## 1240       inu.39000004278839           0        eng
## 1241       inu.39000004287491           1        spa
## 1242       inu.39000004291717           1        rus
## 1243       inu.39000004292871           1        ger
## 1244       inu.39000004298761           1        ger
## 1245       inu.39000004301243           1        rus
## 1246       inu.39000004302985           0        eng
## 1247       inu.39000004309634           1        rus
## 1248       inu.39000004316720           0        eng
## 1249       inu.39000004322678           1        ger
## 1250       inu.39000004334830           1        ibo
## 1251       inu.39000004342338           1        ger
## 1252       inu.39000004377730           0        eng
## 1253       inu.39000004395559           1        rus
## 1254       inu.39000004410549           1        rus
## 1255       inu.39000004472697           1        fre
## 1256       inu.39000004484924           0        eng
## 1257       inu.39000004507948           0        eng
## 1258       inu.39000004524505           0        eng
## 1259       inu.39000004557125           0        eng
## 1260       inu.39000004570409           0        eng
## 1261       inu.39000004575457           1        est
## 1262       inu.39000004585654           0        eng
## 1263       inu.39000004600024           0        eng
## 1264       inu.39000004602947           0        eng
## 1265       inu.39000004605551           1        ita
## 1266       inu.39000004609405           0        eng
## 1267       inu.39000004614843           1        rus
## 1268       inu.39000004625617           1        pol
## 1269       inu.39000004641358           0        eng
## 1270       inu.39000004655275           0        eng
## 1271       inu.39000004664269           1        cze
## 1272       inu.39000004693987           1        por
## 1273       inu.39000004787813           0        eng
## 1274       inu.39000005020941           0        eng
## 1275       inu.39000005494658           1        rum
## 1276       inu.39000005494831           0        eng
## 1277       inu.39000005494864           0        eng
## 1278       inu.39000005495655           1        chi
## 1279       inu.39000005498550           1        slv
## 1280       inu.39000005505370           1        chi
## 1281       inu.39000005523688           1        per
## 1282       inu.39000005524892           0        eng
## 1283       inu.39000005527820           1        fin
## 1284       inu.39000005536334           0        eng
## 1285       inu.39000005536417           1        rus
## 1286       inu.39000005538306           1        est
## 1287       inu.39000005550483           1        jpn
## 1288       inu.39000005572289           0        eng
## 1289       inu.39000005589499           1        fre
## 1290       inu.39000005594994           1        cze
## 1291       inu.39000005595009           1        cze
## 1292       inu.39000005640169           1        rum
## 1293       inu.39000005648592           0        eng
## 1294       inu.39000005682245           0        eng
## 1295       inu.39000005728576           1        spa
## 1296       inu.39000005734467           1        ara
## 1297       inu.39000005750968           1        swa
## 1298       inu.39000005761296           0        eng
## 1299       inu.39000005765644           0        eng
## 1300       inu.39000005783860           1        ice
## 1301       inu.39000005783878           1        ice
## 1302       inu.39000005785253           1        hun
## 1303       inu.39000005786079           1        tha
## 1304       inu.39000005804732           1        rom
## 1305       inu.39000005804880           1        fre
## 1306       inu.39000005809541           1        hun
## 1307       inu.39000005821538           1        kor
## 1308       inu.39000005821546           1        kor
## 1309       inu.39000005828764           0        eng
## 1310       inu.39000005832105           1        ind
## 1311       inu.39000005852376           1        srp
## 1312       inu.39000005859397           1        cze
## 1313       inu.39000005871095           1        kor
## 1314       inu.39000005878116           0        eng
## 1315       inu.39000005878793           0        eng
## 1316       inu.39000005879940           1        cze
## 1317       inu.39000005883637           1        ger
## 1318       inu.39000005886028           1        fre
## 1319       inu.39000005887414           0        eng
## 1320       inu.39000005889410           0        eng
## 1321       inu.39000005894030           0        eng
## 1322       inu.39000005901892           1        chi
## 1323       inu.39000005903088           1        ger
## 1324       inu.39000005903476           1        ger
## 1325       inu.39000005903799           1        ger
## 1326       inu.39000005904870           0        eng
## 1327       inu.39000005907436           1        ice
## 1328       inu.39000005908830           1        ara
## 1329       inu.39000005909457           1        jpn
## 1330       inu.39000005910372           1        fre
## 1331       inu.39000005910620           1        spa
## 1332       inu.39000005913616           1        dan
## 1333       inu.39000005915439           1        ger
## 1334       inu.39000005915983           1        fre
## 1335       inu.39000005921254           1        fre
## 1336       inu.39000005923417           1        arm
## 1337       inu.39000005926576           1        afr
## 1338       inu.39000005931121           1        kor
## 1339       inu.39000005935494           1        chi
## 1340       inu.39000005935957           0        eng
## 1341       inu.39000005935999           1        ice
## 1342       inu.39000005937011           1        rus
## 1343       inu.39000005937300           1        rus
## 1344       inu.39000005977207           0        eng
## 1345       inu.39000005991570           1        ita
## 1346       inu.39000006084680           0        eng
## 1347       inu.39000006089390           1        ita
## 1348       inu.39000006127802           0        eng
## 1349       inu.39000006128693           1        fre
## 1350       inu.39000008277381           1        rus
## 1351       inu.39000009078408           1        rus
## 1352       inu.39000013061622           0        eng
## 1353       inu.39000013386888           1        spa
## 1354       inu.39000013401729           1        fre
## 1355       inu.39000016093093           0        eng
## 1356       mdp.39015000000284           0        eng
## 1357       mdp.39015000017742           0        eng
## 1358       mdp.39015000017916           1        ger
## 1359       mdp.39015000024581           1        spa
## 1360       mdp.39015000099120           1        rus
## 1361       mdp.39015000099427           1        jpn
## 1362       mdp.39015000128788           1        fre
## 1363       mdp.39015000139900           0        eng
## 1364       mdp.39015000146012           0        eng
## 1365       mdp.39015000146699           0        eng
## 1366       mdp.39015000147044           0        eng
## 1367       mdp.39015000147184           0        eng
## 1368       mdp.39015000147259           1        dan
## 1369       mdp.39015000147358           1        ger
## 1370       mdp.39015000221278           1        ger
## 1371       mdp.39015000221443           1        ger
## 1372       mdp.39015000222185           1        rus
## 1373       mdp.39015000225055           1        ger
## 1374       mdp.39015000225220           1        ger
## 1375       mdp.39015000231632           1        cze
## 1376       mdp.39015000232184           1        swe
## 1377       mdp.39015000235500           0        eng
## 1378       mdp.39015000236680           1        grc
## 1379       mdp.39015000241391           1        ger
## 1380       mdp.39015000248537           1        fre
## 1381       mdp.39015000248545           1        fre
## 1382       mdp.39015000249642           1        por
## 1383       mdp.39015000251796           1        kik
## 1384       mdp.39015000349087           1        ger
## 1385       mdp.39015000350655           0        eng
## 1386       mdp.39015000354582           0        eng
## 1387       mdp.39015000359318           1        ger
## 1388       mdp.39015000363344           0        eng
## 1389       mdp.39015000381890           0        eng
## 1390       mdp.39015000512718           1        ger
## 1391       mdp.39015000512742           1        fre
## 1392       mdp.39015000513336           0        eng
## 1393       mdp.39015000513500           0        eng
## 1394       mdp.39015000513716           0        eng
## 1395       mdp.39015000514391           0        eng
## 1396       mdp.39015000517451           1        kor
## 1397       mdp.39015000517485           1        ita
## 1398       mdp.39015000518244           1        spa
## 1399       mdp.39015000519044           0        eng
## 1400       mdp.39015000519499           1        hrv
## 1401       mdp.39015000523178           1        dut
## 1402       mdp.39015000523368           0        eng
## 1403       mdp.39015000525157           0        eng
## 1404       mdp.39015000527039           1        ger
## 1405       mdp.39015000528466           1        ger
## 1406       mdp.39015000532161           1        dan
## 1407       mdp.39015000534068           1        fre
## 1408       mdp.39015000535859           0        eng
## 1409       mdp.39015000537350           1        spa
## 1410       mdp.39015000537574           1        spa
## 1411       mdp.39015000538705           0        eng
## 1412       mdp.39015000538903           0        eng
## 1413       mdp.39015000538994           0        eng
## 1414       mdp.39015000539356           1        ita
## 1415       mdp.39015000540222           0        eng
## 1416       mdp.39015000540321           0        eng
## 1417       mdp.39015000540651           0        eng
## 1418       mdp.39015000540719           0        eng
## 1419       mdp.39015000540743           0        eng
## 1420       mdp.39015000541071           0        eng
## 1421       mdp.39015000541410           0        eng
## 1422       mdp.39015000541444           0        eng
## 1423       mdp.39015000542368           0        eng
## 1424       mdp.39015000542384           0        eng
## 1425       mdp.39015000542558           0        eng
## 1426       mdp.39015000543127           0        eng
## 1427       mdp.39015000543937           0        eng
## 1428       mdp.39015000545189           0        eng
## 1429       mdp.39015000545460           0        eng
## 1430       mdp.39015000545593           0        eng
## 1431       mdp.39015000545601           0        eng
## 1432       mdp.39015000545742           0        eng
## 1433       mdp.39015000545882           0        eng
## 1434       mdp.39015000546120           0        eng
## 1435       mdp.39015000547730           0        eng
## 1436       mdp.39015000548373           0        eng
## 1437       mdp.39015000549173           0        eng
## 1438       mdp.39015000549207           0        eng
## 1439       mdp.39015000549330           0        eng
## 1440       mdp.39015000549348           0        eng
## 1441       mdp.39015000550361           0        eng
## 1442       mdp.39015000550460           0        eng
## 1443       mdp.39015000551096           0        eng
## 1444       mdp.39015000551112           0        eng
## 1445       mdp.39015000551567           0        eng
## 1446       mdp.39015000555220           1        ger
## 1447       mdp.39015000557382           0        eng
## 1448       mdp.39015000557895           0        eng
## 1449       mdp.39015000561889           1        fre
## 1450       mdp.39015000562358           1        rus
## 1451       mdp.39015000563893           0        eng
## 1452       mdp.39015000567605           0        eng
## 1453       mdp.39015000568868           1        fre
## 1454       mdp.39015000569288           0        eng
## 1455       mdp.39015000570260           1        fre
## 1456       mdp.39015000574825           0        eng
## 1457       mdp.39015000574882           1        rus
## 1458       mdp.39015000574908           0        eng
## 1459       mdp.39015000576184           0        eng
## 1460       mdp.39015000576903           1        ger
## 1461       mdp.39015000577141           0        eng
## 1462       mdp.39015000580103           1        rus
## 1463       mdp.39015000580541           0        eng
## 1464       mdp.39015000581382           1        fre
## 1465       mdp.39015000584022           0        eng
## 1466       mdp.39015000585375           1        fre
## 1467       mdp.39015000585466           1        ind
## 1468       mdp.39015000585540           1        fre
## 1469       mdp.39015000589450           0        eng
## 1470       mdp.39015000592017           1        ita
## 1471       mdp.39015000594930           0        eng
## 1472       mdp.39015000597677           0        eng
## 1473       mdp.39015000598618           0        eng
## 1474       mdp.39015000599103           0        eng
## 1475       mdp.39015000599400           0        eng
## 1476       mdp.39015000599566           0        eng
## 1477       mdp.39015000600406           1        srp
## 1478       mdp.39015000604028           0        eng
## 1479       mdp.39015000604382           0        eng
## 1480       mdp.39015000604747           0        eng
## 1481       mdp.39015000606494           0        eng
## 1482       mdp.39015000607484           0        eng
## 1483       mdp.39015000607898           0        eng
## 1484       mdp.39015000609357           0        eng
## 1485       mdp.39015000609506           0        eng
## 1486       mdp.39015000609571           0        eng
## 1487       mdp.39015000609639           0        eng
## 1488       mdp.39015000610892           0        eng
## 1489       mdp.39015000611239           0        eng
## 1490       mdp.39015000611528           0        eng
## 1491       mdp.39015000611817           0        eng
## 1492       mdp.39015000612583           0        eng
## 1493       mdp.39015000613235           0        eng
## 1494       mdp.39015000613243           0        eng
## 1495       mdp.39015000613268           0        eng
## 1496       mdp.39015000613466           0        eng
## 1497       mdp.39015000613532           0        eng
## 1498       mdp.39015000613730           0        eng
## 1499       mdp.39015000613938           0        eng
## 1500       mdp.39015000614696           0        eng
## 1501       mdp.39015000614779           0        eng
## 1502       mdp.39015000615032           0        eng
## 1503       mdp.39015000615263           0        eng
## 1504       mdp.39015000615271           0        eng
## 1505       mdp.39015000615289           0        eng
## 1506       mdp.39015000617616           0        eng
## 1507       mdp.39015000617699           1        fre
## 1508       mdp.39015000618325           0        eng
## 1509       mdp.39015000618457           0        eng
## 1510       mdp.39015000618473           0        eng
## 1511       mdp.39015000618606           0        eng
## 1512       mdp.39015000618754           0        eng
## 1513       mdp.39015000618820           0        eng
## 1514       mdp.39015000619281           0        eng
## 1515       mdp.39015000620024           0        eng
## 1516       mdp.39015000620776           0        eng
## 1517       mdp.39015000620982           0        eng
## 1518       mdp.39015000621154           1        ger
## 1519       mdp.39015000621162           1        ger
## 1520       mdp.39015000621170           1        ger
## 1521       mdp.39015000621253           0        eng
## 1522       mdp.39015000621337           1        ger
## 1523       mdp.39015000621808           1        rus
## 1524       mdp.39015000624851           0        eng
## 1525       mdp.39015000624919           0        eng
## 1526       mdp.39015000625163           0        eng
## 1527       mdp.39015000625189           0        eng
## 1528       mdp.39015000625221           0        eng
## 1529       mdp.39015000625254           0        eng
## 1530       mdp.39015000626070           0        eng
## 1531       mdp.39015000626286           0        eng
## 1532       mdp.39015000626351           0        eng
## 1533       mdp.39015000626401           0        eng
## 1534       mdp.39015000626492           0        eng
## 1535       mdp.39015000627268           0        eng
## 1536       mdp.39015000627458           0        eng
## 1537       mdp.39015000627508           0        eng
## 1538       mdp.39015000627540           0        eng
## 1539       mdp.39015000627664           0        eng
## 1540       mdp.39015000627714           0        eng
## 1541       mdp.39015000627847           0        eng
## 1542       mdp.39015000628134           1        spa
## 1543       mdp.39015000628662           0        eng
## 1544       mdp.39015000628837           0        eng
## 1545       mdp.39015000631096           0        eng
## 1546       mdp.39015000631153           0        eng
## 1547       mdp.39015000631310           0        eng
## 1548       mdp.39015000631328           0        eng
## 1549       mdp.39015000631567           0        eng
## 1550       mdp.39015000631575           0        eng
## 1551       mdp.39015000631633           0        eng
## 1552       mdp.39015000634413           0        eng
## 1553       mdp.39015000634439           0        eng
## 1554       mdp.39015000635014           0        eng
## 1555       mdp.39015000635246           0        eng
## 1556       mdp.39015000635311           0        eng
## 1557       mdp.39015000635469           0        eng
## 1558       mdp.39015000635477           0        eng
## 1559       mdp.39015000636525           0        eng
## 1560       mdp.39015000636533           0        eng
## 1561       mdp.39015000638711           0        eng
## 1562       mdp.39015000646482           0        eng
## 1563       mdp.39015000647191           0        eng
## 1564       mdp.39015000648108           1        ger
## 1565       mdp.39015000649353           1        cat
## 1566       mdp.39015000653264           0        eng
## 1567       mdp.39015000654106           0        eng
## 1568       mdp.39015000655095           0        eng
## 1569       mdp.39015000655343           0        eng
## 1570       mdp.39015000655376           1        rus
## 1571       mdp.39015000655798           0        eng
## 1572       mdp.39015000655970           0        eng
## 1573       mdp.39015000656127           0        eng
## 1574       mdp.39015000661002           0        eng
## 1575       mdp.39015000661291           0        eng
## 1576       mdp.39015000661697           0        eng
## 1577       mdp.39015000663024           1        per
## 1578       mdp.39015000667041           1        yid
## 1579       mdp.39015000668387           1        rus
## 1580       mdp.39015000668650           1        yid
## 1581       mdp.39015000672793           0        eng
## 1582       mdp.39015000673932           0        eng
## 1583       mdp.39015000673957           1        ind
## 1584       mdp.39015000674310           0        eng
## 1585       mdp.39015000674831           0        eng
## 1586       mdp.39015000677784           0        eng
## 1587       mdp.39015000678162           0        eng
## 1588       mdp.39015000678329           1        fre
## 1589       mdp.39015000682362           0        eng
## 1590       mdp.39015000682446           1        rus
## 1591       mdp.39015000684327           0        eng
## 1592       mdp.39015000685100           0        eng
## 1593       mdp.39015000690498           0        eng
## 1594       mdp.39015000691033           1        fin
## 1595       mdp.39015000691405           1        ger
## 1596       mdp.39015000693070           0        eng
## 1597       mdp.39015000694508           1        rus
## 1598       mdp.39015000694839           1        ger
## 1599       mdp.39015000698020           1        ind
## 1600       mdp.39015000701733           1        ita
## 1601       mdp.39015000813553           0        eng
## 1602       mdp.39015000880503           0        eng
## 1603       mdp.39015000910649           1        rus
## 1604       mdp.39015000910771           0        eng
## 1605       mdp.39015000917495           0        eng
## 1606       mdp.39015000944127           1        jpn
## 1607       mdp.39015000945371           1        chi
## 1608       mdp.39015000946049           1        ger
## 1609       mdp.39015000946064           0        eng
## 1610       mdp.39015000950587           0        eng
## 1611       mdp.39015000956543           0        eng
## 1612       mdp.39015000957574           0        eng
## 1613       mdp.39015001001125           1        fre
## 1614       mdp.39015001002784           0        eng
## 1615       mdp.39015001016222           1        ori
## 1616       mdp.39015001016875           1        nor
## 1617       mdp.39015001028235           1        ger
## 1618       mdp.39015001028987           1        ben
## 1619       mdp.39015001030587           1        rus
## 1620       mdp.39015001032708           0        eng
## 1621       mdp.39015001035115           0        eng
## 1622       mdp.39015001040230           0        eng
## 1623       mdp.39015001044778           0        eng
## 1624       mdp.39015001044968           1        pol
## 1625       mdp.39015001050403           0        eng
## 1626       mdp.39015001057093           1        ice
## 1627       mdp.39015001064651           1        srp
## 1628       mdp.39015001070542           1        rus
## 1629       mdp.39015001075376           1        chi
## 1630       mdp.39015001086175           1        may
## 1631       mdp.39015001086332           1        fre
## 1632       mdp.39015001131195           1        ger
## 1633       mdp.39015001142960           1        swe
## 1634       mdp.39015001143810           1        ger
## 1635       mdp.39015001151276           0        eng
## 1636       mdp.39015001153868           0        eng
## 1637       mdp.39015001159428           0        eng
## 1638       mdp.39015001159501           1        rus
## 1639       mdp.39015001160822           1        fre
## 1640       mdp.39015001162034           0        eng
## 1641       mdp.39015001172561           1        jpn
## 1642       mdp.39015001173205           1        kor
## 1643       mdp.39015001183808           1        fre
## 1644       mdp.39015001192072           1        fre
## 1645       mdp.39015001198319           1        ger
## 1646       mdp.39015001198509           0        eng
## 1647       mdp.39015001215469           0        eng
## 1648       mdp.39015001367427           0        eng
## 1649       mdp.39015001371239           0        eng
## 1650       mdp.39015001371320           1        fre
## 1651       mdp.39015001374779           1        fre
## 1652       mdp.39015001379000           0        eng
## 1653       mdp.39015001389801           0        eng
## 1654       mdp.39015001395592           1        chi
## 1655       mdp.39015001407249           1        cze
## 1656       mdp.39015001418543           1        fre
## 1657       mdp.39015001420242           1        rus
## 1658       mdp.39015001430548           1        fre
## 1659       mdp.39015001506412           0        eng
## 1660       mdp.39015001511420           0        eng
## 1661       mdp.39015001518243           1        ita
## 1662       mdp.39015001523607           1        rus
## 1663       mdp.39015001528077           1        spa
## 1664       mdp.39015001533176           1        fre
## 1665       mdp.39015001534034           0        eng
## 1666       mdp.39015001537060           0        eng
## 1667       mdp.39015001538407           1        chi
## 1668       mdp.39015001548083           1        ita
## 1669       mdp.39015001554149           1        ger
## 1670       mdp.39015001570319           0        eng
## 1671       mdp.39015001570368           1        fre
## 1672       mdp.39015001577363           0        eng
## 1673       mdp.39015001577900           1        ita
## 1674       mdp.39015001585010           1        ger
## 1675       mdp.39015001585069           1        ger
## 1676       mdp.39015001590051           1        ger
## 1677       mdp.39015001590390           0        eng
## 1678       mdp.39015001609513           0        eng
## 1679       mdp.39015001610065           1        fre
## 1680       mdp.39015001612178           0        eng
## 1681       mdp.39015001612541           1        chi
## 1682       mdp.39015001612939           0        eng
## 1683       mdp.39015001613465           1        kor
## 1684       mdp.39015001616245           1        hin
## 1685       mdp.39015001618266           0        eng
## 1686       mdp.39015001619322           0        eng
## 1687       mdp.39015001664393           0        eng
## 1688       mdp.39015001664567           0        eng
## 1689       mdp.39015001671380           1        fre
## 1690       mdp.39015001673287           1        fre
## 1691       mdp.39015001678492           0        eng
## 1692       mdp.39015001680977           0        eng
## 1693       mdp.39015001692915           1        fre
## 1694       mdp.39015001701823           0        eng
## 1695       mdp.39015001721128           1        ara
## 1696       mdp.39015001721540           1        pol
## 1697       mdp.39015001721565           1        fra
## 1698       mdp.39015001741860           0        eng
## 1699       mdp.39015001743098           1        rus
## 1700       mdp.39015001751547           0        eng
## 1701       mdp.39015001752826           1        swe
## 1702       mdp.39015001752966           0        eng
## 1703       mdp.39015001755993           1        fre
## 1704       mdp.39015001770703           1        fre
## 1705       mdp.39015001771412           1        heb
## 1706       mdp.39015001775728           1        afr
## 1707       mdp.39015001776510           0        eng
## 1708       mdp.39015001776932           1        rus
## 1709       mdp.39015001776965           1        rus
## 1710       mdp.39015001780884           1        fre
## 1711       mdp.39015001781056           1        fre
## 1712       mdp.39015001781627           1        fre
## 1713       mdp.39015001785461           1        mal
## 1714       mdp.39015001785578           1        mal
## 1715       mdp.39015001788549           0        eng
## 1716       mdp.39015001792012           0        eng
## 1717       mdp.39015001793424           1        rus
## 1718       mdp.39015001799264           0        eng
## 1719       mdp.39015001799793           1        rus
## 1720       mdp.39015001800542           1        fre
## 1721       mdp.39015001800609           1        jpn
## 1722       mdp.39015001803454           1        fre
## 1723       mdp.39015001807976           1        ita
## 1724       mdp.39015001811580           0        eng
## 1725       mdp.39015001814147           0        eng
## 1726       mdp.39015001815102           1        heb
## 1727       mdp.39015001815474           0        eng
## 1728       mdp.39015001847220           1        gle
## 1729       mdp.39015001981110           0        eng
## 1730       mdp.39015001983504           0        eng
## 1731       mdp.39015001983827           0        eng
## 1732       mdp.39015001988560           1        chi
## 1733       mdp.39015001994667           1        fre
## 1734       mdp.39015001994675           1        fre
## 1735       mdp.39015001995110           0        eng
## 1736       mdp.39015002131103           1        fre
## 1737       mdp.39015002131566           1        gre
## 1738       mdp.39015002132135           0        eng
## 1739       mdp.39015002133182           1        ger
## 1740       mdp.39015002134289           0        eng
## 1741       mdp.39015002138421           1        hin
## 1742       mdp.39015002139965           1        ger
## 1743       mdp.39015002143009           0        eng
## 1744       mdp.39015002143140           1        rus
## 1745       mdp.39015002144056           1        yid
## 1746       mdp.39015002145467           0        eng
## 1747       mdp.39015002148727           0        eng
## 1748       mdp.39015002149113           0        eng
## 1749       mdp.39015002152679           1        chi
## 1750       mdp.39015002152802           0        eng
## 1751       mdp.39015002154931           0        eng
## 1752       mdp.39015002156332           0        eng
## 1753       mdp.39015002157272           0        eng
## 1754       mdp.39015002157488           0        eng
## 1755       mdp.39015002158486           1        ara
## 1756       mdp.39015002164062           0        eng
## 1757       mdp.39015002164591           0        eng
## 1758       mdp.39015002164625           0        eng
## 1759       mdp.39015002171984           1        rus
## 1760       mdp.39015002178104           0        eng
## 1761       mdp.39015002182411           0        eng
## 1762       mdp.39015002183849           1        dut
## 1763       mdp.39015002185158           1        ger
## 1764       mdp.39015002185877           1        spa
## 1765       mdp.39015002187030           0        eng
## 1766       mdp.39015002187956           0        eng
## 1767       mdp.39015002188111           0        eng
## 1768       mdp.39015002189283           0        eng
## 1769       mdp.39015002195215           1        ita
## 1770       mdp.39015002195785           0        eng
## 1771       mdp.39015002197773           1        rus
## 1772       mdp.39015002200320           1        ita
## 1773       mdp.39015002201864           1        rus
## 1774       mdp.39015002203027           1        cze
## 1775       mdp.39015002204702           1        rus
## 1776       mdp.39015002206053           1        ita
## 1777       mdp.39015002206608           0        eng
## 1778       mdp.39015002207408           0        eng
## 1779       mdp.39015002207531           1        rus
## 1780       mdp.39015002209776           0        eng
## 1781       mdp.39015002211830           1        fre
## 1782       mdp.39015002212697           1        yid
## 1783       mdp.39015002215963           0        eng
## 1784       mdp.39015002216219           0        eng
## 1785       mdp.39015002216672           1        ger
## 1786       mdp.39015002216839           1        chi
## 1787       mdp.39015002223561           1        ger
## 1788       mdp.39015002228487           0        eng
## 1789       mdp.39015002231440           0        eng
## 1790       mdp.39015002231705           0        eng
## 1791       mdp.39015002235961           1        jpn
## 1792       mdp.39015002236878           1        gre
## 1793       mdp.39015002239443           0        eng
## 1794       mdp.39015002241803           1        jpn
## 1795       mdp.39015002250242           1        fre
## 1796       mdp.39015002253840           0        eng
## 1797       mdp.39015002254095           1        fre
## 1798       mdp.39015002255688           0        eng
## 1799       mdp.39015002255837           0        eng
## 1800       mdp.39015002256686           1        por
## 1801       mdp.39015002258153           1        spa
## 1802       mdp.39015002262452           1        rus
## 1803       mdp.39015002264037           0        eng
## 1804       mdp.39015002266453           1        non
## 1805       mdp.39015002267139           0        eng
## 1806       mdp.39015002268418           1        chi
## 1807       mdp.39015002269366           1        dut
## 1808       mdp.39015002269713           0        eng
## 1809       mdp.39015002272600           1        ger
## 1810       mdp.39015002273921           0        eng
## 1811       mdp.39015002273988           0        eng
## 1812       mdp.39015002274507           0        eng
## 1813       mdp.39015002280207           0        eng
## 1814       mdp.39015002282039           1        ita
## 1815       mdp.39015002291964           0        eng
## 1816       mdp.39015002293424           0        eng
## 1817       mdp.39015002293861           1        yid
## 1818       mdp.39015002295767           0        eng
## 1819       mdp.39015002298282           1        fre
## 1820       mdp.39015002298381           0        eng
## 1821       mdp.39015002299959           0        eng
## 1822       mdp.39015002299975           0        eng
## 1823       mdp.39015002304064           1        rus
## 1824       mdp.39015002304353           1        ger
## 1825       mdp.39015002309451           1        spa
## 1826       mdp.39015002310236           1        heb
## 1827       mdp.39015002316266           1        fre
## 1828       mdp.39015002316381           1        spa
## 1829       mdp.39015002316878           1        chi
## 1830       mdp.39015002320029           0        eng
## 1831       mdp.39015002323783           1        rus
## 1832       mdp.39015002326166           1        ger
## 1833       mdp.39015002327065           0        eng
## 1834       mdp.39015002327347           1        ger
## 1835       mdp.39015002327834           1        rus
## 1836       mdp.39015002333212           1        lat
## 1837       mdp.39015002334434           1        jpn
## 1838       mdp.39015002334756           0        eng
## 1839       mdp.39015002335092           1        fre
## 1840       mdp.39015002340258           0        eng
## 1841       mdp.39015002340290           0        eng
## 1842       mdp.39015002340456           0        eng
## 1843       mdp.39015002340753           0        eng
## 1844       mdp.39015002341173           1        spa
## 1845       mdp.39015002342130           0        eng
## 1846       mdp.39015002347295           0        eng
## 1847       mdp.39015002347766           1        ger
## 1848       mdp.39015002349713           1        per
## 1849       mdp.39015002374562           1        ind
## 1850       mdp.39015002375338           0        eng
## 1851       mdp.39015002381815           0        eng
## 1852       mdp.39015002383670           1        fre
## 1853       mdp.39015002384017           0        eng
## 1854       mdp.39015002384025           0        eng
## 1855       mdp.39015002384033           0        eng
## 1856       mdp.39015002384165           0        eng
## 1857       mdp.39015002384900           0        eng
## 1858       mdp.39015002385071           0        eng
## 1859       mdp.39015002385691           0        eng
## 1860       mdp.39015002385766           0        eng
## 1861       mdp.39015002385782           0        eng
## 1862       mdp.39015002416470           0        eng
## 1863       mdp.39015002442310           1        rus
## 1864       mdp.39015002522491           1        rus
## 1865       mdp.39015002533928           1        fre
## 1866       mdp.39015002563263           1        ita
## 1867       mdp.39015002577354           0        eng
## 1868       mdp.39015002578824           1        ita
## 1869       mdp.39015002579863           0        eng
## 1870       mdp.39015002580713           1        chi
## 1871       mdp.39015002580838           0        eng
## 1872       mdp.39015002582594           0        eng
## 1873       mdp.39015002586850           0        eng
## 1874       mdp.39015002589144           0        eng
## 1875       mdp.39015002591330           1        rus
## 1876       mdp.39015002601238           0        eng
## 1877       mdp.39015002601485           0        eng
## 1878       mdp.39015002603234           0        eng
## 1879       mdp.39015002606351           1        spa
## 1880       mdp.39015002606377           1        heb
## 1881       mdp.39015002606658           0        eng
## 1882       mdp.39015002609223           1        ita
## 1883       mdp.39015002609231           1        ita
## 1884       mdp.39015002613225           1        heb
## 1885       mdp.39015002625245           1        rus
## 1886       mdp.39015002630328           1        pol
## 1887       mdp.39015002631177           1        rus
## 1888       mdp.39015002650979           1        fre
## 1889       mdp.39015002655531           0        eng
## 1890       mdp.39015002659707           0        eng
## 1891       mdp.39015002661174           0        eng
## 1892       mdp.39015002661273           0        eng
## 1893       mdp.39015002662453           0        eng
## 1894       mdp.39015002662503           0        eng
## 1895       mdp.39015002667940           0        eng
## 1896       mdp.39015002669201           0        eng
## 1897       mdp.39015002676131           1        fre
## 1898       mdp.39015002676586           1        ger
## 1899       mdp.39015002679937           0        eng
## 1900       mdp.39015002679960           1        rus
## 1901       mdp.39015002684549           0        eng
## 1902       mdp.39015002691262           0        eng
## 1903       mdp.39015002692450           1        per
## 1904       mdp.39015002692823           0        eng
## 1905       mdp.39015002699679           1        pol
## 1906       mdp.39015002703190           1        pol
## 1907       mdp.39015002704800           0        eng
## 1908       mdp.39015002704859           0        eng
## 1909       mdp.39015002704875           0        eng
## 1910       mdp.39015002707712           0        eng
## 1911       mdp.39015002709841           0        eng
## 1912       mdp.39015002709858           0        eng
## 1913       mdp.39015002709932           0        eng
## 1914       mdp.39015002710104           0        eng
## 1915       mdp.39015002710260           0        eng
## 1916       mdp.39015002710278           0        eng
## 1917       mdp.39015002710377           0        eng
## 1918       mdp.39015002710567           0        eng
## 1919       mdp.39015002710724           0        eng
## 1920       mdp.39015002710807           0        eng
## 1921       mdp.39015002710963           0        eng
## 1922       mdp.39015002711011           0        eng
## 1923       mdp.39015002712696           0        eng
## 1924       mdp.39015002713280           0        eng
## 1925       mdp.39015002713694           1        fre
## 1926       mdp.39015002714155           0        eng
## 1927       mdp.39015002714221           0        eng
## 1928       mdp.39015002714478           0        eng
## 1929       mdp.39015002714700           0        eng
## 1930       mdp.39015002715566           0        eng
## 1931       mdp.39015002715756           0        eng
## 1932       mdp.39015002715772           0        eng
## 1933       mdp.39015002716234           1        dut
## 1934       mdp.39015002716903           0        eng
## 1935       mdp.39015002716952           0        eng
## 1936       mdp.39015002717448           0        eng
## 1937       mdp.39015002718305           0        eng
## 1938       mdp.39015002719592           0        eng
## 1939       mdp.39015002719634           0        eng
## 1940       mdp.39015002725136           0        eng
## 1941       mdp.39015002725144           0        eng
## 1942       mdp.39015002725193           0        eng
## 1943       mdp.39015002725235           0        eng
## 1944       mdp.39015002725243           0        eng
## 1945       mdp.39015002725284           0        eng
## 1946       mdp.39015002725367           0        eng
## 1947       mdp.39015002725474           0        eng
## 1948       mdp.39015002729005           1        kan
## 1949       mdp.39015002735853           0        eng
## 1950       mdp.39015002735911           0        eng
## 1951       mdp.39015002741653           0        eng
## 1952       mdp.39015002742487           0        eng
## 1953       mdp.39015002742867           0        eng
## 1954       mdp.39015002743105           0        eng
## 1955       mdp.39015002743659           0        eng
## 1956       mdp.39015002749276           0        eng
## 1957       mdp.39015002750134           0        eng
## 1958       mdp.39015002750639           0        eng
## 1959       mdp.39015002750662           0        eng
## 1960       mdp.39015002750696           0        eng
## 1961       mdp.39015002750928           0        eng
## 1962       mdp.39015002751017           0        eng
## 1963       mdp.39015002751025           0        eng
## 1964       mdp.39015002751280           0        eng
## 1965       mdp.39015002753369           0        eng
## 1966       mdp.39015002753401           0        eng
## 1967       mdp.39015002753609           0        eng
## 1968       mdp.39015002753971           0        eng
## 1969       mdp.39015002754045           0        eng
## 1970       mdp.39015002754151           0        eng
## 1971       mdp.39015002754805           0        eng
## 1972       mdp.39015002755190           0        eng
## 1973       mdp.39015002755323           0        eng
## 1974       mdp.39015002756057           0        eng
## 1975       mdp.39015002756065           0        eng
## 1976       mdp.39015002756768           0        eng
## 1977       mdp.39015002756883           0        eng
## 1978       mdp.39015002757386           0        eng
## 1979       mdp.39015002757683           0        eng
## 1980       mdp.39015002757691           0        eng
## 1981       mdp.39015002762196           1        dan
## 1982       mdp.39015002775750           1        grc
## 1983       mdp.39015002780024           0        eng
## 1984       mdp.39015002824400           0        eng
## 1985       mdp.39015002894080           1        fre
## 1986       mdp.39015002968033           0        eng
## 1987       mdp.39015002968751           1        nor
## 1988       mdp.39015002969064           1        fre
## 1989       mdp.39015002969502           1        ger
## 1990       mdp.39015002970203           0        eng
## 1991       mdp.39015002973231           0        eng
## 1992       mdp.39015002981507           1        swe
## 1993       mdp.39015002985169           0        eng
## 1994       mdp.39015002987603           0        eng
## 1995       mdp.39015002994856           1        jpn
## 1996       mdp.39015003231316           0        eng
## 1997       mdp.39015003288241           1        ben
## 1998       mdp.39015003313353           1        rus
## 1999       mdp.39015003341206           0        eng
## 2000       mdp.39015003341222           0        eng
## 2001       mdp.39015003341255           0        eng
## 2002       mdp.39015003341511           0        eng
## 2003       mdp.39015003341610           0        eng
## 2004       mdp.39015003343319           0        eng
## 2005       mdp.39015003343475           0        eng
## 2006       mdp.39015003343541           0        eng
## 2007       mdp.39015003343814           0        eng
## 2008       mdp.39015003343871           0        eng
## 2009       mdp.39015003344051           0        eng
## 2010       mdp.39015003344101           0        eng
## 2011       mdp.39015003344333           0        eng
## 2012       mdp.39015003344622           0        eng
## 2013       mdp.39015003344838           0        eng
## 2014       mdp.39015003345157           0        eng
## 2015       mdp.39015003345223           0        eng
## 2016       mdp.39015003345702           0        eng
## 2017       mdp.39015003345942           0        eng
## 2018       mdp.39015003345959           0        eng
## 2019       mdp.39015003346031           0        eng
## 2020       mdp.39015003346064           0        eng
## 2021       mdp.39015003346098           0        eng
## 2022       mdp.39015003349662           0        eng
## 2023       mdp.39015003349795           0        eng
## 2024       mdp.39015003350108           0        eng
## 2025       mdp.39015003366922           0        eng
## 2026       mdp.39015003448308           1        ger
## 2027       mdp.39015003449090           0        eng
## 2028       mdp.39015003464677           0        eng
## 2029       mdp.39015003465518           1        nor
## 2030       mdp.39015003465526           0        eng
## 2031       mdp.39015003471094           1        ger
## 2032       mdp.39015003471441           0        eng
## 2033       mdp.39015003471599           0        eng
## 2034       mdp.39015003471870           0        eng
## 2035       mdp.39015003473769           1        fre
## 2036       mdp.39015003474783           1        ger
## 2037       mdp.39015003474809           1        swe
## 2038       mdp.39015003474866           0        eng
## 2039       mdp.39015003475699           1        ger
## 2040       mdp.39015003475749           1        ger
## 2041       mdp.39015003477935           0        eng
## 2042       mdp.39015003488916           1        nor
## 2043       mdp.39015003494435           1        dut
## 2044       mdp.39015003494534           0        eng
## 2045       mdp.39015003494690           0        eng
## 2046       mdp.39015003495960           1        dut
## 2047       mdp.39015003496885           0        eng
## 2048       mdp.39015003504399           0        eng
## 2049       mdp.39015003507327           1        fre
## 2050       mdp.39015003507616           1        spa
## 2051       mdp.39015003525261           1        rus
## 2052       mdp.39015003535625           1        rus
## 2053       mdp.39015003535641           1        rus
## 2054       mdp.39015003547422           1        rus
## 2055       mdp.39015003547448           1        rus
## 2056       mdp.39015003547513           1        rus
## 2057       mdp.39015003553826           1        grc
## 2058       mdp.39015003559187           1        rus
## 2059       mdp.39015003566448           1        rus
## 2060       mdp.39015003566612           1        rus
## 2061       mdp.39015003592063           1        gre
## 2062       mdp.39015003595058           0        eng
## 2063       mdp.39015003629154           1        fre
## 2064       mdp.39015003629543           0        eng
## 2065       mdp.39015003634436           0        eng
## 2066       mdp.39015003634485           0        eng
## 2067       mdp.39015003635185           0        eng
## 2068       mdp.39015003636225           1        luo
## 2069       mdp.39015003640110           1        fre
## 2070       mdp.39015003652362           1        fre
## 2071       mdp.39015003655308           1        heb
## 2072       mdp.39015003659755           0        eng
## 2073       mdp.39015003661785           0        eng
## 2074       mdp.39015003661801           0        eng
## 2075       mdp.39015003663013           0        eng
## 2076       mdp.39015003665547           0        eng
## 2077       mdp.39015003671016           1        ger
## 2078       mdp.39015003675363           0        eng
## 2079       mdp.39015003675439           0        eng
## 2080       mdp.39015003675587           0        eng
## 2081       mdp.39015003675785           0        eng
## 2082       mdp.39015003676296           0        eng
## 2083       mdp.39015003676361           0        eng
## 2084       mdp.39015003676429           0        eng
## 2085       mdp.39015003676460           0        eng
## 2086       mdp.39015003676528           0        eng
## 2087       mdp.39015003676676           0        eng
## 2088       mdp.39015003676692           0        eng
## 2089       mdp.39015003676775           0        eng
## 2090       mdp.39015003677146           0        eng
## 2091       mdp.39015003677161           0        eng
## 2092       mdp.39015003677393           0        eng
## 2093       mdp.39015003678128           0        eng
## 2094       mdp.39015003678268           0        eng
## 2095       mdp.39015003678722           0        eng
## 2096       mdp.39015003680587           0        eng
## 2097       mdp.39015003681262           0        eng
## 2098       mdp.39015003681387           0        eng
## 2099       mdp.39015003682120           0        eng
## 2100       mdp.39015003682203           0        eng
## 2101       mdp.39015003682286           0        eng
## 2102       mdp.39015003682526           0        eng
## 2103       mdp.39015003684001           0        eng
## 2104       mdp.39015003684027           1        spa
## 2105       mdp.39015003684837           0        eng
## 2106       mdp.39015003684852           0        eng
## 2107       mdp.39015003686196           0        eng
## 2108       mdp.39015003686311           0        eng
## 2109       mdp.39015003686352           0        eng
## 2110       mdp.39015003686972           0        eng
## 2111       mdp.39015003687517           0        eng
## 2112       mdp.39015003687558           0        eng
## 2113       mdp.39015003687608           1        dan
## 2114       mdp.39015003687723           0        eng
## 2115       mdp.39015003687806           0        eng
## 2116       mdp.39015003687889           0        eng
## 2117       mdp.39015003687913           0        eng
## 2118       mdp.39015003688093           0        eng
## 2119       mdp.39015003688168           0        eng
## 2120       mdp.39015003688200           0        eng
## 2121       mdp.39015003688424           0        eng
## 2122       mdp.39015003688499           0        eng
## 2123       mdp.39015003689281           0        eng
## 2124       mdp.39015003699215           0        eng
## 2125       mdp.39015003699249           0        eng
## 2126       mdp.39015003699488           0        eng
## 2127       mdp.39015003699496           0        eng
## 2128       mdp.39015003699934           0        eng
## 2129       mdp.39015003700005           0        eng
## 2130       mdp.39015003700021           0        eng
## 2131       mdp.39015003700096           0        eng
## 2132       mdp.39015003742726           1        ger
## 2133       mdp.39015003743484           1        jpn
## 2134       mdp.39015003744078           1        ger
## 2135       mdp.39015003745257           0        eng
## 2136       mdp.39015003746875           0        eng
## 2137       mdp.39015003755041           0        eng
## 2138       mdp.39015003763169           0        eng
## 2139       mdp.39015003843599           0        eng
## 2140       mdp.39015003850958           0        eng
## 2141       mdp.39015003855437           0        eng
## 2142       mdp.39015003855452           1        rus
## 2143       mdp.39015003864645           1        rus
## 2144       mdp.39015003871129           0        eng
## 2145       mdp.39015003872416           1        rus
## 2146       mdp.39015003874891           1        pol
## 2147       mdp.39015003882282           1        rus
## 2148       mdp.39015003884395           1        rus
## 2149       mdp.39015003897603           1        jpn
## 2150       mdp.39015003898486           1        rus
## 2151       mdp.39015003899278           0        eng
## 2152       mdp.39015003900084           0        eng
## 2153       mdp.39015003900720           1        fre
## 2154       mdp.39015003900779           1        pol
## 2155       mdp.39015003905638           1        bul
## 2156       mdp.39015003910786           1        rus
## 2157       mdp.39015003912378           1        rus
## 2158       mdp.39015003913202           1        rus
## 2159       mdp.39015003916312           1        cze
## 2160       mdp.39015003916338           1        cze
## 2161       mdp.39015003916395           1        cze
## 2162       mdp.39015003917872           0        eng
## 2163       mdp.39015003919498           1        rus
## 2164       mdp.39015003919837           1        rus
## 2165       mdp.39015003921486           1        rus
## 2166       mdp.39015003922260           1        rus
## 2167       mdp.39015003924993           1        rus
## 2168       mdp.39015003928028           0        eng
## 2169       mdp.39015003928531           0        eng
## 2170       mdp.39015003928663           0        eng
## 2171       mdp.39015003928820           0        eng
## 2172       mdp.39015003928887           0        eng
## 2173       mdp.39015003929489           0        eng
## 2174       mdp.39015003929802           0        eng
## 2175       mdp.39015003930131           0        eng
## 2176       mdp.39015003930669           0        eng
## 2177       mdp.39015003930743           0        eng
## 2178       mdp.39015003931345           0        eng
## 2179       mdp.39015003931493           0        eng
## 2180       mdp.39015003931675           0        eng
## 2181       mdp.39015003932137           0        eng
## 2182       mdp.39015003940551           0        eng
## 2183       mdp.39015003940569           0        eng
## 2184       mdp.39015003941351           0        eng
## 2185       mdp.39015003941518           0        eng
## 2186       mdp.39015003941575           0        eng
## 2187       mdp.39015003941658           0        eng
## 2188       mdp.39015003941732           0        eng
## 2189       mdp.39015003941807           0        eng
## 2190       mdp.39015003941898           0        eng
## 2191       mdp.39015003942128           0        eng
## 2192       mdp.39015003948398           1        chi
## 2193       mdp.39015003948414           1        chi
## 2194       mdp.39015003948919           1        chi
## 2195       mdp.39015003950964           1        ger
## 2196       mdp.39015003956680           1        fre
## 2197       mdp.39015003958462           1        fre
## 2198       mdp.39015003959122           1        ita
## 2199       mdp.39015003972067           0        eng
## 2200       mdp.39015003972075           0        eng
## 2201       mdp.39015003972109           0        eng
## 2202       mdp.39015003972489           1        spa
## 2203       mdp.39015003973123           0        eng
## 2204       mdp.39015003976985           0        eng
## 2205       mdp.39015003977678           0        eng
## 2206       mdp.39015003979112           0        eng
## 2207       mdp.39015003983676           0        eng
## 2208       mdp.39015004001825           0        eng
## 2209       mdp.39015004005883           1        ger
## 2210       mdp.39015004010719           1        grc
## 2211       mdp.39015004011717           1        ita
## 2212       mdp.39015004017342           1        fre
## 2213       mdp.39015004019538           1        fre
## 2214       mdp.39015004022375           1        jpn
## 2215       mdp.39015004034115           1        fre
## 2216       mdp.39015004036581           1        swe
## 2217       mdp.39015004038645           1        fre
## 2218       mdp.39015004039353           1        ger
## 2219       mdp.39015004041102           1        rus
## 2220       mdp.39015004042316           0        eng
## 2221       mdp.39015004042407           1        spa
## 2222       mdp.39015004053222           1        rus
## 2223       mdp.39015004056027           0        eng
## 2224       mdp.39015004066398           0        eng
## 2225       mdp.39015004067339           0        eng
## 2226       mdp.39015004070143           0        eng
## 2227       mdp.39015004070317           1        jpn
## 2228       mdp.39015004072164           0        eng
## 2229       mdp.39015004077924           1        rus
## 2230       mdp.39015004087691           1        fre
## 2231       mdp.39015004093095           1        fre
## 2232       mdp.39015004106830           1        dut
## 2233       mdp.39015004110394           0        eng
## 2234       mdp.39015004111392           1        spa
## 2235       mdp.39015004111640           0        eng
## 2236       mdp.39015004114446           0        eng
## 2237       mdp.39015004116086           0        eng
## 2238       mdp.39015004116722           0        eng
## 2239       mdp.39015004121532           0        eng
## 2240       mdp.39015004121656           0        eng
## 2241       mdp.39015004124171           0        eng
## 2242       mdp.39015004126044           1        fre
## 2243       mdp.39015004128347           1        fre
## 2244       mdp.39015004129865           0        eng
## 2245       mdp.39015004149707           0        eng
## 2246       mdp.39015004153014           1        rus
## 2247       mdp.39015004153121           0        eng
## 2248       mdp.39015004153543           1        rum
## 2249       mdp.39015004154418           1        per
## 2250       mdp.39015004158179           0        eng
## 2251       mdp.39015004160605           1        chi
## 2252       mdp.39015004167113           1        ger
## 2253       mdp.39015004168541           0        eng
## 2254       mdp.39015004168822           1        fre
## 2255       mdp.39015004171347           1        rum
## 2256       mdp.39015004176916           1        swe
## 2257       mdp.39015004177575           0        eng
## 2258       mdp.39015004178540           1        ger
## 2259       mdp.39015004181320           0        eng
## 2260       mdp.39015004181718           0        eng
## 2261       mdp.39015004181767           1        chi
## 2262       mdp.39015004181783           0        eng
## 2263       mdp.39015004182955           0        eng
## 2264       mdp.39015004183342           0        eng
## 2265       mdp.39015004184753           0        eng
## 2266       mdp.39015004192970           0        eng
## 2267       mdp.39015004193127           0        eng
## 2268       mdp.39015004193135           1        fre
## 2269       mdp.39015004195346           0        eng
## 2270       mdp.39015004196054           1        fre
## 2271       mdp.39015004196112           0        eng
## 2272       mdp.39015004196286           1        spa
## 2273       mdp.39015004197763           1        spa
## 2274       mdp.39015004197961           1        ger
## 2275       mdp.39015004198142           1        ita
## 2276       mdp.39015004198316           1        ita
## 2277       mdp.39015004226273           1        mal
## 2278       mdp.39015004231661           1        fre
## 2279       mdp.39015004248574           1        swe
## 2280       mdp.39015004248640           1        swe
## 2281       mdp.39015004250646           1        rus
## 2282       mdp.39015004251164           0        eng
## 2283       mdp.39015004256973           0        eng
## 2284       mdp.39015004260447           1        spa
## 2285       mdp.39015004262765           0        eng
## 2286       mdp.39015004263458           0        eng
## 2287       mdp.39015004264423           0        eng
## 2288       mdp.39015004264944           0        eng
## 2289       mdp.39015004266071           0        eng
## 2290       mdp.39015004266097           0        eng
## 2291       mdp.39015004267087           1        jpn
## 2292       mdp.39015004269125           1        fre
## 2293       mdp.39015004271055           1        fre
## 2294       mdp.39015004272384           1        fre
## 2295       mdp.39015004277474           1        chi
## 2296       mdp.39015004287994           0        eng
## 2297       mdp.39015004300284           1        spa
## 2298       mdp.39015004302371           1        per
## 2299       mdp.39015004303072           1        ind
## 2300       mdp.39015004304997           0        eng
## 2301       mdp.39015004305317           1        cze
## 2302       mdp.39015004306463           0        eng
## 2303       mdp.39015004307008           0        eng
## 2304       mdp.39015004314418           0        eng
## 2305       mdp.39015004316504           1        spa
## 2306       mdp.39015004319938           0        eng
## 2307       mdp.39015004344951           0        eng
## 2308       mdp.39015004643287           1        fre
## 2309       mdp.39015004643469           1        fre
## 2310       mdp.39015004645258           1        fre
## 2311       mdp.39015004645829           1        fre
## 2312       mdp.39015004646686           1        fre
## 2313       mdp.39015004646728           1        fre
## 2314       mdp.39015004651868           1        fre
## 2315       mdp.39015004651900           1        swe
## 2316       mdp.39015004652718           1        fre
## 2317       mdp.39015004657030           1        fre
## 2318       mdp.39015004658905           1        por
## 2319       mdp.39015004662840           0        eng
## 2320       mdp.39015004663087           0        eng
## 2321       mdp.39015004664663           1        fre
## 2322       mdp.39015004666908           1        afr
## 2323       mdp.39015004667047           1        chi
## 2324       mdp.39015004667070           1        chi
## 2325       mdp.39015004667088           1        chi
## 2326       mdp.39015004667104           1        chi
## 2327       mdp.39015004687557           1        dan
## 2328       mdp.39015004692458           1        dut
## 2329       mdp.39015004701077           1        fre
## 2330       mdp.39015004701200           1        fre
## 2331       mdp.39015004701226           1        fre
## 2332       mdp.39015004701960           1        ita
## 2333       mdp.39015004701978           1        ita
## 2334       mdp.39015004702802           1        fre
## 2335       mdp.39015004702968           1        fre
## 2336       mdp.39015004703123           1        fre
## 2337       mdp.39015004703966           1        fre
## 2338       mdp.39015004706431           0        eng
## 2339       mdp.39015004706894           1        ger
## 2340       mdp.39015004707249           1        fre
## 2341       mdp.39015004708957           0        eng
## 2342       mdp.39015004714906           0        eng
## 2343       mdp.39015004715069           1        mar
## 2344       mdp.39015004721406           0        eng
## 2345       mdp.39015004721869           0        eng
## 2346       mdp.39015004729557           0        eng
## 2347       mdp.39015004733260           1        swe
## 2348       mdp.39015004743541           1        rus
## 2349       mdp.39015004747989           0        eng
## 2350       mdp.39015004749126           1        grc
## 2351       mdp.39015004753458           1        fre
## 2352       mdp.39015004753730           0        eng
## 2353       mdp.39015004755560           1        fre
## 2354       mdp.39015004755909           0        eng
## 2355       mdp.39015004758713           0        eng
## 2356       mdp.39015004759000           1        fre
## 2357       mdp.39015004760966           1        fre
## 2358       mdp.39015004764356           1        rus
## 2359       mdp.39015004771807           1        fre
## 2360       mdp.39015004771963           1        fre
## 2361       mdp.39015004772110           0        eng
## 2362       mdp.39015004772490           1        swe
## 2363       mdp.39015004776178           1        cze
## 2364       mdp.39015004776491           1        ger
## 2365       mdp.39015004780246           0        eng
## 2366       mdp.39015004780816           1        rus
## 2367       mdp.39015004781368           1        ger
## 2368       mdp.39015004788116           1        spa
## 2369       mdp.39015004790633           0        eng
## 2370       mdp.39015004801091           1        chi
## 2371       mdp.39015004801497           0        eng
## 2372       mdp.39015004801653           1        rus
## 2373       mdp.39015004804954           1        heb
## 2374       mdp.39015004814508           1        ger
## 2375       mdp.39015004817097           1        fre
## 2376       mdp.39015004818061           1        fre
## 2377       mdp.39015004820307           1        rus
## 2378       mdp.39015004822121           1        rus
## 2379       mdp.39015004825389           0        eng
## 2380       mdp.39015004826692           0        eng
## 2381       mdp.39015004827963           0        eng
## 2382       mdp.39015004848324           1        fre
## 2383       mdp.39015004849173           1        spa
## 2384       mdp.39015004852409           0        eng
## 2385       mdp.39015004854983           1        por
## 2386       mdp.39015004854991           1        por
## 2387       mdp.39015004856269           0        eng
## 2388       mdp.39015004863927           1        ger
## 2389       mdp.39015004873405           0        eng
## 2390       mdp.39015004882497           1        rus
## 2391       mdp.39015004887736           1        dan
## 2392       mdp.39015004916634           0        eng
## 2393       mdp.39015004933365           1        dut
## 2394       mdp.39015004937564           1        rus
## 2395       mdp.39015004937572           1        rus
## 2396       mdp.39015004950351           0        eng
## 2397       mdp.39015004951862           0        eng
## 2398       mdp.39015004956143           1        fre
## 2399       mdp.39015004971951           1        ita
## 2400       mdp.39015004972793           1        fre
## 2401       mdp.39015004973940           1        yid
## 2402       mdp.39015004982511           1        rus
## 2403       mdp.39015004983980           1        rus
## 2404       mdp.39015004984947           0        eng
## 2405       mdp.39015004993005           1        lat
## 2406       mdp.39015004995885           0        eng
## 2407       mdp.39015004996792           1        spa
## 2408       mdp.39015004997170           1        mal
## 2409       mdp.39015004997279           1        mal
## 2410       mdp.39015004997303           1        fre
## 2411       mdp.39015004997352           1        mal
## 2412       mdp.39015005002079           1        fre
## 2413       mdp.39015005003440           0        eng
## 2414       mdp.39015005003531           0        eng
## 2415       mdp.39015005003549           0        eng
## 2416       mdp.39015005003556           0        eng
## 2417       mdp.39015005004877           0        eng
## 2418       mdp.39015005008167           1        mal
## 2419       mdp.39015005008175           1        mal
## 2420       mdp.39015005008183           1        mal
## 2421       mdp.39015005008217           1        mal
## 2422       mdp.39015005008894           1        fre
## 2423       mdp.39015005012565           1        gre
## 2424       mdp.39015005012847           1        fre
## 2425       mdp.39015005013225           1        ger
## 2426       mdp.39015005013977           1        swe
## 2427       mdp.39015005013985           1        swe
## 2428       mdp.39015005019610           1        ger
## 2429       mdp.39015005019669           1        fre
## 2430       mdp.39015005026292           1        ger
## 2431       mdp.39015005030351           1        ita
## 2432       mdp.39015005032167           1        swe
## 2433       mdp.39015005032241           1        swe
## 2434       mdp.39015005040749           1        spa
## 2435       mdp.39015005046472           1        ita
## 2436       mdp.39015005058063           1        ger
## 2437       mdp.39015005058410           1        ger
## 2438       mdp.39015005059715           1        heb
## 2439       mdp.39015005066066           1        fre
## 2440       mdp.39015005067825           1        heb
## 2441       mdp.39015005077303           1        rus
## 2442       mdp.39015005077501           0        eng
## 2443       mdp.39015005077527           1        fre
## 2444       mdp.39015005080307           1        rus
## 2445       mdp.39015005082840           1        rus
## 2446       mdp.39015005083129           1        ger
## 2447       mdp.39015005085025           1        fre
## 2448       mdp.39015005087682           0        eng
## 2449       mdp.39015005088201           0        eng
## 2450       mdp.39015005089571           1        swe
## 2451       mdp.39015005090637           1        jpn
## 2452       mdp.39015005090868           1        ger
## 2453       mdp.39015005092377           1        fre
## 2454       mdp.39015005093474           0        eng
## 2455       mdp.39015005097053           1        ger
## 2456       mdp.39015005097079           1        ger
## 2457       mdp.39015005099158           1        fre
## 2458       mdp.39015005099240           1        fre
## 2459       mdp.39015005105880           0        eng
## 2460       mdp.39015005111318           0        eng
## 2461       mdp.39015005112597           0        eng
## 2462       mdp.39015005113496           0        eng
## 2463       mdp.39015005117000           1        rus
## 2464       mdp.39015005118362           0        eng
## 2465       mdp.39015005119089           1        kik
## 2466       mdp.39015005119774           1        fre
## 2467       mdp.39015005120335           1        ger
## 2468       mdp.39015005121101           0        eng
## 2469       mdp.39015005122851           0        eng
## 2470       mdp.39015005123412           1        ita
## 2471       mdp.39015005125805           1        jpn
## 2472       mdp.39015005125862           1        ara
## 2473       mdp.39015005130656           0        eng
## 2474       mdp.39015005134278           0        eng
## 2475       mdp.39015005138071           1        swe
## 2476       mdp.39015005138667           1        ita
## 2477       mdp.39015005140101           1        pol
## 2478       mdp.39015005143212           1        heb
## 2479       mdp.39015005143378           1        chi
## 2480       mdp.39015005143451           1        ita
## 2481       mdp.39015005144137           1        ger
## 2482       mdp.39015005144392           1        swe
## 2483       mdp.39015005145621           1        fre
## 2484       mdp.39015005147742           1        swe
## 2485       mdp.39015005147932           0        eng
## 2486       mdp.39015005148096           0        eng
## 2487       mdp.39015005148443           1        fin
## 2488       mdp.39015005148450           1        fin
## 2489       mdp.39015005148757           1        rus
## 2490       mdp.39015005151256           1        pol
## 2491       mdp.39015005151272           1        pol
## 2492       mdp.39015005151520           0        eng
## 2493       mdp.39015005152577           0        eng
## 2494       mdp.39015005152593           0        eng
## 2495       mdp.39015005154953           1        rus
## 2496       mdp.39015005155547           0        eng
## 2497       mdp.39015005156057           0        eng
## 2498       mdp.39015005160836           0        eng
## 2499       mdp.39015005162675           1        ger
## 2500       mdp.39015005166064           1        por
## 2501       mdp.39015005169670           0        eng
## 2502       mdp.39015005172427           1        heb
## 2503       mdp.39015005175040           0        eng
## 2504       mdp.39015005175784           0        eng
## 2505       mdp.39015005177657           1        dan
## 2506       mdp.39015005179976           0        eng
## 2507       mdp.39015005180032           1        ger
## 2508       mdp.39015005184638           0        eng
## 2509       mdp.39015005189959           1        ger
## 2510       mdp.39015005190379           1        dut
## 2511       mdp.39015005190718           1        heb
## 2512       mdp.39015005191088           1        fre
## 2513       mdp.39015005195576           1        ger
## 2514       mdp.39015005201168           1        ita
## 2515       mdp.39015005201416           0        eng
## 2516       mdp.39015005201812           1        fre
## 2517       mdp.39015005207363           1        rus
## 2518       mdp.39015005208395           0        eng
## 2519       mdp.39015005212108           1        fre
## 2520       mdp.39015005215937           1        swe
## 2521       mdp.39015005226405           1        fre
## 2522       mdp.39015005234573           1        chi
## 2523       mdp.39015005246635           1        jpn
## 2524       mdp.39015005253482           0        eng
## 2525       mdp.39015005254977           1        ita
## 2526       mdp.39015005260487           1        nno
## 2527       mdp.39015005264489           1        rus
## 2528       mdp.39015005264588           0        eng
## 2529       mdp.39015005269520           1        fre
## 2530       mdp.39015005269538           1        fre
## 2531       mdp.39015005269546           1        fre
## 2532       mdp.39015005269553           1        fre
## 2533       mdp.39015005269603           1        fre
## 2534       mdp.39015005269785           1        ger
## 2535       mdp.39015005279024           1        ger
## 2536       mdp.39015005280360           1        ger
## 2537       mdp.39015005282622           0        eng
## 2538       mdp.39015005291557           0        eng
## 2539       mdp.39015005292415           1        jpn
## 2540       mdp.39015005293272           1        ger
## 2541       mdp.39015005295970           0        eng
## 2542       mdp.39015005296663           1        ben
## 2543       mdp.39015005296952           1        ben
## 2544       mdp.39015005299253           1        por
## 2545       mdp.39015005303519           0        eng
## 2546       mdp.39015005303857           0        eng
## 2547       mdp.39015005305381           1        ger
## 2548       mdp.39015005305829           0        eng
## 2549       mdp.39015005307429           0        eng
## 2550       mdp.39015005308260           0        eng
## 2551       mdp.39015005310365           1        ger
## 2552       mdp.39015005310373           1        ger
## 2553       mdp.39015005311249           1        rus
## 2554       mdp.39015005311769           1        dut
## 2555       mdp.39015005317758           1        fre
## 2556       mdp.39015005317980           0        eng
## 2557       mdp.39015005318244           0        eng
## 2558       mdp.39015005319671           1        ger
## 2559       mdp.39015005320745           0        eng
## 2560       mdp.39015005321644           1        jpn
## 2561       mdp.39015005324937           0        eng
## 2562       mdp.39015005327088           0        eng
## 2563       mdp.39015005329464           1        fre
## 2564       mdp.39015005335594           1        ger
## 2565       mdp.39015005342301           0        eng
## 2566       mdp.39015005348670           0        eng
## 2567       mdp.39015005349934           1        pol
## 2568       mdp.39015005351153           1        rus
## 2569       mdp.39015005354561           0        eng
## 2570       mdp.39015005360527           0        eng
## 2571       mdp.39015005365088           0        eng
## 2572       mdp.39015005369841           0        eng
## 2573       mdp.39015005382067           1        hun
## 2574       mdp.39015005387850           1        fre
## 2575       mdp.39015005392975           0        eng
## 2576       mdp.39015005395770           1        dan
## 2577       mdp.39015005395788           1        dan
## 2578       mdp.39015005396307           1        jpn
## 2579       mdp.39015005397859           1        rus
## 2580       mdp.39015005398915           1        fre
## 2581       mdp.39015005399491           1        jpn
## 2582       mdp.39015005400927           0        eng
## 2583       mdp.39015005404754           1        ara
## 2584       mdp.39015005405454           1        dut
## 2585       mdp.39015005407765           1        srp
## 2586       mdp.39015005412021           0        eng
## 2587       mdp.39015005428100           1        fre
## 2588       mdp.39015005429785           0        eng
## 2589       mdp.39015005430718           1        fre
## 2590       mdp.39015005431773           1        rus
## 2591       mdp.39015005434314           1        rus
## 2592       mdp.39015005440550           0        eng
## 2593       mdp.39015005443323           1        ita
## 2594       mdp.39015005444396           1        pan
## 2595       mdp.39015005448843           1        rus
## 2596       mdp.39015005449767           1        jpn
## 2597       mdp.39015005450658           1        fre
## 2598       mdp.39015005451029           1        jpn
## 2599       mdp.39015005452597           1        mal
## 2600       mdp.39015005453595           1        dan
## 2601       mdp.39015005456374           0        eng
## 2602       mdp.39015005458644           0        eng
## 2603       mdp.39015005462026           1        swe
## 2604       mdp.39015005462554           1        pol
## 2605       mdp.39015005462885           1        pol
## 2606       mdp.39015005469443           0        eng
## 2607       mdp.39015005472439           0        eng
## 2608       mdp.39015005481182           1        nor
## 2609       mdp.39015005482750           0        eng
## 2610       mdp.39015005484848           0        eng
## 2611       mdp.39015005485308           0        eng
## 2612       mdp.39015005489680           0        eng
## 2613       mdp.39015005492049           1        ben
## 2614       mdp.39015005494920           0        eng
## 2615       mdp.39015005497063           1        ukr
## 2616       mdp.39015005498798           1        fre
## 2617       mdp.39015005499200           1        gre
## 2618       mdp.39015005499622           0        eng
## 2619       mdp.39015005503639           1        lat
## 2620       mdp.39015005511061           1        rus
## 2621       mdp.39015005511137           1        rus
## 2622       mdp.39015005512275           1        fre
## 2623       mdp.39015005514735           1        fre
## 2624       mdp.39015005515724           0        eng
## 2625       mdp.39015005516185           1        gre
## 2626       mdp.39015005516805           0        eng
## 2627       mdp.39015005516904           0        eng
## 2628       mdp.39015005525889           1        rus
## 2629       mdp.39015005530913           1        chi
## 2630       mdp.39015005533354           1        por
## 2631       mdp.39015005535946           1        jpn
## 2632       mdp.39015005540391           0        eng
## 2633       mdp.39015005542009           0        eng
## 2634       mdp.39015005542033           1        fre
## 2635       mdp.39015005549541           1        jpn
## 2636       mdp.39015005554400           1        ger
## 2637       mdp.39015005555571           1        swe
## 2638       mdp.39015005556736           1        zun
## 2639       mdp.39015005557312           1        rus
## 2640       mdp.39015005558922           1        fre
## 2641       mdp.39015005561231           1        pol
## 2642       mdp.39015005562049           1        fre
## 2643       mdp.39015005564508           1        rus
## 2644       mdp.39015005565794           1        fre
## 2645       mdp.39015005567352           1        fin
## 2646       mdp.39015005568491           1        kor
## 2647       mdp.39015005569887           1        may
## 2648       mdp.39015005571347           0        eng
## 2649       mdp.39015005572162           0        eng
## 2650       mdp.39015005578524           0        eng
## 2651       mdp.39015005580686           0        eng
## 2652       mdp.39015005584464           1        arm
## 2653       mdp.39015005585768           0        eng
## 2654       mdp.39015005586204           0        eng
## 2655       mdp.39015005587061           0        eng
## 2656       mdp.39015005588895           1        fre
## 2657       mdp.39015005593879           0        eng
## 2658       mdp.39015005594133           1        heb
## 2659       mdp.39015005595833           1        spa
## 2660       mdp.39015005596062           1        pol
## 2661       mdp.39015005596476           1        heb
## 2662       mdp.39015005596740           1        ita
## 2663       mdp.39015005598886           1        jpn
## 2664       mdp.39015005598894           1        jpn
## 2665       mdp.39015005605095           1        fre
## 2666       mdp.39015005606648           1        heb
## 2667       mdp.39015005607380           1        ice
## 2668       mdp.39015005609089           1        por
## 2669       mdp.39015005611135           0        eng
## 2670       mdp.39015005613537           1        gre
## 2671       mdp.39015005623494           1        fre
## 2672       mdp.39015005626661           1        fre
## 2673       mdp.39015005628212           1        swe
## 2674       mdp.39015005634285           1        rus
## 2675       mdp.39015005637171           1        jpn
## 2676       mdp.39015005639136           1        fre
## 2677       mdp.39015005639896           1        ara
## 2678       mdp.39015005640258           1        spa
## 2679       mdp.39015005643641           0        eng
## 2680       mdp.39015005645539           1        swe
## 2681       mdp.39015005649143           0        eng
## 2682       mdp.39015005649218           0        eng
## 2683       mdp.39015005649697           1        rus
## 2684       mdp.39015005649820           0        eng
## 2685       mdp.39015005649960           0        eng
## 2686       mdp.39015005650208           1        fre
## 2687       mdp.39015005652832           1        ger
## 2688       mdp.39015005653178           0        eng
## 2689       mdp.39015005656064           0        eng
## 2690       mdp.39015005656072           0        eng
## 2691       mdp.39015005670925           0        eng
## 2692       mdp.39015005675460           1        fre
## 2693       mdp.39015005677680           0        eng
## 2694       mdp.39015005677706           0        eng
## 2695       mdp.39015005679595           1        cze
## 2696       mdp.39015005679603           1        fre
## 2697       mdp.39015005684728           1        rus
## 2698       mdp.39015005688661           0        eng
## 2699       mdp.39015005689982           0        eng
## 2700       mdp.39015005690857           1        chi
## 2701       mdp.39015005692291           0        eng
## 2702       mdp.39015005692309           0        eng
## 2703       mdp.39015005695013           1        may
## 2704       mdp.39015005709541           1        rus
## 2705       mdp.39015005711612           0        eng
## 2706       mdp.39015005717510           0        eng
## 2707       mdp.39015005722049           1        arm
## 2708       mdp.39015005722205           1        fre
## 2709       mdp.39015005724623           0        eng
## 2710       mdp.39015005729218           1        fre
## 2711       mdp.39015005729267           1        fre
## 2712       mdp.39015005729275           1        fre
## 2713       mdp.39015005730927           1        fre
## 2714       mdp.39015005734341           0        eng
## 2715       mdp.39015005738219           1        kik
## 2716       mdp.39015005743078           0        eng
## 2717       mdp.39015005743227           0        eng
## 2718       mdp.39015005746410           1        fin
## 2719       mdp.39015005747087           1        ger
## 2720       mdp.39015005747749           1        ger
## 2721       mdp.39015005747889           1        yid
## 2722       mdp.39015005747905           1        yid
## 2723       mdp.39015005749661           1        fre
## 2724       mdp.39015005749679           1        fre
## 2725       mdp.39015005756898           0        eng
## 2726       mdp.39015005768018           0        eng
## 2727       mdp.39015005768026           0        eng
## 2728       mdp.39015005769628           1        rus
## 2729       mdp.39015005780153           1        rus
## 2730       mdp.39015005780161           1        fre
## 2731       mdp.39015005780369           0        eng
## 2732       mdp.39015005782803           1        fre
## 2733       mdp.39015005790343           0        eng
## 2734       mdp.39015005861987           1        dut
## 2735       mdp.39015005863058           1        fre
## 2736       mdp.39015005866523           1        fre
## 2737       mdp.39015005867893           0        eng
## 2738       mdp.39015005869790           0        eng
## 2739       mdp.39015005879898           1        fre
## 2740       mdp.39015005886927           0        eng
## 2741       mdp.39015005888113           0        eng
## 2742       mdp.39015005889699           1        ger
## 2743       mdp.39015005889749           0        eng
## 2744       mdp.39015005889988           0        eng
## 2745       mdp.39015005890598           1        spa
## 2746       mdp.39015005892750           1        fre
## 2747       mdp.39015005896348           1        rus
## 2748       mdp.39015005897007           1        tur
## 2749       mdp.39015005898393           0        eng
## 2750       mdp.39015005899953           1        vie
## 2751       mdp.39015005901833           1        pan
## 2752       mdp.39015005901999           0        eng
## 2753       mdp.39015005902948           1        fre
## 2754       mdp.39015005904134           0        eng
## 2755       mdp.39015005906592           0        eng
## 2756       mdp.39015005906907           1        gle
## 2757       mdp.39015005907053           0        eng
## 2758       mdp.39015005907079           0        eng
## 2759       mdp.39015005908432           0        eng
## 2760       mdp.39015005909125           1        cat
## 2761       mdp.39015005910743           0        eng
## 2762       mdp.39015005910982           0        eng
## 2763       mdp.39015005911162           0        eng
## 2764       mdp.39015005911733           0        eng
## 2765       mdp.39015005912061           1        yid
## 2766       mdp.39015005913515           0        eng
## 2767       mdp.39015005915494           1        yid
## 2768       mdp.39015005917466           1        rus
## 2769       mdp.39015005918787           1        spa
## 2770       mdp.39015005925485           1        chi
## 2771       mdp.39015005932838           0        eng
## 2772       mdp.39015005971810           0        eng
## 2773       mdp.39015005973097           1        ita
## 2774       mdp.39015005975977           1        rus
## 2775       mdp.39015006194800           0        eng
## 2776       mdp.39015006218039           1        jpn
## 2777       mdp.39015006220001           1        rus
## 2778       mdp.39015006264033           0        eng
## 2779       mdp.39015006562477           1        gre
## 2780       mdp.39015006565090           0        eng
## 2781       mdp.39015006566007           1        swe
## 2782       mdp.39015006566577           1        ita
## 2783       mdp.39015006576253           1        ger
## 2784       mdp.39015006577822           0        eng
## 2785       mdp.39015006582061           1        fre
## 2786       mdp.39015006588266           1        ger
## 2787       mdp.39015006588381           0        eng
## 2788       mdp.39015006588472           0        eng
## 2789       mdp.39015006588654           1        fre
## 2790       mdp.39015006598471           0        eng
## 2791       mdp.39015006600020           0        eng
## 2792       mdp.39015006602018           1        fre
## 2793       mdp.39015006603487           0        eng
## 2794       mdp.39015006604386           0        eng
## 2795       mdp.39015006625837           1        chi
## 2796       mdp.39015006637592           0        eng
## 2797       mdp.39015006794534           0        eng
## 2798       mdp.39015006978954           1        rus
## 2799       mdp.39015007012027           0        eng
## 2800       mdp.39015007012258           0        eng
## 2801       mdp.39015007013470           0        eng
## 2802       mdp.39015007019691           1        spa
## 2803       mdp.39015007019758           1        ger
## 2804       mdp.39015007020632           1        rus
## 2805       mdp.39015007023685           0        eng
## 2806       mdp.39015007027959           1        jpn
## 2807       mdp.39015007028585           1        fre
## 2808       mdp.39015007030144           0        eng
## 2809       mdp.39015007031340           1        rus
## 2810       mdp.39015007032538           1        spa
## 2811       mdp.39015007033346           0        eng
## 2812       mdp.39015007033486           1        ger
## 2813       mdp.39015007033700           0        eng
## 2814       mdp.39015007034328           0        eng
## 2815       mdp.39015007038485           0        eng
## 2816       mdp.39015007039640           0        eng
## 2817       mdp.39015007042180           1        fre
## 2818       mdp.39015007046892           0        eng
## 2819       mdp.39015007048104           1        rus
## 2820       mdp.39015007048138           1        chi
## 2821       mdp.39015007048328           1        dut
## 2822       mdp.39015007049425           0        eng
## 2823       mdp.39015007054672           0        eng
## 2824       mdp.39015007057113           0        eng
## 2825       mdp.39015007060968           0        eng
## 2826       mdp.39015007061354           1        rus
## 2827       mdp.39015007061768           1        lav
## 2828       mdp.39015007064622           1        ita
## 2829       mdp.39015007067211           1        rus
## 2830       mdp.39015007067815           0        eng
## 2831       mdp.39015007069282           0        eng
## 2832       mdp.39015007069746           0        eng
## 2833       mdp.39015007071163           1        fre
## 2834       mdp.39015007071486           0        eng
## 2835       mdp.39015007182523           0        eng
## 2836       mdp.39015007674479           1        dut
## 2837       mdp.39015007677852           1        chi
## 2838       mdp.39015008002423           0        eng
## 2839       mdp.39015008005244           1        ita
## 2840       mdp.39015008008750           1        fre
## 2841       mdp.39015008009964           0        eng
## 2842       mdp.39015008011648           1        rus
## 2843       mdp.39015008012299           1        jpn
## 2844       mdp.39015008013065           1        nor
## 2845       mdp.39015008014618           1        jpn
## 2846       mdp.39015008018072           0        eng
## 2847       mdp.39015008019542           0        eng
## 2848       mdp.39015008021605           0        eng
## 2849       mdp.39015008023205           1        rus
## 2850       mdp.39015008023742           1        rus
## 2851       mdp.39015008024906           0        eng
## 2852       mdp.39015008026612           1        fre
## 2853       mdp.39015008027727           1        rus
## 2854       mdp.39015008029939           1        rus
## 2855       mdp.39015008032982           0        eng
## 2856       mdp.39015008035506           0        eng
## 2857       mdp.39015008036009           1        ger
## 2858       mdp.39015008036892           0        eng
## 2859       mdp.39015008045257           0        eng
## 2860       mdp.39015008096953           1        ger
## 2861       mdp.39015008100367           1        rus
## 2862       mdp.39015008145180           1        ger
## 2863       mdp.39015008145354           0        eng
## 2864       mdp.39015008146626           1        spa
## 2865       mdp.39015008147343           1        ita
## 2866       mdp.39015008148614           1        ger
## 2867       mdp.39015008148622           1        ger
## 2868       mdp.39015008150305           1        fre
## 2869       mdp.39015008151683           0        eng
## 2870       mdp.39015008154927           1        mal
## 2871       mdp.39015008156054           1        srp
## 2872       mdp.39015008157086           1        fre
## 2873       mdp.39015008160981           0        eng
## 2874       mdp.39015008161781           0        eng
## 2875       mdp.39015008164512           1        mal
## 2876       mdp.39015008165196           1        fre
## 2877       mdp.39015008169768           1        ger
## 2878       mdp.39015008170840           1        heb
## 2879       mdp.39015008171277           0        eng
## 2880       mdp.39015008175815           0        eng
## 2881       mdp.39015008181722           0        eng
## 2882       mdp.39015008182456           1        fre
## 2883       mdp.39015008187349           0        eng
## 2884       mdp.39015008187489           1        por
## 2885       mdp.39015008192646           0        eng
## 2886       mdp.39015008193628           1        por
## 2887       mdp.39015008195417           0        eng
## 2888       mdp.39015008196803           1        dan
## 2889       mdp.39015008199468           0        eng
## 2890       mdp.39015008203526           1        fre
## 2891       mdp.39015008208392           0        eng
## 2892       mdp.39015008218680           1        lat
## 2893       mdp.39015008220629           1        fre
## 2894       mdp.39015008220843           1        fre
## 2895       mdp.39015008221247           1        ger
## 2896       mdp.39015008221551           1        fre
## 2897       mdp.39015008222401           1        rus
## 2898       mdp.39015008223524           1        jpn
## 2899       mdp.39015008227954           1        ger
## 2900       mdp.39015008230123           1        ger
## 2901       mdp.39015008231220           1        swe
## 2902       mdp.39015008234570           0        eng
## 2903       mdp.39015008235122           0        eng
## 2904       mdp.39015008237193           1        jpn
## 2905       mdp.39015008245246           1        grc
## 2906       mdp.39015008246376           0        eng
## 2907       mdp.39015008247424           1        fre
## 2908       mdp.39015008247432           1        fre
## 2909       mdp.39015008250311           1        fre
## 2910       mdp.39015008257068           1        fre
## 2911       mdp.39015008259536           1        ger
## 2912       mdp.39015008261078           1        ben
## 2913       mdp.39015008265277           1        fre
## 2914       mdp.39015008272927           0        eng
## 2915       mdp.39015008275110           1        ita
## 2916       mdp.39015008278221           0        eng
## 2917       mdp.39015008278668           0        eng
## 2918       mdp.39015008282785           0        eng
## 2919       mdp.39015008289756           1        fre
## 2920       mdp.39015008291760           1        heb
## 2921       mdp.39015008292354           1        fre
## 2922       mdp.39015008293840           0        eng
## 2923       mdp.39015008298542           1        rus
## 2924       mdp.39015008298559           1        rus
## 2925       mdp.39015008299904           1        rus
## 2926       mdp.39015008306204           1        ita
## 2927       mdp.39015008311956           1        fre
## 2928       mdp.39015008318092           1        fre
## 2929       mdp.39015008334578           0        eng
## 2930       mdp.39015008340328           0        eng
## 2931       mdp.39015008343231           0        eng
## 2932       mdp.39015008347125           1        rus
## 2933       mdp.39015008365226           0        eng
## 2934       mdp.39015008366208           1        rus
## 2935       mdp.39015008368592           0        eng
## 2936       mdp.39015008368873           0        eng
## 2937       mdp.39015008369566           0        eng
## 2938       mdp.39015008371323           1        fre
## 2939       mdp.39015008373220           0        eng
## 2940       mdp.39015008377890           1        jpn
## 2941       mdp.39015008378351           0        eng
## 2942       mdp.39015008395199           1        spa
## 2943       mdp.39015008398441           0        eng
## 2944       mdp.39015008399688           0        eng
## 2945       mdp.39015008410360           0        eng
## 2946       mdp.39015008412317           1        ger
## 2947       mdp.39015008412804           1        fre
## 2948       mdp.39015008420773           0        eng
## 2949       mdp.39015008427372           1        cze
## 2950       mdp.39015008428149           0        eng
## 2951       mdp.39015008430244           1        ita
## 2952       mdp.39015008430251           1        ita
## 2953       mdp.39015008434535           0        eng
## 2954       mdp.39015008437991           1        ger
## 2955       mdp.39015008439567           0        eng
## 2956       mdp.39015008441084           1        fre
## 2957       mdp.39015008442041           0        eng
## 2958       mdp.39015008442496           0        eng
## 2959       mdp.39015008451869           0        eng
## 2960       mdp.39015008453782           1        fre
## 2961       mdp.39015008454228           1        fre
## 2962       mdp.39015008454640           1        por
## 2963       mdp.39015008455019           0        eng
## 2964       mdp.39015008455761           1        tur
## 2965       mdp.39015008459136           1        hun
## 2966       mdp.39015008461330           1        fre
## 2967       mdp.39015008462403           1        heb
## 2968       mdp.39015008463153           1        chi
## 2969       mdp.39015008463583           0        eng
## 2970       mdp.39015008463690           1        fre
## 2971       mdp.39015008467303           1        rus
## 2972       mdp.39015008469135           1        srp
## 2973       mdp.39015008469143           1        srp
## 2974       mdp.39015008469945           0        eng
## 2975       mdp.39015008471123           1        rus
## 2976       mdp.39015008471131           1        rus
## 2977       mdp.39015008471909           0        eng
## 2978       mdp.39015008473061           1        fre
## 2979       mdp.39015008473558           0        eng
## 2980       mdp.39015008474887           0        eng
## 2981       mdp.39015008475017           0        eng
## 2982       mdp.39015008478292           1        fre
## 2983       mdp.39015008480470           1        rus
## 2984       mdp.39015008481593           1        tur
## 2985       mdp.39015008482443           1        rus
## 2986       mdp.39015008482807           1        spa
## 2987       mdp.39015008486576           1        ita
## 2988       mdp.39015008487293           1        ger
## 2989       mdp.39015008492251           1        kor
## 2990       mdp.39015008492350           0        eng
## 2991       mdp.39015008494166           1        rus
## 2992       mdp.39015008497961           1        ger
## 2993       mdp.39015008502752           0        eng
## 2994       mdp.39015008503453           1        srp
## 2995       mdp.39015008508858           0        eng
## 2996       mdp.39015008509286           1        tha
## 2997       mdp.39015008516414           1        srp
## 2998       mdp.39015008516760           1        ita
## 2999       mdp.39015008516778           1        fre
## 3000       mdp.39015008517693           1        swe
## 3001       mdp.39015008520077           0        eng
## 3002       mdp.39015008521307           1        pol
## 3003       mdp.39015008522008           0        eng
## 3004       mdp.39015008523915           0        eng
## 3005       mdp.39015008524400           1        fre
## 3006       mdp.39015008526686           1        spa
## 3007       mdp.39015008526702           0        eng
## 3008       mdp.39015008526959           1        heb
## 3009       mdp.39015008530829           1        hun
## 3010       mdp.39015008531371           1        ger
## 3011       mdp.39015008532585           1        fre
## 3012       mdp.39015008532593           1        fre
## 3013       mdp.39015008533070           1        fre
## 3014       mdp.39015008539309           1        rus
## 3015       mdp.39015008539960           1        ita
## 3016       mdp.39015008540828           0        eng
## 3017       mdp.39015008541107           1        fre
## 3018       mdp.39015008543426           0        eng
## 3019       mdp.39015008543913           1        spa
## 3020       mdp.39015008544341           1        ger
## 3021       mdp.39015008546841           1        rus
## 3022       mdp.39015008551783           0        eng
## 3023       mdp.39015008554357           1        ita
## 3024       mdp.39015008554456           1        swe
## 3025       mdp.39015008555420           0        eng
## 3026       mdp.39015008561915           1        rum
## 3027       mdp.39015008563424           0        eng
## 3028       mdp.39015008563994           1        ice
## 3029       mdp.39015008565577           1        fre
## 3030       mdp.39015008566112           0        eng
## 3031       mdp.39015008569009           1        fre
## 3032       mdp.39015008580535           1        dut
## 3033       mdp.39015008581913           1        rus
## 3034       mdp.39015008584214           0        eng
## 3035       mdp.39015008585955           1        cze
## 3036       mdp.39015008587167           0        eng
## 3037       mdp.39015008589205           0        eng
## 3038       mdp.39015008591318           1        chi
## 3039       mdp.39015008597224           0        eng
## 3040       mdp.39015008604301           0        eng
## 3041       mdp.39015008606157           1        rus
## 3042       mdp.39015008606827           0        eng
## 3043       mdp.39015008615109           1        yid
## 3044       mdp.39015008616313           1        yid
## 3045       mdp.39015008618939           1        swe
## 3046       mdp.39015008620240           0        eng
## 3047       mdp.39015008624234           1        fre
## 3048       mdp.39015008624507           1        rus
## 3049       mdp.39015008624572           1        chi
## 3050       mdp.39015008629787           1        rus
## 3051       mdp.39015008633334           0        eng
## 3052       mdp.39015008633565           0        eng
## 3053       mdp.39015008637228           0        eng
## 3054       mdp.39015008637772           1        ger
## 3055       mdp.39015008638408           1        rus
## 3056       mdp.39015008639877           0        eng
## 3057       mdp.39015008640032           0        eng
## 3058       mdp.39015008643028           1        pol
## 3059       mdp.39015008647862           1        fre
## 3060       mdp.39015008657531           1        ger
## 3061       mdp.39015008657721           1        spa
## 3062       mdp.39015008665013           0        eng
## 3063       mdp.39015008672142           1        fre
## 3064       mdp.39015008673736           1        ita
## 3065       mdp.39015008674981           1        ukr
## 3066       mdp.39015008682786           1        rus
## 3067       mdp.39015008683057           0        eng
## 3068       mdp.39015008692561           1        ita
## 3069       mdp.39015008694120           1        fre
## 3070       mdp.39015008697123           0        eng
## 3071       mdp.39015008698725           1        heb
## 3072       mdp.39015008700158           0        eng
## 3073       mdp.39015008705074           0        eng
## 3074       mdp.39015008711098           0        eng
## 3075       mdp.39015008711718           1        heb
## 3076       mdp.39015008714985           1        dan
## 3077       mdp.39015008719521           1        rus
## 3078       mdp.39015008719919           0        eng
## 3079       mdp.39015008720362           0        eng
## 3080       mdp.39015008722087           1        rus
## 3081       mdp.39015008727011           0        eng
## 3082       mdp.39015008727953           1        jpn
## 3083       mdp.39015008732235           1        ita
## 3084       mdp.39015008732367           1        ita
## 3085       mdp.39015008734165           1        gre
## 3086       mdp.39015008734256           1        fre
## 3087       mdp.39015008734504           1        hbs
## 3088       mdp.39015008736111           0        eng
## 3089       mdp.39015008739560           1        gle
## 3090       mdp.39015008739974           0        eng
## 3091       mdp.39015008740014           1        rum
## 3092       mdp.39015008740964           1        ice
## 3093       mdp.39015008775283           1        dan
## 3094       mdp.39015008778964           1        fre
## 3095       mdp.39015008786827           0        eng
## 3096       mdp.39015008788443           1        jpn
## 3097       mdp.39015008791900           1        dan
## 3098       mdp.39015008794169           1        ita
## 3099       mdp.39015008794318           1        heb
## 3100       mdp.39015008794425           1        ger
## 3101       mdp.39015008795414           0        eng
## 3102       mdp.39015008796545           0        eng
## 3103       mdp.39015008797329           1        rus
## 3104       mdp.39015008800156           1        chi
## 3105       mdp.39015008812755           0        eng
## 3106       mdp.39015008813126           1        heb
## 3107       mdp.39015008813852           0        eng
## 3108       mdp.39015008817226           1        hun
## 3109       mdp.39015008819875           1        ger
## 3110       mdp.39015008820980           1        ita
## 3111       mdp.39015008823844           1        nep
## 3112       mdp.39015008825732           1        nep
## 3113       mdp.39015008827324           1        rus
## 3114       mdp.39015008828843           1        fre
## 3115       mdp.39015008829908           0        eng
## 3116       mdp.39015008830088           0        eng
## 3117       mdp.39015008832019           0        eng
## 3118       mdp.39015008833538           0        eng
## 3119       mdp.39015008834437           0        eng
## 3120       mdp.39015008836739           1        fin
## 3121       mdp.39015008837851           1        jpn
## 3122       mdp.39015008838842           1        rus
## 3123       mdp.39015008839410           1        rus
## 3124       mdp.39015008839428           1        chi
## 3125       mdp.39015008840160           1        jpn
## 3126       mdp.39015008840491           0        eng
## 3127       mdp.39015008841713           0        eng
## 3128       mdp.39015008841846           1        spa
## 3129       mdp.39015008843990           0        eng
## 3130       mdp.39015008849146           1        srp
## 3131       mdp.39015008855994           1        ger
## 3132       mdp.39015008860838           1        ger
## 3133       mdp.39015008862248           1        rus
## 3134       mdp.39015008864640           0        eng
## 3135       mdp.39015008867171           1        nno
## 3136       mdp.39015008875240           1        spa
## 3137       mdp.39015008877386           0        eng
## 3138       mdp.39015008878582           0        eng
## 3139       mdp.39015008878590           0        eng
## 3140       mdp.39015008880844           1        fre
## 3141       mdp.39015008887732           0        eng
## 3142       mdp.39015008889142           1        dan
## 3143       mdp.39015008898168           1        por
## 3144       mdp.39015008900212           1        ger
## 3145       mdp.39015008902705           0        eng
## 3146       mdp.39015008902713           1        chi
## 3147       mdp.39015008906938           0        eng
## 3148       mdp.39015008912571           0        eng
## 3149       mdp.39015008912944           0        eng
## 3150       mdp.39015008913645           1        nor
## 3151       mdp.39015008913660           1        nor
## 3152       mdp.39015008914965           1        swe
## 3153       mdp.39015008914973           1        nor
## 3154       mdp.39015008914981           1        nor
## 3155       mdp.39015008914999           1        swe
## 3156       mdp.39015008915145           1        rus
## 3157       mdp.39015008916994           1        nor
## 3158       mdp.39015008917349           1        rus
## 3159       mdp.39015008920079           1        chi
## 3160       mdp.39015008920087           1        chi
## 3161       mdp.39015008920442           1        fre
## 3162       mdp.39015008920459           1        fre
## 3163       mdp.39015008921945           0        eng
## 3164       mdp.39015008922067           1        nor
## 3165       mdp.39015008923800           0        eng
## 3166       mdp.39015008926175           1        ind
## 3167       mdp.39015008927231           0        eng
## 3168       mdp.39015008927835           1        rus
## 3169       mdp.39015008934070           0        eng
## 3170       mdp.39015008937008           0        eng
## 3171       mdp.39015008940796           0        eng
## 3172       mdp.39015008956685           0        eng
## 3173       mdp.39015008957774           0        eng
## 3174       mdp.39015008959184           1        fre
## 3175       mdp.39015008960133           0        eng
## 3176       mdp.39015008960174           0        eng
## 3177       mdp.39015008960372           0        eng
## 3178       mdp.39015008960919           1        hbs
## 3179       mdp.39015008963004           0        eng
## 3180       mdp.39015008964622           0        eng
## 3181       mdp.39015008966650           1        rus
## 3182       mdp.39015008973979           0        eng
## 3183       mdp.39015008978994           1        heb
## 3184       mdp.39015008979794           0        eng
## 3185       mdp.39015008980222           1        ger
## 3186       mdp.39015008981576           1        srp
## 3187       mdp.39015008981584           1        srp
## 3188       mdp.39015008981766           1        srp
## 3189       mdp.39015008982889           0        eng
## 3190       mdp.39015008984893           0        eng
## 3191       mdp.39015008985775           0        eng
## 3192       mdp.39015008985783           0        eng
## 3193       mdp.39015008988076           0        eng
## 3194       mdp.39015008989447           1        rus
## 3195       mdp.39015008990312           1        ita
## 3196       mdp.39015008996293           0        eng
## 3197       mdp.39015008997325           0        eng
## 3198       mdp.39015009004717           0        eng
## 3199       mdp.39015009011183           0        eng
## 3200       mdp.39015009012561           1        fre
## 3201       mdp.39015009013056           0        eng
## 3202       mdp.39015009013361           1        ben
## 3203       mdp.39015009013494           1        fre
## 3204       mdp.39015009018675           0        eng
## 3205       mdp.39015009022966           0        eng
## 3206       mdp.39015009037527           1        rus
## 3207       mdp.39015009037535           1        jpn
## 3208       mdp.39015009040307           1        fre
## 3209       mdp.39015009048219           1        heb
## 3210       mdp.39015009049936           1        ger
## 3211       mdp.39015009051148           1        rus
## 3212       mdp.39015009051247           1        rus
## 3213       mdp.39015009053110           0        eng
## 3214       mdp.39015009055719           0        eng
## 3215       mdp.39015009056782           1        fre
## 3216       mdp.39015009057087           1        fre
## 3217       mdp.39015009057962           0        eng
## 3218       mdp.39015009060214           1        fre
## 3219       mdp.39015009060362           0        eng
## 3220       mdp.39015009060883           1        rus
## 3221       mdp.39015009061170           0        eng
## 3222       mdp.39015009061253           0        eng
## 3223       mdp.39015009061923           1        chi
## 3224       mdp.39015009062095           1        fre
## 3225       mdp.39015009069017           0        eng
## 3226       mdp.39015009097620           1        fre
## 3227       mdp.39015009097968           0        eng
## 3228       mdp.39015009099337           1        fre
## 3229       mdp.39015009100283           1        may
## 3230       mdp.39015009100291           1        may
## 3231       mdp.39015009104400           1        spa
## 3232       mdp.39015009117766           1        ara
## 3233       mdp.39015009118400           1        fre
## 3234       mdp.39015009118418           0        eng
## 3235       mdp.39015009118657           1        ger
## 3236       mdp.39015009118665           0        eng
## 3237       mdp.39015009119143           0        eng
## 3238       mdp.39015009126478           0        eng
## 3239       mdp.39015009128177           0        eng
## 3240       mdp.39015009131031           0        eng
## 3241       mdp.39015009131411           1        rus
## 3242       mdp.39015009132682           0        eng
## 3243       mdp.39015009133961           1        heb
## 3244       mdp.39015009134050           0        eng
## 3245       mdp.39015009137426           1        rus
## 3246       mdp.39015009141550           0        eng
## 3247       mdp.39015009144216           0        eng
## 3248       mdp.39015009147607           1        ger
## 3249       mdp.39015009147615           1        ger
## 3250       mdp.39015009147623           1        ita
## 3251       mdp.39015009167241           1        rus
## 3252       mdp.39015009167258           1        rus
## 3253       mdp.39015009172464           0        eng
## 3254       mdp.39015009175673           1        hun
## 3255       mdp.39015009178321           1        jpn
## 3256       mdp.39015009185664           1        fre
## 3257       mdp.39015009185912           1        fre
## 3258       mdp.39015009202154           1        nor
## 3259       mdp.39015009208003           0        eng
## 3260       mdp.39015009211817           0        eng
## 3261       mdp.39015009212369           0        eng
## 3262       mdp.39015009225023           0        eng
## 3263       mdp.39015009281927           0        eng
## 3264       mdp.39015009286967           1        hin
## 3265       mdp.39015009288419           1        ger
## 3266       mdp.39015009288476           1        por
## 3267       mdp.39015009295679           0        eng
## 3268       mdp.39015009296081           1        fre
## 3269       mdp.39015009296289           0        eng
## 3270       mdp.39015009297105           1        fre
## 3271       mdp.39015009297261           1        fre
## 3272       mdp.39015009304307           1        rus
## 3273       mdp.39015009305296           1        swe
## 3274       mdp.39015009308902           1        rus
## 3275       mdp.39015009309934           0        eng
## 3276       mdp.39015009313324           1        por
## 3277       mdp.39015009313399           1        ger
## 3278       mdp.39015009315014           0        eng
## 3279       mdp.39015009315568           1        heb
## 3280       mdp.39015009320287           1        hun
## 3281       mdp.39015009326078           1        fre
## 3282       mdp.39015009334130           1        kan
## 3283       mdp.39015009334148           1        kan
## 3284       mdp.39015009336911           0        eng
## 3285       mdp.39015009338370           1        rus
## 3286       mdp.39015009339303           1        rus
## 3287       mdp.39015009345557           1        fre
## 3288       mdp.39015009346654           0        eng
## 3289       mdp.39015009352561           0        eng
## 3290       mdp.39015009352652           1        por
## 3291       mdp.39015009352967           0        eng
## 3292       mdp.39015009354328           1        jpn
## 3293       mdp.39015009354609           1        rus
## 3294       mdp.39015009356935           0        eng
## 3295       mdp.39015009356943           0        eng
## 3296       mdp.39015009358055           0        eng
## 3297       mdp.39015009358618           0        eng
## 3298       mdp.39015009360267           1        fre
## 3299       mdp.39015009360960           1        ita
## 3300       mdp.39015009360978           1        ita
## 3301       mdp.39015009361067           1        jpn
## 3302       mdp.39015009361406           1        ger
## 3303       mdp.39015009361562           1        fre
## 3304       mdp.39015009362602           0        eng
## 3305       mdp.39015009365597           1        fre
## 3306       mdp.39015009367965           1        fre
## 3307       mdp.39015009372551           1        spa
## 3308       mdp.39015009375331           0        eng
## 3309       mdp.39015009375562           1        srp
## 3310       mdp.39015009375570           1        srp
## 3311       mdp.39015009382261           0        eng
## 3312       mdp.39015009383202           0        eng
## 3313       mdp.39015009385637           1        ita
## 3314       mdp.39015009395156           0        eng
## 3315       mdp.39015009932289           1        fre
## 3316       mdp.39015009957641           1        pol
## 3317       mdp.39015010201146           1        rus
## 3318       mdp.39015010204827           0        eng
## 3319       mdp.39015010204835           0        eng
## 3320       mdp.39015010204876           0        eng
## 3321       mdp.39015010211210           1        fin
## 3322       mdp.39015010212689           0        eng
## 3323       mdp.39015010212937           0        eng
## 3324       mdp.39015010212994           0        eng
## 3325       mdp.39015010215047           1        spa
## 3326       mdp.39015010218744           0        eng
## 3327       mdp.39015010222696           1        rus
## 3328       mdp.39015010225608           1        ara
## 3329       mdp.39015010227240           1        ara
## 3330       mdp.39015010229600           0        eng
## 3331       mdp.39015010232422           0        eng
## 3332       mdp.39015010233925           0        eng
## 3333       mdp.39015010234410           0        eng
##                                                            author
## 1                                              Saunders, Marshall
## 2                                                Richardson, John
## 3                                              Rink, H. (Hinrich)
## 4                                              Sanden, Walter von
## 5                                                   Anderson, Ken
## 6                                                 Sologub, Fyodor
## 7                                                    Verne, Jules
## 8                                                Grahame, Kenneth
## 9                                             Goncourt, Edmond de
## 10                                                  Eliot, George
## 11                                              Crowley, Aleister
## 12                                                    Boyle, Jack
## 13                                              Brontë, Charlotte
## 14                                               Plagemann, Bentz
## 15                                               Marie, de France
## 16                                               Bridges, William
## 17                                                   James, Henry
## 18                                                    Fern, Fanny
## 19                                                  Stevens, D. W
## 20                                                      Hoff, Syd
## 21                                      Turgenev, Ivan Sergeevich
## 22                                               Sabatini, Rafael
## 23                                                Hijuelos, Oscar
## 24                                      Turgenev, Ivan Sergeevich
## 25                                      Turgenev, Ivan Sergeevich
## 26                                              Dreiser, Theodore
## 27                                                   Buchan, John
## 28                                                  Barbour, John
## 29                                                  Norris, Frank
## 30                                                   James, Henry
## 31                                                 Conrad, Joseph
## 32                                                   Rome, Claire
## 33                                           Von Arnim, Elizabeth
## 34                                                Goff, Christine
## 35                                                    Knox, Linda
## 36                                                Lathom, Francis
## 37                                                   Stoker, Bram
## 38                                                 Sterling, John
## 39                                                Morris, William
## 40                                             De Quincey, Thomas
## 41                                      Leonowens, Anna Harriette
## 42                                                 Alexander, Mrs
## 43                                                Lehmann, Marcus
## 44                                                 Lartéguy, Jean
## 45                                               Spencer, Lillian
## 46                                   Shelley, Mary Wollstonecraft
## 47                                           Weyman, Stanley John
## 48                                              Balzac, Honoré de
## 49                                      Art︠s︡ybashev, M. (Mikhail)
## 50                                                  Pater, Walter
## 51                                                   Pu, Songling
## 52                                                    Twain, Mark
## 53                                           Tagore, Rabindranath
## 54                                                Michelet, Jules
## 55                                    Pestalozzi, Johann Heinrich
## 56                                                    Perutz, Leo
## 57                                      Kielland, Alexander Lange
## 58                                                  Reid, Forrest
## 59                                                Lindsay, Norman
## 60                                               Tournier, Michel
## 61                                Nabokov, Vladimir Vladimirovich
## 62                                  Auėzov, Mukhtar Omarkhanovich
## 63                                  Auėzov, Mukhtar Omarkhanovich
## 64                                                 Garnett, David
## 65                                                Appelfeld, Aron
## 66                                                   London, Jack
## 67                                                      Elizabeth
## 68                                                 Pearson, Clara
## 69                                              Bulgakov, Mikhail
## 70                                                   Mwangi, Meja
## 71                                                 Crane, Stephen
## 72                                  Chukovskaı͡a, Lidiı͡a Korneevna
## 73                                               Sagan, Françoise
## 74                                              Pirandello, Luigi
## 75                                                    Zola, Émile
## 76                                                Achebe, Chinelo
## 77                                                     Ali, Hauwa
## 78                                         Schlegel, Dorothea von
## 79                                               Christie, Agatha
## 80                                                 Honchar, Olesʹ
## 81                                                Freytag, Gustav
## 82                                        Bunin, Ivan Alekseevich
## 83                                               Simenon, Georges
## 84                                              Mitchell, James D
## 85                                                Southern, Terry
## 86                                             Sarraute, Nathalie
## 87                                             Maupassant, Guy de
## 88                                                   Amado, Jorge
## 89                                                 Zupan, Vitomil
## 90                                               Christie, Agatha
## 91                                         Rousseau, Jean-Jacques
## 92                                                France, Anatole
## 93                                                   Mann, Thomas
## 94                                  Buchheim, Lothar G&#xfc;nther
## 95                                                  Brandel, Marc
## 96                                                 Tey, Josephine
## 97                                                    Hyde, Robin
## 98                                               Griffin, W. E. B
## 99                                            Vargas Llosa, Mario
## 100                               Nabokov, Vladimir Vladimirovich
## 101                                                  Hamsun, Knut
## 102                       Obruchev, V. A. (Vladimir Afanasʹevich)
## 103                                              Simenon, Georges
## 104                                                  Head, Bessie
## 105                comte de, Mirabeau, Honoré-Gabriel de Riquetti
## 106                                             Hanrahan, Barbara
## 107                               Nabokov, Vladimir Vladimirovich
## 108                                              Bowen, Elizabeth
## 109                                              Holland, Richard
## 110                                                Marshall, Owen
## 111                                              Hazzard, Shirley
## 112                                                 abbé, Prévost
## 113                                                   Twain, Mark
## 114                                                  Kafka, Franz
## 115                      vicomte de, Chateaubriand, François-René
## 116                                                 Asimov, Isaac
## 117                                          Hawthorne, Nathaniel
## 118                                                  Mann, Thomas
## 119                                             Trollope, Anthony
## 120                                              Gordimer, Nadine
## 121                                Linebarger, Paul Myron Anthony
## 122                                           Williams, Tennessee
## 123                                                  Kafka, Franz
## 124                                             Chandler, Raymond
## 125                                           Chevallier, Gabriel
## 126                                          Tizora, Spencer S. M
## 127                                                              
## 128                                                Greene, Graham
## 129                                       Kennedy, John Pendleton
## 130                                                 Wilson, Colin
## 131                                             Sartre, Jean-Paul
## 132                                                Amis, Kingsley
## 133                                               Harrison, Harry
## 134                                            Maupassant, Guy de
## 135                                            Maupassant, Guy de
## 136                                                  James, Henry
## 137                                             Balzac, Honoré de
## 138                                             Brontë, Charlotte
## 139                                                  Mann, Thomas
## 140                                             Sartre, Jean-Paul
## 141                                                 Spark, Muriel
## 142                                              Poe, Edgar Allan
## 143                                                 Ḥakīm, Tawfīq
## 144                                                Conrad, Joseph
## 145                                              Sterne, Laurence
## 146                                                  London, Jack
## 147                                                 Butor, Michel
## 148                                            Tolstoy, Leo, graf
## 149                                           May, Karl Friedrich
## 150                                                Kundera, Milan
## 151                                             Chandler, Raymond
## 152                                              Dumas, Alexandre
## 153                                                  Ngumy, James
## 154                                                  Bunyan, John
## 155                                                 Troyat, Henri
## 156                                                  Idrīs, Yūsuf
## 157                                              Simenon, Georges
## 158                                             Jolley, Elizabeth
## 159                                                              
## 160                                         Singer, Israel Joshua
## 161                                                              
## 162                                             Manning, Frederic
## 163                                                Lem, Stanisław
## 164                                               Thomas, G. C. H
## 165                                                Lem, Stanisław
## 166                                                  Fisher, Mark
## 167                                              Halligan, Marion
## 168                                            Sender, Ramón José
## 169                                                 Green, Julien
## 170                                                 McCoy, Horace
## 171                           Crébillon, Claude-Prosper Jolyot de
## 172                                                 Grass, Günter
## 173                                              Edgeworth, Maria
## 174                                             MacDonald, George
## 175                                                Dickson, Lovat
## 176                                                 Musil, Robert
## 177                                                Greene, Graham
## 178                                            Markandaya, Kamala
## 179                                                 Xiaoxiaosheng
## 180                                              Moravia, Alberto
## 181                                               Abrahams, Peter
## 182                                                 Dinesen, Isak
## 183                                                    Nin, Anaïs
## 184                                             Balzac, Honoré de
## 185                                                Diderot, Denis
## 186                                               Abrahams, Peter
## 187                                               Bierce, Ambrose
## 188                                                 Spark, Muriel
## 189                                                              
## 190                                              Kipling, Rudyard
## 191                                                   Butler, Guy
## 192                                            Lessing, Doris May
## 193                                                Druon, Maurice
## 194                                                Druon, Maurice
## 195                                                   Nicol, Mike
## 196                                              Simenon, Georges
## 197                                           Dostoyevsky, Fyodor
## 198                                              Simenon, Georges
## 199                                                Semprún, Jorge
## 200                                                Roberts, Nancy
## 201                                              Bernanos, Michel
## 202                                                   Seed, Jenny
## 203                                                  Hugo, Victor
## 204                                                Fisher, Vardis
## 205                                                  Birch, Carol
## 206                                                  Mason, Simon
## 207                                            Ben Jelloun, Tahar
## 208                                              Trollope, Joanna
## 209                                            De Quincey, Thomas
## 210                                                  Franko, Ivan
## 211                                                              
## 212                                                  Ryman, Geoff
## 213                                                  Mann, Thomas
## 214                                           Rezzori, Gregor von
## 215                                    Scarborough, Elizabeth Ann
## 216                                               Fuentes, Carlos
## 217                                                Dobbs, Michael
## 218                                             Hodson, Peregrine
## 219                                                 Janaway, John
## 220                                              Ekwensi, Cyprian
## 221                                              Simenon, Georges
## 222                                                 Ellmann, Lucy
## 223                                               Robinson, Peter
## 224                                               Hveberg, Harald
## 225                                               Crosland, Susan
## 226                                              Simenon, Georges
## 227                                          Pasolini, Pier Paolo
## 228                                            Ben Jelloun, Tahar
## 229                                             Ginzburg, Natalia
## 230                                                 Navarre, Yves
## 231                                          Han, Suzanne Crowder
## 232                                                 Ableman, Paul
## 233                                     Turgenev, Ivan Sergeevich
## 234                                                Hill, Reginald
## 235                                                    Weil, Jiřı́
## 236                                             Kociancich, Vlady
## 237                                             Freemantle, Brian
## 238                                               Milligan, Spike
## 239                                                  Roth, Joseph
## 240                                          Burroughs, William S
## 241                                                  Shute, Nevil
## 242                                                Coverly, David
## 243                               Nabokov, Vladimir Vladimirovich
## 244                                                 Wilson, Colin
## 245                                                 Eliot, George
## 246                                                 Robins, Peter
## 247                                               Silone, Ignazio
## 248                                                 Green, Julien
## 249                                               Emecheta, Buchi
## 250                                    Hagedorn, Jessica Tarahata
## 251                                                Saro-Wiwa, Ken
## 252                                                 Beake, Lesley
## 253                                                Tennant, Kylie
## 254                                           McIlvanney, William
## 255                                            Jewett, Sarah Orne
## 256                                              Llywelyn, Morgan
## 257                                           Japrisot, Sébastien
## 258                                             Sollers, Philippe
## 259                                                 Tlali, Miriam
## 260                                                Sanders, Bruce
## 261                                             Josephus, Flavius
## 262                                                 Murdoch, Iris
## 263                                       Beli͡aev, A. (Aleksandr)
## 264                                                 Gregory, Lady
## 265                                                  Roth, Philip
## 266                                  Jacobsen, J. P. (Jens Peter)
## 267                                                Bolger, Dermot
## 268                                                   Cleary, Jon
## 269                                              Christie, Agatha
## 270                                          Bandele-Thomas, Biyi
## 271                                                Dick, Philip K
## 272                                                    Parks, Tim
## 273                                              Rutsala, Kirsten
## 274                                                Louvish, Simon
## 275                                             Alfeeva, Valerii͡a
## 276                                                     Fink, Ida
## 277                                                  Mann, Thomas
## 278                                             Henderson, Helena
## 279                                                   Banks, Iain
## 280                                                   Banks, Iain
## 281                                Goncharov, Ivan Aleksandrovich
## 282                                                   Klı́ma, Ivan
## 283                                                   Dyer, Geoff
## 284                                   Rybakov, Anatoliĭ Naumovich
## 285                                                              
## 286                                                              
## 287                                 Pushkin, Aleksandr Sergeevich
## 288                                                    Crace, Jim
## 289                                                 Manea, Norman
## 290                                            Cookson, Catherine
## 291                                Goncharov, Ivan Aleksandrovich
## 292                                            Drakulić, Slavenka
## 293                                                 Cohen, Dana S
## 294                                                              
## 295                                          Wiechert, Ernst Emil
## 296                                                Davies, Stevie
## 297                                                  Austen, Jane
## 298                                               Hašek, Jaroslav
## 299                                           Lowie, Robert Harry
## 300                                              Gustafsson, Lars
## 301                                                Harris, Martyn
## 302                                             Anderson, Barbara
## 303                                               Medvedev, I͡Uriĭ
## 304                                             Enquist, Per Olov
## 305                                                   Perutz, Leo
## 306                                            Sciascia, Leonardo
## 307                                                   Klíma, Ivan
## 308                                               Thomson, Rupert
## 309                                            Tolstai͡a, Tatʹi͡ana
## 310                                            Lloyd-Jones, Robin
## 311                                                    North, Sam
## 312                                                 Kenney, Susan
## 313                                                              
## 314                                               Kirchhoff, Bodo
## 315                                                Dick, Philip K
## 316                                                Prus, Bolesław
## 317                                                Palmen, Connie
## 318                                              Khamsing Srinawk
## 319                                              Moorhouse, Frank
## 320                                                Luangala, John
## 321                                                 Helwig, David
## 322                                                  Sandel, Cora
## 323                                             Carpentier, Alejo
## 324                                            D'Alpuget, Blanche
## 325                                                 Marinho, Tony
## 326                                                Dickins, Barry
## 327                                               McCaffrey, Anne
## 328                                                  Kafka, Franz
## 329                                             Duras, Marguerite
## 330                                              Dickens, Charles
## 331                                            Tacitus, Cornelius
## 332                                                  Brooks, John
## 333                                     Saint-Exupéry, Antoine de
## 334                                              Jackson, Michael
## 335                                             Turnbull, Colin M
## 336                                                  Andros, Phil
## 337                                                Buarque, Chico
## 338                                              Nhá̂t Hạnh, Thích
## 339                                               Mullen, Michael
## 340                                                Undset, Sigrid
## 341                                                              
## 342                                              Tournier, Michel
## 343                                                 Miller, Henry
## 344                                                Hesse, Hermann
## 345                                                  DeLillo, Don
## 346                                                 Brooks, Terry
## 347                                              Malamud, Bernard
## 348                                          Hawthorne, Nathaniel
## 349                                              Keneally, Thomas
## 350                                                  Bryson, John
## 351                                                   Brett, Lily
## 352                                              Norman, Howard A
## 353                                              Bisāṭī, Muḥammad
## 354                                                MacKenna, John
## 355                                               Weinerth, Lenke
## 356                                              Christie, Agatha
## 357                                              Dumas, Alexandre
## 358                                                  Austen, Jane
## 359                                                  Austen, Jane
## 360                                                Pourrat, Henri
## 361                                                  Idrīs, Yūsuf
## 362                                                              
## 363                                                 Godden, Rumer
## 364                                                   Dye, Alison
## 365                                              Machado de Assis
## 366                                                 Mellah, Fawzi
## 367                                              Piñera, Virgilio
## 368                                              Dos Passos, John
## 369                                                  Lorde, Audre
## 370                                                   Seki, Keigo
## 371                                                Riordan, James
## 372                                               Davin, Diarmuid
## 373                                            Poland, Marguerite
## 374                                                              
## 375                                             Ginzburg, Natalia
## 376                                                Williams, Bayo
## 377                                       Adimora-Ezeigbo, Akachi
## 378                                                 Queirs̤, Eȧ de
## 379                                            Villaseñor, Victor
## 380                                                  Head, Bessie
## 381                                               Mirbeau, Octave
## 382                                               Plunkett, James
## 383                                                   Cleary, Jon
## 384                                                Pavese, Cesare
## 385                                              Sagan, Françoise
## 386                                              Ford, Ford Madox
## 387                                                Lustig, Arnošt
## 388                                                Frayn, Michael
## 389                                                  Canin, Ethan
## 390                                               Kilworth, Garry
## 391                                                   Aho, Juhani
## 392                                                   Aleshkin, P
## 393                                              Rolfe, Frederick
## 394                                                Lagerlf̲, Selma
## 395                                              Dumas, Alexandre
## 396                                                 Louÿs, Pierre
## 397                                           Japrisot, Sébastien
## 398                                                    Drury, Tom
## 399                                                 Keane, John B
## 400                                           Sienkiewicz, Henryk
## 401                                                Dick, Philip K
## 402                                              Burke, James Lee
## 403                                               Collen, Lindsey
## 404                                                Callow, Edward
## 405                                                 Robson, Jenny
## 406                  Craigie, William A. (William Alexander), Sir
## 407                                            Phylactou, Takis G
## 408                                               Halldór Laxness
## 409                                                Palmer, Martin
## 410                                                  Nowra, Louis
## 411                                         Matthews, James David
## 412                                                       Colette
## 413                                                Conrad, Joseph
## 414                                                         Homer
## 415                                                        Longus
## 416                                               Leduc, Violette
## 417                                             Musset, Alfred de
## 418                                             Ka-tzetnik 135633
## 419                                                  Munro, Alice
## 420                                               Redonnet, Marie
## 421                                             Crichton, Michael
## 422                                                Conrad, Joseph
## 423                                                Billon, Pierre
## 424                                              Jones, Gwyneth A
## 425                                                Proust, Marcel
## 426                                           Barnard, Christiaan
## 427                                                    Gare, Nene
## 428                                           Japrisot, Sébastien
## 429                                                      Tal, Ali
## 430                                     Lie, Jonas Lauritz Idemil
## 431                      Afanasʹev, A. N. (Aleksandr Nikolaevich)
## 432                                                              
## 433                                             Civrieux, Marc de
## 434                                                Réage, Pauline
## 435                                               Clavel, Bernard
## 436                                                      Lao, She
## 437                                        Monfredo, Miriam Grace
## 438                                                Alpers, Antony
## 439                                               Mertens, Pierre
## 440                                           Veciana-Suarez, Ana
## 441                                                       Colette
## 442                                                 Bradbury, Ray
## 443                                              Brossard, Nicole
## 444                                             Balzac, Honoré de
## 445                                                       Pak, Ty
## 446                                             McCutchan, Philip
## 447                                                 Beake, Lesley
## 448                                                  Grubb, Davis
## 449                                  Freiin von, Le Fort, Gertrud
## 450                                               Morris, William
## 451                                               Beagle, Peter S
## 452                                  Shukshin, Vasiliĭ Makarovich
## 453                                                Lim, Catherine
## 454                                                 Tepper, Nanne
## 455                                                Saramago, José
## 456                                                  Stoker, Bram
## 457                                  Huysmans, J.-K. (Joris-Karl)
## 458                                               Conyngham, John
## 459                                                   Twain, Mark
## 460                                                  Madima, E. S
## 461                                                   Smith, Usen
## 462                                                  Leung, Brian
## 463                                               Couperus, Louis
## 464                                                Kadare, Ismail
## 465                                                Broch, Hermann
## 466                                                Situma, Joseph
## 467                                     Turgenev, Ivan Sergeevich
## 468                                     Turgenev, Ivan Sergeevich
## 469                                     Turgenev, Ivan Sergeevich
## 470                                                   Mándy, Iván
## 471                                         Krasznahorkai, László
## 472                                                   Loriga, Ray
## 473                                                 Petsinis, Tom
## 474                                     Turgenev, Ivan Sergeevich
## 475                                              Curtin, Jeremiah
## 476                                                   Rucka, Greg
## 477                                                Örkény, István
## 478                                                Kaffka, Margit
## 479                                                  Gáll, István
## 480                                                  Pamuk, Orhan
## 481                                         Van der Vyver, Marita
## 482                                                 Carrier, Roch
## 483                                            Andahazi, Federico
## 484                                                Macken, Walter
## 485                                                              
## 486                                                    Smith, Ali
## 487                                                Stein, Michael
## 488                                                Macken, Walter
## 489                                              Lovinescu, Tania
## 490                                                 Marian, Maria
## 491                                                  Hugo, Victor
## 492                                                Verweerd, Joke
## 493                                               Grunberg, Arnon
## 494                                              Harper, Beverley
## 495                                                              
## 496                                               Mirbeau, Octave
## 497                                                Goinga, Hylkje
## 498                                     Acosta Hernández, Juvenal
## 499                                         Pérez-Reverte, Arturo
## 500                                                 Bruce, Victor
## 501                                                Shields, Carol
## 502                                 Pushkin, Aleksandr Sergeevich
## 503                                             Trollope, Anthony
## 504                                              McCarthy, Cormac
## 505                                         Pérez-Reverte, Arturo
## 506                                               Schulberg, Budd
## 507                                             Bulgakov, Mikhail
## 508                                                      Apuleius
## 509                                          Faqīh, Aḥmad Ibrāhīm
## 510                                         Skiadaresēs, Spyros A
## 511                                          Faqīh, Aḥmad Ibrāhīm
## 512                                                              
## 513                                                 Ghosh, Amitav
## 514                                                  Kafka, Franz
## 515                                              Moravia, Alberto
## 516                                         De Bruyn, G&#xfc;nter
## 517                                     Kielland, Alexander Lange
## 518                                                 Ardiff, Karen
## 519                                               Lenz, Siegfried
## 520                                           Bauer, Josef Martin
## 521                                 Chamot, A. E. (Alfred Edward)
## 522                                               Rolland, Romain
## 523                                                 Kubin, Alfred
## 524                                                 Cossu, Antoni
## 525                                            Salomon, Ernst von
## 526                                              Arpino, Giovanni
## 527                                               Sen. Suemo-Chia
## 528                                                 Becker, Jurek
## 529                                               Kelley, William
## 530                                             Lord, Christopher
## 531                                                George, Nelson
## 532                                                 Norman, Diana
## 533                                             Scrupski, Barbara
## 534                                                              
## 535                                               Sanders, Andrew
## 536                                                    Hayder, Mo
## 537                                               Tyrewala, Altaf
## 538                                                Johnson, Jason
## 539                                           Skipper, Roger Alan
## 540                                             Turtledove, Harry
## 541                                                L'Amour, Louis
## 542                                                  Lupica, Mike
## 543                                             Turtledove, Harry
## 544                                                    Mills, Lia
## 545                                             El Koudia, Jilali
## 546                                             Mauriac, François
## 547                                               Menasse, Robert
## 548                                                    Savio, Jim
## 549                                              Mankell, Henning
## 550                                               Verga, Giovanni
## 551                                                 Osander, John
## 552                                                   Barr, Emily
## 553                                              Simenon, Georges
## 554                                                  Roth, Joseph
## 555                                              Jubrīl, Muḥammad
## 556                                               Jalāl, Muḥammad
## 557                                         Ḥamāmiṣī, ʻAbd al-ʻĀl
## 558                                                  Idrīs, Yūsuf
## 559                                                   Sales, Joan
## 560                                       Grn̜dahl, Jens Christian
## 561                                            Shortridge, Jennie
## 562                                                 Ferney, Alice
## 563                                                  Roth, Joseph
## 564                                                   Rohmer, Sax
## 565                                             Garcia, Ricardo L
## 566                                            Mastretta, Angeles
## 567                                              Simenon, Georges
## 568                                                    Heale, Jay
## 569                                              Simenon, Georges
## 570                                                    Wild, Kate
## 571                                                   Woolfe, Sue
## 572                                                    York, Lynn
## 573                                       Tondelli, Pier Vittorio
## 574                                                  Leppin, Paul
## 575                                                Lantigua, John
## 576                                                Pineda, Cecile
## 577                                 Dimarov, Anatoliĭ Andriĭovych
## 578                                 Dimarov, Anatoliĭ Andriĭovych
## 579                                                     Fry, John
## 580                                                Millar, Cormac
## 581                                             Nemésio, Vitorino
## 582                                              Dyer, Bernadette
## 583                                                   Tingle, Tim
## 584                                          Tagore, Rabindranath
## 585                                               Hveberg, Harald
## 586                                                  Verne, Jules
## 587                                         Zhitinskiĭ, Aleksandr
## 588                                             Durrell, Lawrence
## 589                                                Lash, Jennifer
## 590                                           Dostoyevsky, Fyodor
## 591                                                   Paton, Alan
## 592                                              Gischler, Victor
## 593                                                 Huston, Nancy
## 594                                                 Robbins, Kenn
## 595                                                  Bront,͡ Emily
## 596                                             Wādī, Ṭāhā ʻImrān
## 597                                             Ṭūkhī, ʻAbd Allāh
## 598                                              Yarshater, Ehsan
## 599                                           Dostoyevsky, Fyodor
## 600                                                 Orem, William
## 601                                                  Brown, Danit
## 602                                              Cendrars, Blaise
## 603                                                Lewis, Jeffrey
## 604                                                 Kwok, Roberta
## 605                                                Mars, Alastair
## 606                                                 Peltz, Daniel
## 607                                                   Kerr, Peter
## 608                                           Opelt, R&#xfc;diger
## 609                                                Tiffany, Grace
## 610                                                  Scott, Kevin
## 611                                              O'Brian, Patrick
## 612                                                  Gordon, Bill
## 613                                                              
## 614                                               King, Cassandra
## 615                                              Courtenay, Bryce
## 616                                                 Narayan, R. K
## 617                                         Te Awekotuku, Ngahuia
## 618                                               Marshall, Anita
## 619                                              Halligan, Marion
## 620                                                   Honey, John
## 621                                               Geary, Patricia
## 622                                                 Sheer, Rachel
## 623                                                  Hémon, Louis
## 624                                                              
## 625                                           Beauvoir, Simone de
## 626                                               Mohr, Nicholasa
## 627                                             Daeninckx, Didier
## 628                                              Plivier, Theodor
## 629                                                   Rajab, Muná
## 630                                                  Evans, David
## 631                                                   Doran, Phil
## 632                                                 Eyre, Richard
## 633                                         Hammond, Diane Coplin
## 634                                              Hart, Maarten 't
## 635                                                 Japin, Arthur
## 636                           Tolstoy, Aleksey Nikolayevich, graf
## 637                                           Hansen, Erik Fosnes
## 638                                           Nadīm Qāsimī, Aḥmad
## 639                                             Turtledove, Harry
## 640                                                 Kotting, Mark
## 641                                                Atasü, Erendiz
## 642                                              Bulfinch, Thomas
## 643                                                              
## 644                                               Sinclair, Upton
## 645                                                Lem, Stanisław
## 646                                            Eglesfield, Robert
## 647                                              Morris, Rosamund
## 648                                                   Kao, George
## 649                                              De Boos, Charles
## 650                                                    Rice, Anne
## 651                                             Williams, Raymond
## 652                                                Abdolah, Kader
## 653                                                 Haskell, John
## 654                                          Güntekin, Reşat Nuri
## 655                                                   Nesin, Aziz
## 656                                               Mağden, Perihan
## 657                                                   Nesin, Aziz
## 658                                                   Nesin, Aziz
## 659                                              De Boos, Charles
## 660                                              Moriarty, Sinéad
## 661                                                Mars, Alastair
## 662                                                  Simms, David
## 663                                                Sampson, Kevin
## 664                                           Yehoshua, Abraham B
## 665                                                       Mo, Yan
## 666                                                Epstein, Steve
## 667                                                Sullivan, K. E
## 668                                              Jonquet, Thierry
## 669                                                 Ellroy, James
## 670                                                              
## 671                                                  Wells, Roger
## 672                                     Batista, Silvana Pimentel
## 673                                                 Beard, Philip
## 674                                                Price, Stephen
## 675                                                              
## 676                           Korzh, V. E. (Viktor Emelʹi͡anovich)
## 677                                                   Orhan Kemal
## 678                                                   Orhan Kemal
## 679                                               Jameson, Alison
## 680                                               Attenberg, Jami
## 681                                              Leblanc, Maurice
## 682                                                Deegan, Denise
## 683                                                 Halter, Marek
## 684                                              Malarkey, Tucker
## 685                                          Soares, Luiz Eduardo
## 686                                                  Park, Samuel
## 687                                                 Ramslie, Lars
## 688                                                 Conway, Peter
## 689                                          Hollon, Frank Turner
## 690                            Campbell, C. G. (Charles Grimshaw)
## 691                                                       Colette
## 692                                              Rivers, Francine
## 693                                                  Murray, A. A
## 694                                   Gaskell, Elizabeth Cleghorn
## 695                                                  Sandel, Cora
## 696                                               Allnatt, Judith
## 697                                                      Su, Tong
## 698                                               Hettche, Thomas
## 699                                                  London, Jack
## 700                                                  Hind, Archie
## 701                                               Vickers, Salley
## 702                                            Schreiber, Claudia
## 703                                              Mc Leod, Cynthia
## 704                                          &#xd6;stergren, Klas
## 705                                                 Bennett, Alan
## 706                                             Heinesen, William
## 707                                             Devenne, François
## 708                                                   Uri, Helene
## 709                                                  Harri, Kitty
## 710                                                Ross, Catriona
## 711                                            Lessing, Doris May
## 712                   Bleek, W. H. I. (Wilhelm Heinrich Immanuel)
## 713                                                 Peltz, Daniel
## 714                                                              
## 715                                    Ruswa, Mirza Mohammad Hadi
## 716                                         Howells, William Dean
## 717                                       Barrett, William Edmund
## 718                                          Brooks, Anne Tedlock
## 719                                              Fletcher, Inglis
## 720                                              Fletcher, Inglis
## 721                                              Gordon, Caroline
## 722                                               Axelrod, George
## 723                                                Beecroft, John
## 724                                                Britten, Bruce
## 725                                         Westcott, Jan Vlachos
## 726                                                 Williams, Jay
## 727                                                 Wylie, Philip
## 728                                               Gellin, William
## 729                                                   Ardies, Tom
## 730                                              Gamble, Robert H
## 731                                                 Green, Joseph
## 732                                                 Davis, Judith
## 733                                                 Adler, Warren
## 734                                               Whitlock, Brand
## 735                                            Whitney, Phyllis A
## 736                                             Fink, Jon Stephen
## 737                                               Fisher, James A
## 738                                                Flynt, Candace
## 739                                                Fried, Emanuel
## 740                                               Windham, Donald
## 741                                       Swarthout, Glendon Fred
## 742                                            Ogilvie, Elisabeth
## 743                                                 Hurst, Fannie
## 744                                                 Hurst, Fannie
## 745                                                 Scott, Virgil
## 746                                       Southon, Arthur Eustace
## 747                                        Hill, Grace Livingston
## 748                                                     Orr, Mary
## 749                                                   Eyre, David
## 750                                             Fahy, Christopher
## 751                                                  Alley, Henry
## 752                                    Manfred, Frederick Feikema
## 753                                    Burnett, Frances (Hodgson)
## 754                                      Cable, George Washington
## 755                                              Brown, Joe David
## 756                                                 Castro, Brian
## 757                                                  Hassler, Jon
## 758                                                 Gavalda, Anna
## 759                                                Ghata, Yasmine
## 760                                                Bennett, Tegan
## 761                                                  Brycz, Pavel
## 762                                      Christensen, Lars Saabye
## 763                                            Kelly, Christopher
## 764                                                Murray, Marris
## 765                                             Hériz, Enrique de
## 766                                               Bhandari, Mannu
## 767                                              Nhá̂t Hạnh, Thích
## 768                                              Oster, Christian
## 769                                              Dos Passos, John
## 770                                           Dostoyevsky, Fyodor
## 771                                                 Benson, Robby
## 772                                       Smith, Charlotte Turner
## 773                                       Smith, Charlotte Turner
## 774                                              Kovačević, Dušan
## 775                                                   Davis, Anna
## 776                                                 Defoe, Daniel
## 777                                          Hawthorne, Nathaniel
## 778                                       Stevenson, Robert Louis
## 779                                           Sienkiewicz, Henryk
## 780                                             Trollope, Anthony
## 781                                           Dostoyevsky, Fyodor
## 782                                                 Hope, Anthony
## 783                                     Turgenev, Ivan Sergeevich
## 784                                  Pasternak, Boris Leonidovich
## 785                                                   Leaf, Munro
## 786                                               Steinbeck, John
## 787                                             Kantor, MacKinlay
## 788                                                   Agee, James
## 789                                           Dostoyevsky, Fyodor
## 790                                            Tolstoy, Leo, graf
## 791                                            Irving, Washington
## 792                                                  Wilde, Oscar
## 793                                  Thackeray, William Makepeace
## 794                                              Poe, Edgar Allan
## 795                                        Stowe, Harriet Beecher
## 796                                                 Jünger, Ernst
## 797                                            Vincenz, Stanisław
## 798                                            Vaidya, Karuna Kar
## 799                                                   Dégh, Linda
## 800                                                 Guillot, René
## 801                                                  Sava, George
## 802                                                 Cook, David M
## 803                                               Graham, Winston
## 804                                             Bainbridge, Beryl
## 805                                                  Hobson, Mary
## 806                                              Neblett, William
## 807                                               Bowery, Michael
## 808                                                  Žabot, Vlado
## 809                                          Van Niekerk, Marlene
## 810                                                    Blecher, M
## 811                                                 Ṭaḥāwī, Mīrāl
## 812                                              Marshall, Joseph
## 813                                               Tāmir, Zakarīyā
## 814                                                Fujita, Hiroko
## 815                                          Cozzens, James Gould
## 816                                               Lewis, Sinclair
## 817                                                  Drury, Allen
## 818                                                Wharton, Edith
## 819                              Andersen, H. C. (Hans Christian)
## 820                                            Tolstoy, Leo, graf
## 821                    Hoffmann, E. T. A. (Ernst Theodor Amadeus)
## 822                                                   Vidal, Gore
## 823                                                              
## 824                                     Turgenev, Ivan Sergeevich
## 825                                                Flavin, Martin
## 826                                               Styron, William
## 827                                         Barnes, Margaret Ayer
## 828                              Andersen, H. C. (Hans Christian)
## 829                                                    Leo, Chris
## 830                                           Davies, Deborah Kay
## 831                                         Flygare-Carlň, Emilie
## 832                                                    Ukah, John
## 833                                  Pasternak, Boris Leonidovich
## 834                                          Van Niekerk, Marlene
## 835                                                 Slade, Stuart
## 836                                                   Dekker, Ted
## 837                                               Matthee, Dalene
## 838                                             Kingsley, Charles
## 839                                                              
## 840                                                 Brijs, Stefan
## 841                                          Ardamatskiĭ, Vasiliĭ
## 842                                                Hoffmann, Poul
## 843                                          Larsen, Hanna Astrup
## 844                                                          Soya
## 845                                        Govan, Christine Noble
## 846                                                Hunt, Marigold
## 847                                                    Grey, Zane
## 848                                        Apollinaire, Guillaume
## 849                                              Edgeworth, Maria
## 850                                   Swinburne, Algernon Charles
## 851                                                 Konadu, Asare
## 852                                                  London, Jack
## 853                                             Trollope, Anthony
## 854                                             Trollope, Anthony
## 855                                       Stevenson, Robert Louis
## 856                                       Stevenson, Robert Louis
## 857                                       Stevenson, Robert Louis
## 858                                                  James, Henry
## 859                                           Sienkiewicz, Henryk
## 860                                               Thompson, Stith
## 861                                              Deeping, Warwick
## 862                                               Brecht, Bertolt
## 863                                             Trollope, Anthony
## 864                                          Kleist, Heinrich von
## 865                                              Kipling, Rudyard
## 866                                                              
## 867                                      Mörike, Eduard Friedrich
## 868                                                  Mann, Thomas
## 869                                            Du Maurier, Daphne
## 870                                  Platonov, Andreĭ Platonovich
## 871                                               Lagerkvist, Pär
## 872                                               Verga, Giovanni
## 873                                           Rilke, Rainer Maria
## 874                                                Diderot, Denis
## 875                                             Gerlach, Heinrich
## 876                                              Moravia, Alberto
## 877                                                Amis, Kingsley
## 878                                                 Lorrain, Jean
## 879                                                   Twain, Mark
## 880                                                 Grass, Günter
## 881                                                 Storey, David
## 882                                                Innes, Michael
## 883                                                Waugh, Auberon
## 884                                                Waugh, Auberon
## 885                                                 Waugh, Evelyn
## 886                                                   Scott, Paul
## 887                                                   Scott, Paul
## 888                                            Maupassant, Guy de
## 889                                              Campbell, Arthur
## 890                                        Wardrop, Marjory Scott
## 891                                                 Zweig, Stefan
## 892                                            Klossowski, Pierre
## 893                                         Yourcenar, Marguerite
## 894                                              Andreyev, Leonid
## 895                                                Crane, Stephen
## 896                                          Laclos, Choderlos de
## 897                                                Hall, Oakley M
## 898                                             Callaghan, Morley
## 899                                                 Gaskell, Jane
## 900                                           Andres, Stefan Paul
## 901                             Sholokhov, Mikhail Aleksandrovich
## 902                                                Frobenius, Leo
## 903                                              Melville, Herman
## 904                                              Dickens, Charles
## 905                                        Howard, Elizabeth Jane
## 906                                        Howard, Elizabeth Jane
## 907                                                    Carew, Jan
## 908                                         Singer, Israel Joshua
## 909                                       Blicher, Steen Steensen
## 910                                                   Orhan Kemal
## 911                                                  Amado, Jorge
## 912                                             Radiguet, Raymond
## 913                                                  Peis, Günter
## 914                                            Tolstoy, Leo, graf
## 915                                               Fielding, Henry
## 916                                             Flaubert, Gustave
## 917                                                   Zola, Émile
## 918                                             Jahnn, Hans Henny
## 919                                                 Zweig, Stefan
## 920                                                       Colette
## 921                                               Reeman, Douglas
## 922                                      Ganier-Raymond, Philippe
## 923                                            Richardson, Samuel
## 924                                               Reeman, Douglas
## 925                                          Larsen, Hanna Astrup
## 926                                               Freuchen, Peter
## 927                                                Corelli, Marie
## 928                                                              
## 929                                               Abrahams, Peter
## 930                                                 Narayan, R. K
## 931                                                     Wu, Luqin
## 932                                           Hildebrandt, Rainer
## 933                                             Marton, Francesca
## 934                                                Lindsay, David
## 935                                                Canetti, Elias
## 936                                                  Mann, Thomas
## 937                                              Edelman, Maurice
## 938                                                   Zola, Émile
## 939                                          Richter, Hans Werner
## 940                                                 Renault, Mary
## 941                                              Bowen, Elizabeth
## 942                                                 Wilson, Angus
## 943                                              Simenon, Georges
## 944                                                   Twain, Mark
## 945                                                Vonnegut, Kurt
## 946                                          Lymperakē, Margarita
## 947                                     Turgenev, Ivan Sergeevich
## 948                                              Simenon, Georges
## 949                                                  James, Henry
## 950                                            Marryat, Frederick
## 951                                                   White, W. J
## 952                                            Mortimer, Penelope
## 953                                             Kennedy, Margaret
## 954                                                  Ambler, Eric
## 955                                                Bramah, Ernest
## 956                                            Bonfiglioli, Kyril
## 957                                                 Gunn, James E
## 958                                                 Perlow, Isaac
## 959                                                   Ogot, Grace
## 960                                               Aldridge, James
## 961                                                 Lawson, Henry
## 962                                       Jarman, Rosemary Hawley
## 963                                               O'Hagan, Howard
## 964                                               Burgess, Yvonne
## 965                                                 Wilson, Colin
## 966                                                 Hinga, Edward
## 967                                                  Volen, Ilii͡a
## 968                                         Jhabvala, Ruth Prawer
## 969                                              Collier, Richard
## 970                                            Kozhevnikov, Vadim
## 971                                            Kozhevnikov, Vadim
## 972                                                  Rahv, Philip
## 973                                                  London, Jack
## 974                                             Bercovici, Konrad
## 975                                                     Fox, John
## 976                                                  Hansson, Per
## 977                                                   Mucha, Jiří
## 978                                              Edgeworth, Maria
## 979                                                 Seghers, Anna
## 980                                          Richter, Hans Werner
## 981                                            Schnitzler, Arthur
## 982                                           Peck, Robert Newton
## 983                                                 Norton, Andre
## 984                                                              
## 985                                            Sudermann, Hermann
## 986                                                  Renn, Ludwig
## 987                                             Bulgakov, Mikhail
## 988                                        Singer, Isaac Bashevis
## 989                                             MacLean, Alistair
## 990                                         Dürrenmatt, Friedrich
## 991                               Nabokov, Vladimir Vladimirovich
## 992                                                 Clanchy, John
## 993                                               Matthee, Dalene
## 994                                             Jenkins, Geoffrey
## 995                                                 Hofmann, Gert
## 996                                        Schoendoerffer, Pierre
## 997                                                Greene, Graham
## 998                                               Fielding, Henry
## 999                                                Sperber, Manès
## 1000                                         Rhoidēs, Emmanouēl D
## 1001                                              Bennett, Arnold
## 1002                                                    Traven, B
## 1003                                             Stewart, Michael
## 1004                                            Mauriac, François
## 1005                                             Wilding, Michael
## 1006                                           Powys, John Cowper
## 1007                                           Lessing, Doris May
## 1008                                     Chekhov, Anton Pavlovich
## 1009                                             MacGill, Patrick
## 1010                                                 Roth, Joseph
## 1011                                               Orwell, George
## 1012                                        Remarque, Erich Maria
## 1013                                                  Tyler, Anne
## 1014                                                Chabot, Denys
## 1015                                                 Sante, Frank
## 1016                                   Vasconcelos, José Mauro de
## 1017                                                 Daumal, René
## 1018                                            Mauriac, François
## 1019                                             Sagan, Françoise
## 1020                                           Maupassant, Guy de
## 1021                                                 Paley, Grace
## 1022                                              MacCarthy, Mary
## 1023                                               Mann, Heinrich
## 1024                                                 Moss, Robert
## 1025                                             Tournier, Michel
## 1026                                 Prichard, Katharine Susannah
## 1027                                               Lustig, Arnošt
## 1028                                              Verga, Giovanni
## 1029                                                Cather, Willa
## 1030                                              Matthee, Dalene
## 1031                                                Renard, Jules
## 1032                                                 Wiesel, Elie
## 1033                                                Nwankwo, Nkem
## 1034                                             Simenon, Georges
## 1035                                           Oates, Joyce Carol
## 1036                                                 Thomas, D. M
## 1037                                                Carlson, P. M
## 1038                                             Grahame, Kenneth
## 1039                   comte de, Villiers de L'Isle-Adam, Auguste
## 1040                                           Goldstein, Rebecca
## 1041                                                  Anatoliĭ, A
## 1042                                            Hammett, Dashiell
## 1043                                           Allingham, Margery
## 1044                                               Malraux, André
## 1045                                                             
## 1046                                                             
## 1047                                          Gadda, Carlo Emilio
## 1048                                            Bulgakov, Mikhail
## 1049                                              Vailland, Roger
## 1050                                    Turgenev, Ivan Sergeevich
## 1051                                               Waugh, Auberon
## 1052                                        Montherlant, Henry de
## 1053                                               Broch, Hermann
## 1054                                     Chekhov, Anton Pavlovich
## 1055                                                  Cary, Joyce
## 1056                                         Maeterlinck, Maurice
## 1057                              Soloukhin, Vladimir Alekseevich
## 1058                                            Pirandello, Luigi
## 1059                           Antonov, S. F. (Sergeĭ Fedorovich)
## 1060                                                 Nwapa, Flora
## 1061                                             Bowen, Elizabeth
## 1062                                                Varney, Joyce
## 1063                                               Lem, Stanisław
## 1064                                                    Agi͡eev, M
## 1065                                               Lem, Stanisław
## 1066                                                 Barton, Tony
## 1067                                               Böll, Heinrich
## 1068                                               Baker, Larry L
## 1069                                            Skrzynecki, Peter
## 1070                                             Simenon, Georges
## 1071                                            Pirandello, Luigi
## 1072                                             Škvorecký, Josef
## 1073                                     Chekhov, Anton Pavlovich
## 1074                                                Simon, Claude
## 1075                                              Wheatley, Nadia
## 1076                                             Rashidov, Sharof
## 1077                                                Abbey, Edward
## 1078                                                  Zola, Émile
## 1079                                Trifonov, I͡Uriĭ Valentinovich
## 1080                                            Freeling, Nicolas
## 1081                                            MacDonald, George
## 1082                                            Balzac, Honoré de
## 1083                                               Eliade, Mircea
## 1084                                               Orphée, Elvira
## 1085                                             Boldrewood, Rolf
## 1086                                            Chinodya, Shimmer
## 1087                                             Sagan, Françoise
## 1088                                                 Stoker, Bram
## 1089                                              Aĭnī, Sadriddin
## 1090                                             Tournier, Michel
## 1091                                        Stratton-Porter, Gene
## 1092                                            Pirandello, Luigi
## 1093                                 Pasternak, Boris Leonidovich
## 1094                                                Garner, Helen
## 1095                                                 Nwapa, Flora
## 1096                                        Voznesenskai͡a, I͡Ulii͡a
## 1097                                                             
## 1098                                                             
## 1099                                               Lartéguy, Jean
## 1100                                                Lawson, Henry
## 1101                                             Adamovich, Alesʹ
## 1102                                       Du Plessis, Izak David
## 1103                                             Simenon, Georges
## 1104                                     Caussade, Jean Pierre de
## 1105                                                Cross, Amanda
## 1106                                  Gaskell, Elizabeth Cleghorn
## 1107                                                 Bowles, Paul
## 1108                                                 Astley, Thea
## 1109                                           Tolstoy, Leo, graf
## 1110                                               Conrad, Joseph
## 1111                                               Conrad, Joseph
## 1112                                            Heinesen, William
## 1113                                 Shevchuk, Vasylʹ Andriĭovych
## 1114                                           Tolstoy, Leo, graf
## 1115                                               Stow, Randolph
## 1116                                         Andersen Nex,̜ Martin
## 1117                           Antonenko-Davydovych, Borys, pseud
## 1118                                        Ramdoyal, Ramesh Dutt
## 1119                                                             
## 1120                                                 Astley, Thea
## 1121                                                Narayan, R. K
## 1122                             Solzhenit͡syn, Aleksandr Isaevich
## 1123                                             Bowen, Elizabeth
## 1124                                           Strindberg, August
## 1125                             Solzhenit͡syn, Aleksandr Isaevich
## 1126                                                  Ogot, Grace
## 1127                                 Teslenko, Arkhyp I͡Ukhymovych
## 1128                                                 Aymé, Marcel
## 1129                                           Chodźko, Alexander
## 1130                                                McDonald, Eva
## 1131                                               Pauwels, Louis
## 1132                                                  Kolia, John
## 1133                                            Dickson, Gordon R
## 1134                                                    Traven, B
## 1135                                              Leonard, Elmore
## 1136                                            Duras, Marguerite
## 1137                                              Gardner, John E
## 1138                                                 Cankar, Ivan
## 1139                                                             
## 1140                                                  Zola, Émile
## 1141                                               Greene, Graham
## 1142                                                  Gide, André
## 1143                                                  Gide, André
## 1144                                                 Yi, Yŏng-gyu
## 1145                                          Chrétien, de Troyes
## 1146                                            Berkeley, Anthony
## 1147                            Sholokhov, Mikhail Aleksandrovich
## 1148                                                 Hanson, S. E
## 1149                                           Lessing, Doris May
## 1150                                                Hardy, Thomas
## 1151                                              Olivier, Stefan
## 1152                                             Boldrewood, Rolf
## 1153                                            Davies, Robertson
## 1154                                           Pochivalov, Leonid
## 1155                               Goncharov, Ivan Aleksandrovich
## 1156                               Goncharov, Ivan Aleksandrovich
## 1157                                                 Clarke, Anna
## 1158                                             Schreiner, Olive
## 1159                                                Rendell, Ruth
## 1160                                             Simenon, Georges
## 1161                                                  Ogot, Grace
## 1162                                               Osofisan, Femi
## 1163                                  Bryusov, Valery Yakovlevich
## 1164                                               White, Antonia
## 1165                                               Williams, N. D
## 1166                                                  Dahl, Roald
## 1167                                                Appiah, Peggy
## 1168                                           Maupassant, Guy de
## 1169                                          Boccaccio, Giovanni
## 1170                                                Merle, Robert
## 1171                      Petitot, Emile Fortuné Stanislas Joseph
## 1172                                              Tynan, Kathleen
## 1173                                               Stow, Randolph
## 1174                                               Hardy, Frank J
## 1175                                     Saint, More, Thomas, Sir
## 1176                                              Gardner, John E
## 1177                                               Kahiga, Samuel
## 1178                                              Evslin, Bernard
## 1179                                               Mitford, Nancy
## 1180                                               Gifford, Barry
## 1181                                             Fontane, Theodor
## 1182                                       Apollinaire, Guillaume
## 1183                                             Arenas, Reinaldo
## 1184                                              MacInnes, Colin
## 1185                                                 Bail, Murray
## 1186                                             Remizov, Alekseĭ
## 1187                     Chateaubriand, François-René, vicomte de
## 1188                                             Heyer, Georgette
## 1189                                              Ngʼweno, Hilary
## 1190                                                 Svevo, Italo
## 1191                                               Herzl, Theodor
## 1192                                         Bayley, Barrington J
## 1193                                            Bernanos, Georges
## 1194                                                 Bellow, Saul
## 1195                                                  Sachs, Hans
## 1196                                            Sacchetti, Franco
## 1197                                         Mansfield, Katherine
## 1198                                                   Habe, Hans
## 1199                                             Gordimer, Nadine
## 1200                                               Nolen, Barbara
## 1201                                                 Austen, Jane
## 1202                                               Greene, Graham
## 1203                                        Jhabvala, Ruth Prawer
## 1204                                             Christie, Agatha
## 1205                                               Roberts, Keith
## 1206                                               Mulisch, Harry
## 1207                                     Johnson, Pamela Hansford
## 1208                                                Barstow, Stan
## 1209                                             Kipling, Rudyard
## 1210                                                Cather, Willa
## 1211                                           Kazantzakis, Nikos
## 1212                                              Powell, Anthony
## 1213                                       Bjørnson, Bjørnstjerne
## 1214                                             Burgess, Anthony
## 1215                                                Zhang, Ailing
## 1216                                                Lawson, Henry
## 1217                                             Moorhouse, Frank
## 1218                                            Brontë, Charlotte
## 1219                                             Christie, Agatha
## 1220                                                Wilson, Colin
## 1221                                        Serote, Mongane Wally
## 1222                                                 Ya sar Kemal
## 1223                                                Egbuna, Obi B
## 1224                                             Percha, Igor von
## 1225                                           Tolstoy, Leo, graf
## 1226                                             Dumas, Alexandre
## 1227                                            Konwicki, Tadeusz
## 1228                                               Chatwin, Bruce
## 1229                                                  Chase, Joan
## 1230                                                             
## 1231                                              Godwin, William
## 1232                   comte de, Villiers de L'Isle-Adam, Auguste
## 1233                                          Falkner, John Meade
## 1234                                       Telles, Lygia Fagundes
## 1235                                             Simenon, Georges
## 1236                                             Armstrong, Peter
## 1237                                              McGregor, Craig
## 1238                                                 Verne, Jules
## 1239                                              Grenville, Kate
## 1240                                               Ireland, David
## 1241                                                Vierci, Pablo
## 1242                                              Semenov, I͡Ulian
## 1243                                  Goethe, Johann Wolfgang von
## 1244                                             Plivier, Theodor
## 1245                                             Stepanov, Viktor
## 1246                                             Coombs, Margaret
## 1247                         Uspenskiĭ, P. D. (Petr Demʹi͡anovich)
## 1248                                              Manning, Olivia
## 1249                                                Handke, Peter
## 1250                                                             
## 1251                                                 Kafka, Franz
## 1252                                               Greene, Graham
## 1253                                                Topol, Edward
## 1254                                 Dombrovskiĭ, I͡Uriĭ Osipovich
## 1255                                            Duras, Marguerite
## 1256                                              Steinbeck, John
## 1257                                                  Cleary, Jon
## 1258                                            Sahgal, Nayantara
## 1259                                               Conrad, Joseph
## 1260                                                Foster, David
## 1261                                                    Unt, Mati
## 1262                                            Cornwell, Bernard
## 1263                                             Melville, Herman
## 1264                                             Prantera, Amanda
## 1265                                                Buzzati, Dino
## 1266                                             Halligan, Marion
## 1267                                               Honchar, Olesʹ
## 1268                                           Gombrowicz, Witold
## 1269                                                 Bunyan, John
## 1270                                            Hamilton, Patrick
## 1271                                               Lustig, Arnošt
## 1272                                       França Júnior, Oswaldo
## 1273                                             Dickens, Charles
## 1274                                                  Chase, Owen
## 1275                                                             
## 1276                                             Power, Phyllis M
## 1277                                    Liguori-Reynolds, Rosalie
## 1278                                                             
## 1279                                             Kavčič, Vladimir
## 1280                                                Jin, Shoushen
## 1281                                       mashhadī. Galīn Khānum
## 1282                                       Picard, Barbara Leonie
## 1283                                           Paulaharju, Samuli
## 1284                                           Williamson, Duncan
## 1285                                                             
## 1286                                                             
## 1287                                                             
## 1288                                       Scott, William Neville
## 1289                                        Dadié, Bernard Binlin
## 1290                                                             
## 1291                                                             
## 1292                                                 Creangă, Ion
## 1293                                                  Zipes, Jack
## 1294                                                  Jones, Gwyn
## 1295                                                  Rizal, José
## 1296                           Campbell, C. G. (Charles Grimshaw)
## 1297                                                             
## 1298                                                 Wood, Ramsay
## 1299                                           Petrie, Winifred M
## 1300                                                             
## 1301                                                             
## 1302                                                Illyés, Gyula
## 1303                                         Manunet Banhān, phya
## 1304                                                Gaster, Moses
## 1305                                                Aubry, Claude
## 1306                                                             
## 1307                                                Pak, Yŏng-jun
## 1308                                                Pak, Yŏng-jun
## 1309                                            Elliot, Geraldine
## 1310                                                             
## 1311                                     Mījatovīć, Elodie Lawton
## 1312                                            Hulpach, Vladimír
## 1313                                                   Kim, So-un
## 1314                                               Thomson, David
## 1315                                               Hughes, Brenda
## 1316                                              Baudiš, Josef B
## 1317                                              Dietrich, Anton
## 1318                                               Grimal, Pierre
## 1319                              Arnow, Harriette Louisa Simpson
## 1320                                     Jeffrey, Adi-Kent Thomas
## 1321                                               Benedict, Ruth
## 1322                                              Hensman, Bertha
## 1323                   Hoffmann, E. T. A. (Ernst Theodor Amadeus)
## 1324                                               Karlin, Alma M
## 1325                                                             
## 1326                                                 Lang, Andrew
## 1327                                          Simpson, Jacqueline
## 1328                           Campbell, C. G. (Charles Grimshaw)
## 1329                                        Edogawa, Rampo, pseud
## 1330                                             Cendrars, Blaise
## 1331                                          Valdelomar, Abraham
## 1332                             Andersen, H. C. (Hans Christian)
## 1333                                             Thorpe, Benjamin
## 1334                                            Huisman, Marcelle
## 1335                                                 Brians, Paul
## 1336                                             Downing, Charles
## 1337                                               Postma, Minnie
## 1338                                                 Zŏng, In-sŏb
## 1339                             Levy, Howard S. (Howard Seymour)
## 1340                                     Mutwa, Credo Vusa'mazulu
## 1341                                                Boucher, Alan
## 1342                                           Tolstoy, Leo, graf
## 1343                                           Tolstoy, Leo, graf
## 1344                                             Sterne, Laurence
## 1345                                        Scarpato, Nonna Maria
## 1346                                        Jain, Jagdish Chandra
## 1347                                               Calvino, Italo
## 1348                                                David, Alfred
## 1349                                                             
## 1350                            Sholokhov, Mikhail Aleksandrovich
## 1351                            Sholokhov, Mikhail Aleksandrovich
## 1352                                                  Brin, David
## 1353                                  Roa Bastos, Augusto Antonio
## 1354                                          Goncourt, Edmond de
## 1355                                            Thompson, Maurice
## 1356                                               Greene, Graham
## 1357                                           Aldington, Richard
## 1358                                                             
## 1359                                       Asturias, Miguel Angel
## 1360                                           Tolstoy, Leo, graf
## 1361                                                             
## 1362                                                  Zola, Émile
## 1363                                      Morier, James Justinian
## 1364                                               Wharton, Edith
## 1365                                         Silko, Leslie Marmon
## 1366                                             Yezierska, Anzia
## 1367                                          Williams, Tennessee
## 1368                             Andersen, H. C. (Hans Christian)
## 1369                                        Remarque, Erich Maria
## 1370                                                Musil, Robert
## 1371                                                Musil, Robert
## 1372                                           Tolstoy, Leo, graf
## 1373                                            Stifter, Adalbert
## 1374                                            Stifter, Adalbert
## 1375                                               Kundera, Milan
## 1376                                              Bergman, Ingmar
## 1377                                        Jhabvala, Ruth Prawer
## 1378                                                        Plato
## 1379                                                 Mann, Thomas
## 1380                                                 Camara, Laye
## 1381                                                  Beti, Mongo
## 1382                                                 Amado, Jorge
## 1383                                            Ngũgĩ wa Thiongʼo
## 1384                                                Musil, Robert
## 1385                                                Eliot, George
## 1386                                              Sparrow, Gerald
## 1387                                                 Mann, Thomas
## 1388                                               Zelazny, Roger
## 1389                                            Dreiser, Theodore
## 1390                                                 Roth, Joseph
## 1391                                             Simenon, Georges
## 1392                                              French, Marilyn
## 1393                                                  Shaw, Irwin
## 1394                                              Dowell, Coleman
## 1395                                                 Godwin, Gail
## 1396                                                             
## 1397                                               Calvino, Italo
## 1398                                            Sábato, Ernesto R
## 1399                                                Spark, Muriel
## 1400                                             Krleža, Miroslav
## 1401                                                  Frank, Anne
## 1402                                                 Paley, Grace
## 1403                                                 Bellow, Saul
## 1404                                                Musil, Robert
## 1405                                                 Kafka, Franz
## 1406                              Branner, H. C. (Hans Christian)
## 1407                                            Sartre, Jean-Paul
## 1408                                                Siodmak, Curt
## 1409                                          Martin-Santos, Luis
## 1410                                            Carpentier, Alejo
## 1411                                              Osborn, Carolyn
## 1412                                              Gordon, Richard
## 1413                                                  Owen, Wendy
## 1414                                            Guarini, Battista
## 1415                                                Palmer, Vance
## 1416                                               Panger, Daniel
## 1417                                               Panger, Daniel
## 1418                                                   Park, Ruth
## 1419                                                   Park, Ruth
## 1420                                              Packer, Bernard
## 1421                                                  Lee, Vernon
## 1422                                                Palà, Dolores
## 1423                                                Pearson, John
## 1424                                             Pearson, William
## 1425                                             Pemba, Tsewang Y
## 1426                                                Payne, Robert
## 1427                                       Peake, Mervyn Laurence
## 1428                                              Perham, Margery
## 1429                                            Philipson, Morris
## 1430                                              Phelps, Gilbert
## 1431                                              Phelps, Gilbert
## 1432                                              Phelps, Gilbert
## 1433                                         Petrakis, Harry Mark
## 1434                                                Piercy, Marge
## 1435                                             Poe, Edgar Allan
## 1436                                             Poe, Edgar Allan
## 1437                                               Pohl, Frederik
## 1438                                               Pohl, Frederik
## 1439                                               Pohl, Frederik
## 1440                                               Pohl, Frederik
## 1441                                             Poole, Josephine
## 1442                                             Houghton, Claude
## 1443                                                 O'Hara, John
## 1444                                                 O'Hara, John
## 1445                                              O'Meara, Walter
## 1446                                          Bauer, Josef Martin
## 1447                                       Howard, Elizabeth Jane
## 1448                                               White, Patrick
## 1449                                                Cocteau, Jean
## 1450                                                Gorky, Maksim
## 1451                                                 Ehrlich, Max
## 1452                                             Patterson, Henry
## 1453                                              Beckett, Samuel
## 1454                                            Callaghan, Morley
## 1455                                                  Zola, Émile
## 1456                                                   Faust, Ron
## 1457                                          Dostoyevsky, Fyodor
## 1458                                              Durrell, Gerald
## 1459                                               Merrill, James
## 1460                                              Kusenberg, Kurt
## 1461                                         Brown, George Mackay
## 1462                              Nabokov, Vladimir Vladimirovich
## 1463                                                  Rechy, John
## 1464                                             Simenon, Georges
## 1465                                        Wallant, Edward Lewis
## 1466                                                Camus, Albert
## 1467                                                  Kayam, Umar
## 1468                                          Japrisot, Sébastien
## 1469                                               Orwell, George
## 1470                                               Calvino, Italo
## 1471                                                 O'Hara, John
## 1472                                                 Horgan, Paul
## 1473                                             Rama Rau, Santha
## 1474                                                 Raven, Simon
## 1475                                                  Puzo, Mario
## 1476                                                  Puzo, Mario
## 1477                                              Djilas, Milovan
## 1478                                             Giovannitti, Len
## 1479                                              Gissing, George
## 1480                                              Gissing, George
## 1481                                             Proctor, Maurice
## 1482                                                 Price, Nancy
## 1483                                                 Raven, Simon
## 1484                                                Soyinka, Wole
## 1485                                           Spencer, Elizabeth
## 1486                                                Spark, Muriel
## 1487                                               Spencer, Colin
## 1488                                               Woolf, Leonard
## 1489                                                Miller, Nolan
## 1490                                             Miller, Walter M
## 1491                                               Miller, Warren
## 1492                                                Meyers, Manny
## 1493                                             Smith, Catherine
## 1494                                                Smith, Carrie
## 1495                                      Smith, Charlotte Turner
## 1496                                           Slaughter, Carolyn
## 1497                                                Slote, Alfred
## 1498                                               Slimming, John
## 1499                                               Smith, Herbert
## 1500                                                Miller, Jimmy
## 1501                                                  Smith, Emma
## 1502                                               Miller, Warren
## 1503                                                  Smith, Mark
## 1504                                                  Smith, Mark
## 1505                                             Smith, Patrick D
## 1506                                               Greene, Graham
## 1507                                            Balzac, Honoré de
## 1508                                               Greene, Graham
## 1509                                               Greene, Graham
## 1510                                               Greene, Graham
## 1511                                               Greene, Graham
## 1512                                               Greene, Graham
## 1513                                               Greene, Graham
## 1514                                               Greene, Graham
## 1515                                                   Greer, Ben
## 1516                                            De Felitta, Frank
## 1517                                                 Grubb, Davis
## 1518                                      Grove, Frederick Philip
## 1519                                      Grove, Frederick Philip
## 1520                                      Grove, Frederick Philip
## 1521                                       Groseclose, Elgin Earl
## 1522                                      Grove, Frederick Philip
## 1523                                               Daniėlʹ, I͡Uliĭ
## 1524                                                 Kocan, Peter
## 1525                                                Knowles, John
## 1526                                              Kluger, Richard
## 1527                                     Knapp, Bettina Liebowitz
## 1528                                             Knebel, Fletcher
## 1529                                                Knight, Damon
## 1530                                      Kornblatt, Joyce Reiser
## 1531                                                  Kolia, John
## 1532                                              Komroff, Manuel
## 1533                                                 Koning, Hans
## 1534                                               Koepf, Michael
## 1535                                                 Koster, R. M
## 1536                                             Kroetsch, Robert
## 1537                                             Kroetsch, Robert
## 1538                                               Kreisel, Henry
## 1539                                             Kroetsch, Robert
## 1540                                          Kotzwinkle, William
## 1541                                                   Krige, Uys
## 1542                                          Vargas Llosa, Mario
## 1543                                                 Langley, Eve
## 1544                                                Lanham, Peter
## 1545                                               Lawless, Emily
## 1546                                                  Lavin, Mary
## 1547                                                  Lavin, Mary
## 1548                                                  Lavin, Mary
## 1549                                                Laumer, Keith
## 1550                                                Laumer, Keith
## 1551                                           Laurence, Margaret
## 1552                                                Lawson, Henry
## 1553                                                Lawson, Henry
## 1554                                              Leitch, Maurice
## 1555                                               LePan, Douglas
## 1556                                            Le Queux, William
## 1557                                               Leslie, Warren
## 1558                                           Lessing, Doris May
## 1559                                           Leach, Christopher
## 1560                                                     Lea, Tom
## 1561                                     Le Fanu, Joseph Sheridan
## 1562                                                 Hawkes, John
## 1563                                                Piercy, Marge
## 1564                                             Fontane, Theodor
## 1565                                         Espinàs, Josep Maria
## 1566                                            Trollope, Anthony
## 1567                                               Gerrold, David
## 1568                                             Gordimer, Nadine
## 1569                                           Lessing, Doris May
## 1570                                                 Tert͡s, Abram
## 1571                                                  Nye, Robert
## 1572                                                  Nye, Robert
## 1573                                              Ellison, Harlan
## 1574                                                Gold, Herbert
## 1575                                                Pradhan, G. K
## 1576                                                     Raja Rao
## 1577                                               Hidāyat, Ṣādiq
## 1578                                                 Grade, Chaim
## 1579                                  Gogolʹ, Nikolaĭ Vasilʹevich
## 1580                                                 Grade, Chaim
## 1581                                                  Lavin, Mary
## 1582                                               Wharton, Edith
## 1583                                             Simatupang, Iwan
## 1584                                               Orwell, George
## 1585                                               Montague, John
## 1586                                                 Pym, Barbara
## 1587                                           Carr, John Dickson
## 1588                                               Lem, Stanisław
## 1589                                            Trollope, Anthony
## 1590                              Nabokov, Vladimir Vladimirovich
## 1591                                                Wilhelm, Gale
## 1592                                             Dunnett, Dorothy
## 1593                                                  Cary, Joyce
## 1594                                                Waltari, Mika
## 1595                                               Böll, Heinrich
## 1596                                                Spark, Muriel
## 1597                                                             
## 1598                                                    Traven, B
## 1599                                               Lubis, Mochtar
## 1600                                              Berto, Giuseppe
## 1601                                             MacCracken, Mary
## 1602                                                Martin, Wanda
## 1603                                    Turgenev, Ivan Sergeevich
## 1604                                           Havighurst, Walter
## 1605                                                Dixon, Thomas
## 1606                                                Keene, Donald
## 1607                                                     Mao, Tun
## 1608                                             Koestler, Arthur
## 1609                                               Sillitoe, Alan
## 1610                                               Conrad, Joseph
## 1611                                                 London, Jack
## 1612                                                Asimov, Isaac
## 1613                                                Carrier, Roch
## 1614                                            Freeling, Nicolas
## 1615                                                   Das, Manoj
## 1616                                               Vesaas, Tarjei
## 1617                                              Brecht, Bertolt
## 1618                                              Ārephina Bādala
## 1619                                          Kasymbekov, Tolegen
## 1620                                            Waterhouse, Keith
## 1621                                              O'Connor, Frank
## 1622                                                 Buchan, John
## 1623                                             Mosley, Nicholas
## 1624                                           Gombrowicz, Witold
## 1625                                                Engel, Marian
## 1626                                                             
## 1627                                               Ribnikar, Jara
## 1628                                           Rasputin, Valentin
## 1629                                                             
## 1630                                                    Alias Ali
## 1631                                             Tournier, Michel
## 1632                                              Brecht, Bertolt
## 1633                                                Wästberg, Per
## 1634                                      Schirach, Henriette von
## 1635                                               Dick, Philip K
## 1636                                        McPherson, James Alan
## 1637                                               Burrowes, John
## 1638                                     Chekhov, Anton Pavlovich
## 1639                                               Schwob, Marcel
## 1640                                               Stow, Randolph
## 1641                                                Endō, Shūsaku
## 1642                                                             
## 1643                                               Bielski, Nella
## 1644                                       Maheux-Forcier, Louise
## 1645                                               Walser, Robert
## 1646                                             Mitchison, Naomi
## 1647                                                Hanley, James
## 1648                                               Wharton, Edith
## 1649                                               Wharton, Edith
## 1650                                            Balzac, Honoré de
## 1651                                            Perrault, Charles
## 1652                                       Stowe, Harriet Beecher
## 1653                                                 Gugas, Chris
## 1654                                                Zhaozhou, Shi
## 1655                                                 Čapek, Karel
## 1656                                                 Verne, Jules
## 1657                                     Chekhov, Anton Pavlovich
## 1658                                               Barjavel, René
## 1659                                               McCarthy, Mary
## 1660                                              Steinbeck, John
## 1661                                              Fallaci, Oriana
## 1662                                  Zami͡atin, Evgeniĭ Ivanovich
## 1663                                          Onetti, Juan Carlos
## 1664                                              Buchard, Robert
## 1665                                                 Marsh, Ngaio
## 1666                                               Herbert, Frank
## 1667                                               Qian, Zhongshu
## 1668                                              Giovene, Andrea
## 1669                                            Schilliger, Josef
## 1670                                               Aidoo, Ama Ata
## 1671                                                         Rémy
## 1672                                               Zelazny, Roger
## 1673                                               Calvino, Italo
## 1674                                                Musil, Robert
## 1675                                             Plivier, Theodor
## 1676                                           Schnitzler, Arthur
## 1677                                           Allingham, Margery
## 1678                                                 DeLillo, Don
## 1679                                                     Stendhal
## 1680                                                  Wei, Wu Wei
## 1681                                                       Liu, E
## 1682                                                  Wolfe, Gene
## 1683                                                  Kim, Tongni
## 1684                                                   Premacanda
## 1685                                        Jhabvala, Ruth Prawer
## 1686                                               Lumpkin, Grace
## 1687                                              Bohannan, Laura
## 1688                                           Jewett, Sarah Orne
## 1689                                               Proust, Marcel
## 1690                                               Proust, Marcel
## 1691                                               White, Patrick
## 1692                                           Oates, Joyce Carol
## 1693                                                Djebar, Assia
## 1694                                                Sidhwa, Bapsi
## 1695                                                             
## 1696                              Kuncewiczowa, Maria Szczepańska
## 1697                                                             
## 1698                                              Cooper, William
## 1699                                           Kozhevnikov, Vadim
## 1700                                                  Dahl, Roald
## 1701                                            Kihlman, Christer
## 1702                                             Bowering, George
## 1703                                             Sembène, Ousmane
## 1704                                                Troyat, Henri
## 1705                                             Tammuz, Benjamin
## 1706                                               Aucamp, Hennie
## 1707                                                   Shaw, Joan
## 1708                                                             
## 1709                                                Lipatov, Vilʹ
## 1710                                                  Maran, René
## 1711                                             Sembène, Ousmane
## 1712                                             Modiano, Patrick
## 1713                                         Vasudevan Nair, M. T
## 1714                                           Raman Pillai, C. V
## 1715                                                  Weldon, Fay
## 1716                                                 James, Henry
## 1717                                           Tolstoy, Leo, graf
## 1718                                               Barfield, Owen
## 1719                                          Zoshchenko, Mikhail
## 1720                                               Lem, Stanisław
## 1721                                                             
## 1722                                                  Gide, André
## 1723                                               Pavese, Cesare
## 1724                                              Smith, Wilbur A
## 1725                                              Judson, William
## 1726                                                Shahar, David
## 1727                                                 Lofts, Norah
## 1728                                        Ó Súileabháin, Muiris
## 1729                                                Narayan, R. K
## 1730                                          Buechner, Frederick
## 1731                                             Himes, Chester B
## 1732                                                      Lu, Xun
## 1733                                                      Colette
## 1734                                                      Colette
## 1735                                                Narayan, R. K
## 1736                                         Robbe-Grillet, Alain
## 1737                                           Kazantzakis, Nikos
## 1738                                               Brennan, Maeve
## 1739                                                Grass, Günter
## 1740                                                Cheever, John
## 1741                                                   Premacanda
## 1742                                                 Mann, Thomas
## 1743                                               White, Patrick
## 1744                                Vladimov, Georgiĭ Nikolaevich
## 1745                                        Singer, Israel Joshua
## 1746                                              MacLennan, Hugh
## 1747                                              Macdonald, Ross
## 1748                                              Graham, Winston
## 1749                                                             
## 1750                                       Snyder, Zilpha Keatley
## 1751                                               Anderson, Poul
## 1752                                               Anderson, Poul
## 1753                                            Le Guin, Ursula K
## 1754                                                 West, Morris
## 1755                                                Maḥfūẓ, Najīb
## 1756                                                   Nin, Anaïs
## 1757                                              Southern, Terry
## 1758                                           Billington, Rachel
## 1759                                                Gorky, Maksim
## 1760                                            Drabble, Margaret
## 1761                                                  Vidal, Gore
## 1762                                          Eeden, Frederik van
## 1763                                                 Kafka, Franz
## 1764                                               Dalí, Salvador
## 1765                                              Kosinski, Jerzy
## 1766                                                   Nin, Anaïs
## 1767                                                   Nin, Anaïs
## 1768                                             Golding, William
## 1769                                              Vittorini, Elio
## 1770                                            Steele, William O
## 1771                                         Vigdorova, F (Frida)
## 1772                                Tomasi di Lampedusa, Giuseppe
## 1773                                                             
## 1774                                              Hrabal, Bohumil
## 1775                                           Tolstoy, Leo, graf
## 1776                                            Pirandello, Luigi
## 1777                                        De Sélincourt, Aubrey
## 1778                                                  Vidal, Gore
## 1779                                     Chekhov, Anton Pavlovich
## 1780                                               Williams, Eric
## 1781                                    Saint-Exupéry, Antoine de
## 1782                                                 Grade, Chaim
## 1783                                              Garrett, George
## 1784                                               Baldwin, James
## 1785                                                Musil, Robert
## 1786                                                Zhang, Ailing
## 1787                                               Herzl, Theodor
## 1788                                             Murphy, Walter F
## 1789                                               Huxley, Aldous
## 1790                                             Wambaugh, Joseph
## 1791                                              Natsume, Sōseki
## 1792                                           of Samosata Lucian
## 1793                                            Le Sueur, Meridel
## 1794                                              Natsume, Sōseki
## 1795                                             Cendrars, Blaise
## 1796                                                 Fowles, John
## 1797                                             Cendrars, Blaise
## 1798                                              Abrahams, Peter
## 1799                                                 Drake, David
## 1800                                            Ramos, Graciliano
## 1801                                              Fuentes, Carlos
## 1802                                          Voĭnovich, Vladimir
## 1803                                               Orwell, George
## 1804                                                             
## 1805                                             Dickens, Charles
## 1806                                                  Lin, Yutang
## 1807                                              Couperus, Louis
## 1808                                               Willard, Nancy
## 1809                            Eichendorff, Joseph, Freiherr von
## 1810                                            Dreiser, Theodore
## 1811                                          Williams, Tennessee
## 1812                                           Naipaul, Seepersad
## 1813                                              Leitch, Maurice
## 1814                                                Buzzati, Dino
## 1815                                            Le Guin, Ursula K
## 1816                                      FitzGibbon, Constantine
## 1817                                              Sholem Aleichem
## 1818                                                Joaquin, Nick
## 1819                                                     Voltaire
## 1820                                                O'Brien, Edna
## 1821                                                O'Brien, Edna
## 1822                                                O'Brien, Edna
## 1823                                     Chekhov, Anton Pavlovich
## 1824                                       Hofmannsthal, Hugo von
## 1825                                              Southey, Robert
## 1826                                          Yehoshua, Abraham B
## 1827                                                      Colette
## 1828                                                 Donoso, José
## 1829                                                  Lin, Yutang
## 1830                                               Greene, Graham
## 1831                                               Leonov, Leonid
## 1832                                                 Kafka, Franz
## 1833                                 Gerhardie, William Alexander
## 1834                                                Müller, Filip
## 1835                             Solzhenit͡syn, Aleksandr Isaevich
## 1836                                     Catullus, Gaius Valerius
## 1837                                             Murasaki Shikibu
## 1838                                                Theroux, Paul
## 1839                                                Merle, Robert
## 1840                                          Wideman, John Edgar
## 1841                                         Hawthorne, Nathaniel
## 1842                                         Hawthorne, Nathaniel
## 1843                                             Galsworthy, John
## 1844                                      García Márquez, Gabriel
## 1845                                             Settle, Mary Lee
## 1846                                            Richler, Mordecai
## 1847                                                 Kafka, Franz
## 1848                                               Niẓāmī Ganjavī
## 1849                                             Simatupang, Iwan
## 1850                                                 Yerby, Frank
## 1851                                                 Betts, Doris
## 1852                                                      Colette
## 1853                                           Lessing, Doris May
## 1854                                           Lessing, Doris May
## 1855                                           Lessing, Doris May
## 1856                                                Leven, Jeremy
## 1857                                                Lewis, Norman
## 1858                                                Lewis, Norman
## 1859                                                 Levin, Meyer
## 1860                                                Leverson, Ada
## 1861                                                Leverson, Ada
## 1862                                           Lund, Doris Herold
## 1863                                          Dostoyevsky, Fyodor
## 1864                                            Bulgakov, Mikhail
## 1865                                                   Sajer, Guy
## 1866                                          Boccaccio, Giovanni
## 1867                                             Gordon, Caroline
## 1868                                               Pavese, Cesare
## 1869                                              Graham, Winston
## 1870                                                      Lu, Xun
## 1871                                                Wilson, Sloan
## 1872                                               Vonnegut, Kurt
## 1873                                               Goulet, Robert
## 1874                                            Trollope, Anthony
## 1875                                                  Ilʹf, Ilʹi͡a
## 1876                                                Stuart, Jesse
## 1877                                                Stuart, Jesse
## 1878                                           Auchincloss, Louis
## 1879                                                 Donoso, José
## 1880                                                     Oz, Amos
## 1881                                          Highsmith, Patricia
## 1882                                             Moravia, Alberto
## 1883                                             Moravia, Alberto
## 1884                                                Kaniuk, Yoram
## 1885                           Zhelokhovt͡sev, Alekseĭ Nikolaevich
## 1886                                              Miłosz, Czesław
## 1887                                          Dostoyevsky, Fyodor
## 1888                                              Beckett, Samuel
## 1889                                            Hammett, Dashiell
## 1890                                                Lurie, Alison
## 1891                                            Dickson, Gordon R
## 1892                                             Settle, Mary Lee
## 1893                                                Wilhelm, Kate
## 1894                                                Garve, Andrew
## 1895                                                Hardy, Thomas
## 1896                                                Robison, Mary
## 1897                                                  Gide, André
## 1898                                                 Mann, Thomas
## 1899                                                McKay, Claude
## 1900                                  Gogolʹ, Nikolaĭ Vasilʹevich
## 1901                                                Wolfe, Thomas
## 1902                                       Bradley, Marion Zimmer
## 1903                                               Hidāyat, Ṣādiq
## 1904                                                Waugh, Evelyn
## 1905                                             Mrożek, Sławomir
## 1906                                           Gombrowicz, Witold
## 1907                                          Scott, Hugh Stowell
## 1908                                                Scott, Justin
## 1909                                                  Scott, Paul
## 1910                                                  Porter, Hal
## 1911                                           Powys, John Cowper
## 1912                                           Powys, John Cowper
## 1913                                           Powys, John Cowper
## 1914                                              Powell, Anthony
## 1915                                              Powell, Anthony
## 1916                                              Powell, Anthony
## 1917                                                 Powers, Anne
## 1918                                 Prichard, Katharine Susannah
## 1919                                 Prichard, Katharine Susannah
## 1920                                 Prichard, Katharine Susannah
## 1921                                 Prichard, Katharine Susannah
## 1922                                                Prebble, John
## 1923                                             Riley, Elizabeth
## 1924                                                    Quin, Ann
## 1925                                           Rabelais, François
## 1926                                            Raddall, Thomas H
## 1927                                          Radcliffe, Ann Ward
## 1928                                                Francis, Dick
## 1929                                           Richardson, Samuel
## 1930                                        Richards, David Adams
## 1931                                              Rhodes, Richard
## 1932                                                  Jones, Jack
## 1933                                Reve, Gerard Kornelis van het
## 1934                                            Richler, Mordecai
## 1935                                              Richter, Conrad
## 1936                                              Riordan, John J
## 1937                                                Roberts, John
## 1938                                             Wright, Rosalind
## 1939                                              Wright, Sarah E
## 1940                                               Ellin, Stanley
## 1941                                        Elliott, Sumner Locke
## 1942                                            Elliott, George P
## 1943                                            Elliott, George P
## 1944                                                Elliot, Ellen
## 1945                                               Elkin, Stanley
## 1946                                               Elkin, Stanley
## 1947                                                 Ferber, Edna
## 1948                                         Anantha Murthy, U. R
## 1949                                        Elliott, Sumner Locke
## 1950                                        Elliott, Sumner Locke
## 1951                                               Robertson, Don
## 1952                                             Rolfe, Frederick
## 1953                                                 Ross, Maggie
## 1954                                                Roper, Robert
## 1955                                               Rogers, Thomas
## 1956                                              Rossner, Judith
## 1957                                                Rovit, Earl H
## 1958                                              Roueché, Berton
## 1959                                            Rothberg, Abraham
## 1960                                               Roth, Arthur J
## 1961                                             Rukeyser, Muriel
## 1962                                              Rubens, Bernice
## 1963                                        Ruark, Robert Chester
## 1964                                                 Ruesch, Hans
## 1965                                                Ryan, Patrick
## 1966                                                 Russell, Ray
## 1967                                            Sahgal, Nayantara
## 1968                                              Schmitt, Gladys
## 1969                                             Schneck, Stephen
## 1970                                       Schoonover, Lawrence L
## 1971                                                Norman, James
## 1972                                                 Saxton, Mark
## 1973                                                  Sarton, May
## 1974                                                 Russ, Martin
## 1975                                                 Russ, Martin
## 1976                                       Santmyer, Helen Hooven
## 1977                                             Saroyan, William
## 1978                                              Sansom, William
## 1979                                                 Sandoz, Mari
## 1980                                                 Sandoz, Mari
## 1981                                             Bodelsen, Anders
## 1982                                                        Homer
## 1983                                                Gardner, John
## 1984                                           Lessing, Doris May
## 1985                                      Céline, Louis-Ferdinand
## 1986                                                Bradbury, Ray
## 1987                                             Sandemose, Aksel
## 1988                                               Lem, Stanisław
## 1989                                               Böll, Heinrich
## 1990                                            Williams, Charles
## 1991                                        Segal, Lore Groszmann
## 1992                                           Strindberg, August
## 1993                                              Tevis, Walter S
## 1994                                             Melville, Herman
## 1995                                           Kawabata, Yasunari
## 1996                                              Rowlands, Peter
## 1997                                   Caṭṭopādhyāya, Śaratcandra
## 1998                                           Tolstoy, Leo, graf
## 1999                                             Findley, Timothy
## 2000                                             Findley, Timothy
## 2001                                             Findley, Timothy
## 2002                                            Fiedler, Leslie A
## 2003                                            Fiedler, Leslie A
## 2004                                         Fitzgerald, Penelope
## 2005                                      FitzGibbon, Constantine
## 2006                                               Flanner, Janet
## 2007                                            Faulkner, William
## 2008                                            Faulkner, William
## 2009                                        Fermor, Patrick Leigh
## 2010                                               Ferrier, Susan
## 2011                                                 Fast, Howard
## 2012                                            Faulkner, William
## 2013                                            Faulkner, William
## 2014                                            Faulkner, William
## 2015                                            Faulkner, William
## 2016                                                 Faust, Irvin
## 2017                                             Ellsberg, Edward
## 2018                                                  Ellson, Hal
## 2019                                             Elman, Richard M
## 2020                                              Ellison, Harlan
## 2021                                             Elman, Richard M
## 2022                                                  Emery, John
## 2023                                                Engel, Marian
## 2024                                           Enright, Elizabeth
## 2025                                              Khushwant Singh
## 2026                                                Wolf, Christa
## 2027                                                Bradbury, Ray
## 2028                                                 Jones, James
## 2029                                   Asbjørnsen, Peter Christen
## 2030                                                 Munro, Alice
## 2031                                               Böll, Heinrich
## 2032                                              MacInnes, Helen
## 2033                                               Sillitoe, Alan
## 2034                                           Whitney, Phyllis A
## 2035                                             Mérimée, Prosper
## 2036                                               Böll, Heinrich
## 2037                                                 Sjöwall, Maj
## 2038                                            Hammett, Dashiell
## 2039                                              Zuckmayer, Carl
## 2040                                             Bernhard, Thomas
## 2041                                              Marshall, Sybil
## 2042                                               Undset, Sigrid
## 2043                                                 Wolkers, Jan
## 2044                                     Johnson, Pamela Hansford
## 2045                                             Mitchell, Julian
## 2046                                                 Wolkers, Jan
## 2047                                                Renault, Mary
## 2048                                                 James, Henry
## 2049                                       Steiner, Jean François
## 2050                                            Valenzuela, Luisa
## 2051                                                Gorky, Maksim
## 2052                                                Gorky, Maksim
## 2053                                                Gorky, Maksim
## 2054                                     Chekhov, Anton Pavlovich
## 2055                                     Chekhov, Anton Pavlovich
## 2056                                     Chekhov, Anton Pavlovich
## 2057                                                        Homer
## 2058                                     Chekhov, Anton Pavlovich
## 2059                                    Turgenev, Ivan Sergeevich
## 2060                                    Turgenev, Ivan Sergeevich
## 2061                                           of Samosata Lucian
## 2062                                                 Sava, George
## 2063                                               Alain-Fournier
## 2064                                           Richardson, Samuel
## 2065                                               Renvoizé, Jean
## 2066                                                Narayan, R. K
## 2067                                             Himes, Chester B
## 2068                                                  Ogot, Grace
## 2069                                                Camus, Albert
## 2070 La Fayette, (Marie-Madeleine Pioche de La Vergne), Madame de
## 2071                                                     Oz, Amos
## 2072                                           Richardson, Mary R
## 2073                                          Cullinan, Elizabeth
## 2074                                               Sheed, Wilfrid
## 2075                                              Lewis, Arthur H
## 2076                                              Haldeman, Joe W
## 2077                                              Brecht, Bertolt
## 2078                                             Ford, Ford Madox
## 2079                                             Ford, Ford Madox
## 2080                                              Footman, Robert
## 2081                                                Flynn, Robert
## 2082                                               Fleming, Peter
## 2083                                               Fleming, Berry
## 2084                                              Fleetwood, Hugh
## 2085                                              Fleetwood, Hugh
## 2086                                                 Fox, Charles
## 2087                                                 Frame, Janet
## 2088                                                 Frame, Janet
## 2089                                                 Frame, Janet
## 2090                                            Forster, Margaret
## 2091                                           Forsyth, Frederick
## 2092                                             Fowler, Robert H
## 2093                                               Fuller, Edmund
## 2094                                               Fugard, Sheila
## 2095                                               Fumento, Rocco
## 2096                                               Gallahue, John
## 2097                                                Gardner, John
## 2098                                             Galsworthy, John
## 2099                                                Gardner, John
## 2100                                                Gardner, John
## 2101                                                 Gale, John M
## 2102                                                Furman, Laura
## 2103                                                   Frank, Pat
## 2104                                           Frank, Waldo David
## 2105                                              Frankau, Pamela
## 2106                                              Frankau, Pamela
## 2107                                               Fraser, Sylvia
## 2108                                                 Freddi, Cris
## 2109                                             Frederic, Harold
## 2110                                            Freeling, Nicolas
## 2111                                          Friedman, Bruce Jay
## 2112                                          Friedman, Bruce Jay
## 2113                                              Freuchen, Peter
## 2114                                                 Gordon, Noah
## 2115                                                Gordon, Giles
## 2116                                             Gordon, Caroline
## 2117                                                   Gores, Joe
## 2118                                                Goran, Lester
## 2119                                             Gordimer, Nadine
## 2120                                             Gordimer, Nadine
## 2121                                         Goodman, George J. W
## 2122                                                Goodin, Peggy
## 2123                                            Taylor, Elizabeth
## 2124                                               Garnett, David
## 2125                                            Garrett, George P
## 2126                                            Gascoigne, Bamber
## 2127                                            Gascoigne, Bamber
## 2128                                               Garnett, David
## 2129                                                 Garner, Hugh
## 2130                                                 Garner, Hugh
## 2131                                                 Garner, Hugh
## 2132                                               Hesse, Hermann
## 2133                                               Mishima, Yukio
## 2134                                               Hesse, Hermann
## 2135                                                Theroux, Paul
## 2136                                                 James, Henry
## 2137                                            Hughes, Richard E
## 2138                                                Theroux, Paul
## 2139                                               De Hartog, Jan
## 2140                                                Helprin, Mark
## 2141                                                Waugh, Evelyn
## 2142                                    Turgenev, Ivan Sergeevich
## 2143                                                Krymov, I͡Uriĭ
## 2144                                        Loomis, Roger Sherman
## 2145                                     Stanislavsky, Konstantin
## 2146                                             Mrożek, Sławomir
## 2147                              Nabokov, Vladimir Vladimirovich
## 2148                                 Pasternak, Boris Leonidovich
## 2149                                                    Abe, Kōbō
## 2150                                           Tolstoy, Leo, graf
## 2151                                                Leiber, Fritz
## 2152                                               Kuttner, Henry
## 2153                                               Lem, Stanisław
## 2154                                           Gombrowicz, Witold
## 2155                                               Donchev, Anton
## 2156                                Pushkin, Aleksandr Sergeevich
## 2157                               Goncharov, Ivan Aleksandrovich
## 2158                    Pisemskiĭ, A. F. (Alekseĭ Feofilaktovich)
## 2159                                              Hašek, Jaroslav
## 2160                                               Lustig, Arnošt
## 2161                                                  Klíma, Ivan
## 2162                                                 Hersey, John
## 2163                              Strugat͡skiĭ, Arkadiĭ Natanovich
## 2164                                                             
## 2165                                          Voĭnovich, Vladimir
## 2166                                                             
## 2167                             Solzhenit͡syn, Aleksandr Isaevich
## 2168                                            Gaskin, Catherine
## 2169                                               Gedge, Pauline
## 2170                                               Gemant, Andrew
## 2171                                 Gerhardie, William Alexander
## 2172                                 Gerhardie, William Alexander
## 2173                                              Ghose, Zulfikar
## 2174                                                 Gibbs, Henry
## 2175                                              Glass, Joanna M
## 2176                                                Godfrey, Dave
## 2177                                                Godden, Rumer
## 2178                                                Gold, Herbert
## 2179                                                Gold, Douglas
## 2180                                             Golding, William
## 2181                                               Goldman, James
## 2182                                               Gibson, Graeme
## 2183                                               Gilbert, Edwin
## 2184                                               Gillion, Diana
## 2185                                             Glanville, Brian
## 2186                                             Glanville, Brian
## 2187                                             Glanville, Brian
## 2188                                             Glanville, Brian
## 2189                                                    Gill, H S
## 2190                                                Gill, Brendan
## 2191                                             Gotlieb, Phyllis
## 2192                       Jenner, W. J. F (William John Francis)
## 2193                                                 Ye, Shengtao
## 2194                                                      Ba, Jin
## 2195                                             Drechsler, Horst
## 2196                   Villiers de L'Isle-Adam, Auguste, comte de
## 2197                                            Radiguet, Raymond
## 2198                                                 Svevo, Italo
## 2199                                               Anderson, Poul
## 2200                                               Anderson, Poul
## 2201                                               Anderson, Poul
## 2202                                                 Donoso, José
## 2203                                                 Briley, John
## 2204                                               Andrews, Kevin
## 2205                                             Himes, Chester B
## 2206                                          Cullinan, Elizabeth
## 2207                                                  Twain, Mark
## 2208                                    Gilman, Charlotte Perkins
## 2209                                                 Mann, Thomas
## 2210                                                        Homer
## 2211                                              Verga, Giovanni
## 2212                                                Camus, Albert
## 2213                                                  Zola, Émile
## 2214                                               Mishima, Yukio
## 2215                                          Lestienne, Voldemar
## 2216                                                Jansson, Tove
## 2217                                         Laclos, Choderlos de
## 2218                                                Scher, Helene
## 2219                                      Olesha, I͡Uriĭ Karlovich
## 2220                                          Byars, Betsy Cromer
## 2221                                              Azuela, Mariano
## 2222                                             Iskander, Fazilʹ
## 2223                                            Fielding, Gabriel
## 2224                                              Steinbeck, John
## 2225                                          Benchley, Nathaniel
## 2226                                                   Uris, Leon
## 2227                                               Mishima, Yukio
## 2228                                                Leiber, Fritz
## 2229                                 Lermontov, Mikhail I͡Urʹevich
## 2230                                          Beauvoir, Simone de
## 2231                                                Kane, Hamidou
## 2232                                              Ruyslinck, Ward
## 2233                                                 James, Henry
## 2234                                            Carpentier, Alejo
## 2235                                              Trippett, Frank
## 2236                                                Renault, Mary
## 2237                                           Brautigan, Richard
## 2238                                               Jameson, Storm
## 2239                                                 Crews, Harry
## 2240                                                 Ambler, Eric
## 2241                                              Trevor, William
## 2242                                                      Colette
## 2243                                                             
## 2244                                                 Taylor, Anna
## 2245                                               Wheelis, Allen
## 2246                                           Tolstoy, Leo, graf
## 2247                                              O'Connor, Frank
## 2248                                            Sadoveanu, Mihail
## 2249                                  Bīghamī, Muḥammad ibn Aḥmad
## 2250                                            Anderson, Patrick
## 2251                                                      Lu, Xun
## 2252                                            Keller, Gottfried
## 2253                                               Johnson, Diane
## 2254                                        Yourcenar, Marguerite
## 2255                                            Sadoveanu, Mihail
## 2256                                              Lagerkvist, Pär
## 2257                                                 Austen, Jane
## 2258                                              Lenz, Siegfried
## 2259                                       Aldrich, Bess Streeter
## 2260                                               Hall, Oakley M
## 2261                                                       Haoran
## 2262                                              Rogers, Michael
## 2263                                               Mailer, Norman
## 2264                                                 James, Henry
## 2265                                                 James, Henry
## 2266                                              Trevor, William
## 2267                                              Trevor, William
## 2268                                               Druon, Maurice
## 2269                                                 Drury, Allen
## 2270                               Barbey d'Aurevilly, J. (Jules)
## 2271                                                 Buchan, John
## 2272                              Pardo Bazán, Emilia, condesa de
## 2273                                            Carpentier, Alejo
## 2274                                                   Habe, Hans
## 2275                                             Moravia, Alberto
## 2276                                             Moravia, Alberto
## 2277                                     Śivaśaṅkarapiḷḷa, Takal̲i
## 2278                                                 Wiesel, Elie
## 2279                                              Lagerkvist, Pär
## 2280                                              Lagerkvist, Pär
## 2281                         Uspenskiĭ, P. D. (Petr Demʹi͡anovich)
## 2282                                              Emecheta, Buchi
## 2283                                             Ekwensi, Cyprian
## 2284                                        Quevedo, Francisco de
## 2285                                             Bernstein, Hilda
## 2286                                                Brunner, John
## 2287                                            Trollope, Anthony
## 2288                                               Upward, Edward
## 2289                                              Manning, Olivia
## 2290                                              Manning, Olivia
## 2291                                            Yokomitsu, Riichi
## 2292                                             Queffélec, Henri
## 2293                                       Apollinaire, Guillaume
## 2294                                          Beauvoir, Simone de
## 2295                                                             
## 2296                                                 London, Jack
## 2297                                         Pérez Galdós, Benito
## 2298                                              Danish, Siavush
## 2299                                                             
## 2300                                                 Fast, Howard
## 2301                                                             
## 2302                                                 Bellow, Saul
## 2303                                                   Nin, Anaïs
## 2304                                               Matthews, Jack
## 2305                                       Asturias, Miguel Angel
## 2306                                                Williams, Joy
## 2307                                                Rogers, Garet
## 2308                                            Mauriac, François
## 2309                                            Mauriac, François
## 2310                                           Maupassant, Guy de
## 2311                                            Gheorghiu, Virgil
## 2312                                               Romains, Jules
## 2313                                           Sarraute, Nathalie
## 2314                                              Ionesco, Eugène
## 2315                                              Bergman, Ingmar
## 2316                                              Malaquais, Jean
## 2317                                               Réage, Pauline
## 2318                                                 Amado, Jorge
## 2319                                        Jhabvala, Ruth Prawer
## 2320                                               Anderson, Poul
## 2321                                                 Hugo, Victor
## 2322                                                   Rabie, Jan
## 2323                                                     Lao, She
## 2324                                               Wang, Chi-chên
## 2325                                               Wang, Chi-chên
## 2326                                                    Xiao, Jun
## 2327                              Branner, H. C. (Hans Christian)
## 2328                                                  Frank, Anne
## 2329                                            Duras, Marguerite
## 2330                                                 Wiesel, Elie
## 2331                                               Moreau, Marcel
## 2332                                          Boccaccio, Giovanni
## 2333                                          Boccaccio, Giovanni
## 2334                                             Simenon, Georges
## 2335                                             Simenon, Georges
## 2336                                             Simenon, Georges
## 2337                                             Ouologuem, Yambo
## 2338                                               Chatwin, Bruce
## 2339                                              Brecht, Bertolt
## 2340                                                 Verne, Jules
## 2341                                                Renault, Mary
## 2342                                                Narayan, R. K
## 2343                                           Deśapāṇḍe, Nirmalā
## 2344                                             Wambaugh, Joseph
## 2345                                            De Morgan, Mary A
## 2346                                             Elman, Richard M
## 2347                                           Söderberg, Hjalmar
## 2348                                               Kazakov, I͡Uriĭ
## 2349                                           De la Mare, Walter
## 2350                                                        Homer
## 2351                                                  Gide, André
## 2352                                             Walker, Margaret
## 2353                                               Roy, Gabrielle
## 2354                                               Clay, George R
## 2355                                                 DeLillo, Don
## 2356                                             Tremblay, Michel
## 2357                                                  Gide, André
## 2358                                               Nagibin, I͡Uriĭ
## 2359                                               Malraux, André
## 2360                                           Sarraute, Nathalie
## 2361                                                 DeLillo, Don
## 2362                                              Bergman, Ingmar
## 2363                                                 Čapek, Karel
## 2364                                               Böll, Heinrich
## 2365                                          Dunne, John Gregory
## 2366                             Solzhenit͡syn, Aleksandr Isaevich
## 2367                                      Meyer, Conrad Ferdinand
## 2368                                         Pérez Galdós, Benito
## 2369                                            Davies, Robertson
## 2370                                                     Zhi, Xia
## 2371                                                 James, Henry
## 2372                                 Pasternak, Boris Leonidovich
## 2373                                              Amichai, Yehuda
## 2374                            Freiherr von, Eichendorff, Joseph
## 2375                                                 Wiesel, Elie
## 2376                                            Radiguet, Raymond
## 2377                                          Zoshchenko, Mikhail
## 2378                                  Gogolʹ, Nikolaĭ Vasilʹevich
## 2379                                           Auchincloss, Louis
## 2380                                          Dunkin, Paul Shaner
## 2381                                           Meriwether, Louise
## 2382                                             Sembène, Ousmane
## 2383                                           Unamuno, Miguel de
## 2384                                               Vonnegut, Kurt
## 2385                                           Lispector, Clarice
## 2386                                           Lispector, Clarice
## 2387                                      Maturin, Charles Robert
## 2388                                           Borchert, Wolfgang
## 2389                                                  Shaw, Irwin
## 2390                             Solzhenit͡syn, Aleksandr Isaevich
## 2391                                              Kristensen, Tom
## 2392                                             Saroyan, William
## 2393                                                 Minco, Marga
## 2394                                  Tvardovskiĭ, A. (Aleksandr)
## 2395                                       Panova, Vera Fedorovna
## 2396                                            Holland, Isabelle
## 2397                                            Denham, Elizabeth
## 2398                                             marquis de, Sade
## 2399                                          Castellaneta, Carlo
## 2400                                                  Gide, André
## 2401                                                 Asch, Sholem
## 2402                             Solzhenit͡syn, Aleksandr Isaevich
## 2403                                     Chekhov, Anton Pavlovich
## 2404                                              Ellison, Harlan
## 2405                                   Cohen, J. M (John Michael)
## 2406                                                  Agee, James
## 2407                                                  Rulfo, Juan
## 2408                                     Śivaśaṅkarapiḷḷa, Takal̲i
## 2409                                           Poṯṯekkāṭṭ, Es. Ke
## 2410                                             Queneau, Raymond
## 2411                                         Vasudevan Nair, M. T
## 2412                                              Giraudoux, Jean
## 2413                                                Wylie, Philip
## 2414                                                  Dayan, Yaël
## 2415                                               Anderson, Jack
## 2416                                              Anand, Mulk Raj
## 2417                                              Disch, Thomas M
## 2418                                     Śivaśaṅkarapiḷḷa, Takal̲i
## 2419                                              Rādhākr̥ṣṇan, Si
## 2420                                     Śivaśaṅkarapiḷḷa, Takal̲i
## 2421                                          Kunnukuttan, Matamp
## 2422                                              Leduc, Violette
## 2423                                           Kazantzakis, Nikos
## 2424                                          Beauvoir, Simone de
## 2425                                            Keller, Gottfried
## 2426                                                 Sjöwall, Maj
## 2427                                                 Sjöwall, Maj
## 2428                                                             
## 2429                                         Robbe-Grillet, Alain
## 2430                                               Hesse, Hermann
## 2431                                          Manzoni, Alessandro
## 2432                                              Lagerkvist, Pär
## 2433                                              Lagerkvist, Pär
## 2434                                          Gilio, María Esther
## 2435                                          Manzoni, Alessandro
## 2436                                            Reuter, Christian
## 2437                                               Hesse, Hermann
## 2438                                          Yehoshua, Abraham B
## 2439                                             Sagan, Françoise
## 2440                                          Yehoshua, Abraham B
## 2441                                          Dostoyevsky, Fyodor
## 2442                                             Maxwell, William
## 2443                                                 Verne, Jules
## 2444                                          Dostoyevsky, Fyodor
## 2445                                      Bunin, Ivan Alekseevich
## 2446                                            Keller, Gottfried
## 2447                                             Leblanc, Maurice
## 2448                                              De Vries, Peter
## 2449                                               Algren, Nelson
## 2450                                           Strindberg, August
## 2451                                           Kawabata, Yasunari
## 2452                                              Aichinger, Ilse
## 2453                                         Robbe-Grillet, Alain
## 2454                                              Powell, Anthony
## 2455                                              Bauer, Wolfgang
## 2456                                              Lenz, Siegfried
## 2457                                                 Verne, Jules
## 2458                                                 Verne, Jules
## 2459                                                   Wain, John
## 2460                                               Haining, Peter
## 2461                                               Morris, Wright
## 2462                                             Hughes, Langston
## 2463                                     Chekhov, Anton Pavlovich
## 2464                                           Sutcliff, Rosemary
## 2465                                            Ngũgĩ wa Thiongʼo
## 2466                                              Beckett, Samuel
## 2467                   Hoffmann, E. T. A. (Ernst Theodor Amadeus)
## 2468                                               Morris, Wright
## 2469                                            Christopher, John
## 2470                                             Moravia, Alberto
## 2471                                                    Abe, Kōbō
## 2472                                                             
## 2473                                               De Hartog, Jan
## 2474                                               Hall, Oakley M
## 2475                                              Moberg, Vilhelm
## 2476                                            Pirandello, Luigi
## 2477                                          Andrzejewski, Jerzy
## 2478                                             Tammuz, Benjamin
## 2479                                               Feng, Menglong
## 2480                                            Pirandello, Luigi
## 2481                                    von Strassburg, Gottfried
## 2482                                              Moberg, Vilhelm
## 2483                                              Ionesco, Eugène
## 2484                         Almqvist, C. J. L. (Carl Jonas Love)
## 2485                                              Powell, Anthony
## 2486                                            Dreiser, Theodore
## 2487                                                Waltari, Mika
## 2488                                                Waltari, Mika
## 2489                                           Tolstoy, Leo, graf
## 2490                                                Hłasko, Marek
## 2491                                                Hłasko, Marek
## 2492                                               Cooper, Edmund
## 2493                                    Beresford-Howe, Constance
## 2494                                              Hall, Radclyffe
## 2495                                                             
## 2496                                             O'Brian, Patrick
## 2497                                              Powell, Anthony
## 2498                                           Curry, Jane Louise
## 2499                                               Böll, Heinrich
## 2500                                              Queirós, Eça de
## 2501                                            Moorcock, Michael
## 2502                                  Tchernowitz-Avidar, Yemimah
## 2503                                                Neagoe, Peter
## 2504                                                  Twain, Mark
## 2505                                               Bjarnhof, Karl
## 2506                                              Disch, Thomas M
## 2507                                               Böll, Heinrich
## 2508                                                Vinge, Joan D
## 2509                                             Fontane, Theodor
## 2510                                               Mulisch, Harry
## 2511                                               Megged, Aharon
## 2512                                           Maupassant, Guy de
## 2513                                             Fontane, Theodor
## 2514                                               Calvino, Italo
## 2515                                                Webb, Frank J
## 2516                                            Flaubert, Gustave
## 2517                                          Dostoyevsky, Fyodor
## 2518                                                Blaise, Clark
## 2519                                                             
## 2520                                              Moberg, Vilhelm
## 2521                                                 Verne, Jules
## 2522                                                             
## 2523                                              Natsume, Sōseki
## 2524                                               Bradley, David
## 2525                                               Calvino, Italo
## 2526                                                             
## 2527                                      Olesha, I͡Uriĭ Karlovich
## 2528                                                 Pym, Barbara
## 2529                                             Simenon, Georges
## 2530                                             Simenon, Georges
## 2531                                             Simenon, Georges
## 2532                                             Simenon, Georges
## 2533                                             Simenon, Georges
## 2534                                               Sperber, Manès
## 2535                                             Fontane, Theodor
## 2536                                               Hesse, Hermann
## 2537                                                Deighton, Len
## 2538                                               Bradley, David
## 2539                                             Shimazaki, Tōson
## 2540                                                Musil, Robert
## 2541                                                 Joyce, James
## 2542                                   Caṭṭopādhyāya, Śaratcandra
## 2543                                   Caṭṭopādhyāya, Śaratcandra
## 2544                                        Vieira, José Luandino
## 2545                                               Clavell, James
## 2546                                         Brown, William Wells
## 2547                                                 Kafka, Franz
## 2548                                            Grau, Shirley Ann
## 2549                                                 Myrer, Anton
## 2550                                               Morris, Wright
## 2551                                               Sperber, Manès
## 2552                                               Sperber, Manès
## 2553                                    Turgenev, Ivan Sergeevich
## 2554                                                             
## 2555                                            Mauriac, François
## 2556                                                  Engle, Paul
## 2557                                               White, Patrick
## 2558                                               Döblin, Alfred
## 2559                                             Delany, Samuel R
## 2560                                           Kawabata, Yasunari
## 2561                                           Sutcliff, Rosemary
## 2562                                                Miller, Henry
## 2563                                               Malraux, André
## 2564                                                 Kafka, Franz
## 2565                                  Gaskell, Elizabeth Cleghorn
## 2566                                             Gellhorn, Martha
## 2567                                 Witkiewicz, Stanisław Ignacy
## 2568                                     Chekhov, Anton Pavlovich
## 2569                                                 James, Henry
## 2570                                            Hamilton, Charles
## 2571                                              Williams, Allan
## 2572                                       Gulik, Robert Hans van
## 2573                                             Mikszáth, Kálmán
## 2574                                                  Beti, Mongo
## 2575                                       Bradley, Marion Zimmer
## 2576                                        Hansen, Martin Alfred
## 2577                                        Hansen, Martin Alfred
## 2578                                         Akutagawa, Ryūnosuke
## 2579                                             Dovlatov, Sergeĭ
## 2580                                             Simenon, Georges
## 2581                                                Tayama, Katai
## 2582                                          Muggeridge, Malcolm
## 2583                           Campbell, C. G. (Charles Grimshaw)
## 2584                                               Dermoût, Maria
## 2585                                                  Andrić, Ivo
## 2586                                            Hammett, Dashiell
## 2587                                              Beckett, Samuel
## 2588                                       Gulik, Robert Hans van
## 2589                                             Dumas, Alexandre
## 2590                                     Chekhov, Anton Pavlovich
## 2591                                     Chekhov, Anton Pavlovich
## 2592                                            Becker, Stephen D
## 2593                                              Silone, Ignazio
## 2594                                                Amrita Pritam
## 2595                                     Chekhov, Anton Pavlovich
## 2596                                              Natsume, Sōseki
## 2597                                         Robbe-Grillet, Alain
## 2598                                           Kawabata, Yasunari
## 2599                                     Śivaśaṅkarapiḷḷa, Takal̲i
## 2600                                        Hansen, Martin Alfred
## 2601                                             Lancaster, Bruce
## 2602                                         Eddison, Eric Rucker
## 2603                                             Gustafsson, Lars
## 2604                                          Andrzejewski, Jerzy
## 2605                                          Andrzejewski, Jerzy
## 2606                                          Farmer, Philip José
## 2607                                              Wright, Stephen
## 2608                                                 Hannson, Per
## 2609                                               Tucker, Wilson
## 2610                                             Holland, Cecelia
## 2611                                               Coover, Robert
## 2612                                      Stevenson, Robert Louis
## 2613                                         Tagore, Rabindranath
## 2614                                               Ozick, Cynthia
## 2615                                  Stefanyk, Vasylʹ Semenovych
## 2616                                                             
## 2617                                           Myrivēlēs, Stratēs
## 2618                                             Sukenick, Ronald
## 2619                                            Petronius Arbiter
## 2620                                 Shukshin, Vasiliĭ Makarovich
## 2621                                             Iskander, Fazilʹ
## 2622                                               Bebey, Francis
## 2623                                               Malraux, André
## 2624                                             Valgardson, W. D
## 2625                                           Kazantzakis, Nikos
## 2626                                             Wambaugh, Joseph
## 2627                                                  Vidal, Gore
## 2628                                          Dostoyevsky, Fyodor
## 2629                                                  Lin, Yutang
## 2630                                                 Amado, Jorge
## 2631                                         Tanizaki, Junʾichirō
## 2632                                       Bradley, Marion Zimmer
## 2633                                                Bradbury, Ray
## 2634                                             Simenon, Georges
## 2635                                                    Abe, Kōbō
## 2636                                        Simmel, Johnnes Mario
## 2637                                              Lagerkvist, Pär
## 2638                                              Tedlock, Dennis
## 2639                                       Kaverin, V. (Veniamin)
## 2640                                              Beckett, Samuel
## 2641                                              Miłosz, Czesław
## 2642                                            Bataille, Georges
## 2643                                               Abramov, Fedor
## 2644                                                  Beti, Mongo
## 2645                                       Sillanpää, Frans Eemil
## 2646                                                 Malsook, Han
## 2647                                          Ishak Haji Muhammad
## 2648                                                Wilson, Sloan
## 2649                                                 Boland, John
## 2650                                                  Porter, Hal
## 2651                                  Longfellow, Henry Wadsworth
## 2652                                             Totovents, Vahan
## 2653                                               Banks, Russell
## 2654                                                 Wouk, Herman
## 2655                                                Brunner, John
## 2656                                             Sabatier, Robert
## 2657                                              Hefley, James C
## 2658                                          Agnon, Shmuel Yosef
## 2659                                  Zayas y Sotomayor, María de
## 2660                                            Mackiewicz, Józef
## 2661                                          Yehoshua, Abraham B
## 2662                                              Vittorini, Elio
## 2663                                               Kaikō, Takeshi
## 2664                                                Ōe, Kenzaburō
## 2665                                             Simenon, Georges
## 2666                                              Isaacs, Bernard
## 2667                                                             
## 2668                                            Ramos, Graciliano
## 2669                                      Sturgis, Howard Overing
## 2670                                           Kazantzakis, Nikos
## 2671                                                 Kattan, Naïm
## 2672                                                  Zola, Émile
## 2673                                              Lagerkvist, Pär
## 2674                          Kuzmin, M. A. (Mikhail Alekseevich)
## 2675                                               Kaikō, Takeshi
## 2676                                                 Aymé, Marcel
## 2677                                                Maḥfūẓ, Najīb
## 2678                                                             
## 2679                                      Lattany, Kristin Hunter
## 2680                                               Fridegård, Jan
## 2681                                               Conrad, Joseph
## 2682                                              Lewis, Sinclair
## 2683                                               Mamleev, I͡Uriĭ
## 2684                                                Norton, Andre
## 2685                                             Melville, Herman
## 2686                                                 Verne, Jules
## 2687                             Walter, Otto F. (Otto Friedrich)
## 2688                                             Dunnett, Dorothy
## 2689                                            Callaghan, Morley
## 2690                                            Callaghan, Morley
## 2691                                                Vinge, Joan D
## 2692                                                   Noli, Jean
## 2693                                                 Tuohy, Frank
## 2694                                                Leiber, Fritz
## 2695                                              Vaculík, Ludvík
## 2696                                                      Colette
## 2697                                           Tolstoy, Leo, graf
## 2698                                                  Vance, Jack
## 2699                                            Cadell, Elizabeth
## 2700                                                      Ba, Jin
## 2701                                                  Cohen, Matt
## 2702                                                  Cohen, Matt
## 2703                                                Shahnon Ahmad
## 2704                                          Zoshchenko, Mikhail
## 2705                                             Busch, Frederick
## 2706                                                Wilhelm, Kate
## 2707                                                             
## 2708                                                  Zola, Émile
## 2709                                                   Fox, Paula
## 2710                                             Simenon, Georges
## 2711                                             Simenon, Georges
## 2712                                             Simenon, Georges
## 2713                                             Simenon, Georges
## 2714                                                  Joly, Cyril
## 2715                                            Ngũgĩ wa Thiongʼo
## 2716                                           Ross, Nancy Wilson
## 2717                                                 Tuohy, Frank
## 2718                                                Waltari, Mika
## 2719                                                 Roth, Joseph
## 2720                                             Bernhard, Thomas
## 2721                                                 Chaver-Paver
## 2722                                       Mendele Mokher Sefarim
## 2723                                             Tournier, Michel
## 2724                                             Simenon, Georges
## 2725                                               Haining, Peter
## 2726                                             Thirkell, Angela
## 2727                                             Thirkell, Angela
## 2728                          Tolstoy, Aleksey Nikolayevich, graf
## 2729                                                 Daniels, Guy
## 2730                                             Sagan, Françoise
## 2731                                              McInerny, Ralph
## 2732                                                  Gide, André
## 2733                                               Doctorow, E. L
## 2734                                     Hermans, Willem Frederik
## 2735                                                  Gide, André
## 2736                                              Ferron, Jacques
## 2737                                                  Carr, Terry
## 2738                                            McIntyre, Vonda N
## 2739                                                 Caron, Louis
## 2740                                                 Speed, Carol
## 2741                                               Herbert, Frank
## 2742                                            Meckel, Christoph
## 2743                                                 Keane, Molly
## 2744                                           Tallent, Elizabeth
## 2745                                              Argueta, Manlio
## 2746                                               Proust, Marcel
## 2747                             Solzhenit͡syn, Aleksandr Isaevich
## 2748                                                 Nâzım Hikmet
## 2749                                            Westheimer, David
## 2750                                                             
## 2751                                                Amrita Pritam
## 2752                                            Deshpande, Shashi
## 2753                                             Queneau, Raymond
## 2754                                             Martone, Michael
## 2755                                                Bradbury, Ray
## 2756                                                             
## 2757                                              Bennett, Arnold
## 2758                                                 Bell, Adrian
## 2759                                            Davies, Robertson
## 2760                                            Martorell, Joanot
## 2761                                              Manning, Olivia
## 2762                                                Collier, John
## 2763                                                 James, Henry
## 2764                                            Trollope, Anthony
## 2765                                       Singer, Isaac Bashevis
## 2766                                                Stone, Robert
## 2767                                              Sholem Aleichem
## 2768                                               Abramov, Fedor
## 2769                                                  Baroja, Pío
## 2770                                                      Ba, Jin
## 2771                                              Wolfson, Murray
## 2772                                            Lehmann, Rosamond
## 2773                                             Moravia, Alberto
## 2774                                  Gogolʹ, Nikolaĭ Vasilʹevich
## 2775                              Arnow, Harriette Louisa Simpson
## 2776                                             Ariyoshi, Sawako
## 2777                                          Dostoyevsky, Fyodor
## 2778                                                Waugh, Evelyn
## 2779                                          Watson, Jane Werner
## 2780                                        Baker, Margaret Joyce
## 2781                                      Bengtsson, Frans Gunnar
## 2782                                               Pavese, Cesare
## 2783                                        Remarque, Erich Maria
## 2784                                                 Niven, Larry
## 2785                                             Simenon, Georges
## 2786                                               Böll, Heinrich
## 2787                                           Auchincloss, Louis
## 2788                                              Gaddis, William
## 2789                                              Cauvin, Patrick
## 2790                                               Kinsella, W. P
## 2791                                                 Crews, Harry
## 2792                                         Baghio'o, Jean Louis
## 2793                                                  Gurr, David
## 2794                                             Exley, Frederick
## 2795                                                Bai, Xianyong
## 2796                                               Berry, Wendell
## 2797                                                 Weiss, David
## 2798                                            Bubennov, Mikhail
## 2799                                                 Mwangi, Meja
## 2800                                           Wibberley, Leonard
## 2801                                            Fielding, Gabriel
## 2802                                       Asturias, Miguel Angel
## 2803                                               Walser, Martin
## 2804                                             Aksenov, Vasiliĭ
## 2805                                                 Alther, Lisa
## 2806                                               Mishima, Yukio
## 2807                                            Flaubert, Gustave
## 2808                                                    Bank, Ted
## 2809                                                Gorky, Maksim
## 2810                                Cervantes Saavedra, Miguel de
## 2811                                                Cheever, John
## 2812                                                Musil, Robert
## 2813                                              Powell, Anthony
## 2814                                                  Scott, Paul
## 2815                                               Greene, Graham
## 2816                                            Callaghan, Morley
## 2817                                                 Wiesel, Elie
## 2818                                                  Scott, Paul
## 2819                              Nabokov, Vladimir Vladimirovich
## 2820                                                      Lu, Xun
## 2821                                               Mulisch, Harry
## 2822                                               Leavitt, David
## 2823                                            Gilbert, Harriett
## 2824                                               White, Patrick
## 2825                                         Hawthorne, Nathaniel
## 2826                             Solzhenit͡syn, Aleksandr Isaevich
## 2827                                                Lesins, Knuts
## 2828                                             Parise, Goffredo
## 2829                                                 Tert͡s, Abram
## 2830                                             Koestler, Arthur
## 2831                                              Basso, Hamilton
## 2832                                               Coover, Robert
## 2833                                                Simon, Claude
## 2834                                            MacDonald, George
## 2835                                                 Kraus, Henry
## 2836                                                Oberski, Jona
## 2837                                                  Yang, Jiang
## 2838                                                 James, Henry
## 2839                                               Pavese, Cesare
## 2840                                                Serge, Victor
## 2841                                                   Wain, John
## 2842                                                 Bely, Andrey
## 2843                                                 Itaya, Kikuo
## 2844                                               Vesaas, Tarjei
## 2845                                            Kobayashi, Takiji
## 2846                                                       Bryher
## 2847                                                Asimov, Isaac
## 2848                                              Rubens, Bernice
## 2849                                 Shukshin, Vasiliĭ Makarovich
## 2850                                      Furmanov, Dm. (Dmitriĭ)
## 2851                                                 James, Henry
## 2852                                                 Verne, Jules
## 2853                                  Zami͡atin, Evgeniĭ Ivanovich
## 2854                                            Bulgakov, Mikhail
## 2855                                            Richler, Mordecai
## 2856                                               Brown, Fredric
## 2857                                                Zweig, Stefan
## 2858                                                 Wilde, Oscar
## 2859                                             Bowen, Elizabeth
## 2860                                            Hartmann, von Aue
## 2861                                      Bunin, Ivan Alekseevich
## 2862                                             Fontane, Theodor
## 2863                                                Slesar, Henry
## 2864                              Cabrera Infante, G. (Guillermo)
## 2865                                                 Svevo, Italo
## 2866                                           Schnitzler, Arthur
## 2867                                           Schnitzler, Arthur
## 2868                                             Sembène, Ousmane
## 2869                                                Webb, James H
## 2870                                      Baṣīr, Vaikkaṃ Muhammad
## 2871                                                  Andrić, Ivo
## 2872                                               Pinget, Robert
## 2873                                               White, Patrick
## 2874                                               Anderson, Poul
## 2875                                      Baṣīr, Vaikkaṃ Muhammad
## 2876                                                 Wiesel, Elie
## 2877                                                             
## 2878                                                     Oz, Amos
## 2879                                                  Vidal, Gore
## 2880                                              McCaffrey, Anne
## 2881                                               Rogers, Paul T
## 2882                                              Beckett, Samuel
## 2883                                                  Nye, Robert
## 2884                                       Honwana, Luís Bernardo
## 2885                                              Manning, Olivia
## 2886                                             Callado, Antônio
## 2887                                                Keyes, Daniel
## 2888                                              Freuchen, Peter
## 2889                                               Anderson, Poul
## 2890                                               Pinget, Robert
## 2891                                                 Hale, Jeanne
## 2892                                   Cohen, J. M (John Michael)
## 2893                                           Arnothy, Christine
## 2894                                            Peyrefitte, Roger
## 2895                                             Federspiel, Jürg
## 2896                                          Blais, Marie-Claire
## 2897                                  Gogolʹ, Nikolaĭ Vasilʹevich
## 2898                                                Osaragi, Jirō
## 2899                                               Mann, Heinrich
## 2900                                             Bernhard, Thomas
## 2901                                           Strindberg, August
## 2902                                                Tarr, Herbert
## 2903                                               Thompson, Earl
## 2904                                               Nagai, Takashi
## 2905                                                        Homer
## 2906                                             Mitchell, Julian
## 2907                                               Boulle, Pierre
## 2908                                               Boulle, Pierre
## 2909  Madame de (Marie-Madeleine Pioche de La Vergne), La Fayette
## 2910                                                 Gary, Romain
## 2911                                              Gregor, Manfred
## 2912                                         Tagore, Rabindranath
## 2913                                                 Verne, Jules
## 2914                                               Fairbairn, Ann
## 2915                                                Buzzati, Dino
## 2916                                               Herbert, Frank
## 2917                                         Armstrong, Charlotte
## 2918                                             Lewisohn, Ludwig
## 2919                     Le Clézio, J.-M. G. (Jean-Marie Gustave)
## 2920                                           Hareven, Shulamith
## 2921                                                Carrier, Roch
## 2922                                         Holmes, John Clellon
## 2923                                Trifonov, I͡Uriĭ Valentinovich
## 2924                                Trifonov, I͡Uriĭ Valentinovich
## 2925                                               Gladkov, Fedor
## 2926                                              Fallaci, Oriana
## 2927                                                 Camara, Laye
## 2928                                             Marie, de France
## 2929                                              Collins, Wilkie
## 2930                                               Gross, Beverly
## 2931                                            Faulkner, William
## 2932                                     Chekhov, Anton Pavlovich
## 2933                                          Josipovici, Gabriel
## 2934                                             Iskander, Fazilʹ
## 2935                                             Stegner, Wallace
## 2936                                             Stegner, Wallace
## 2937                                                Norris, Frank
## 2938                                                Aquin, Hubert
## 2939                                              Spinrad, Norman
## 2940                                                Ibuse, Masuji
## 2941                                               Barnes, Julian
## 2942                                         Pérez Galdós, Benito
## 2943                                               Amis, Kingsley
## 2944                                                David, Janina
## 2945                                                  Sharpe, Tom
## 2946                                          Brückner, Christine
## 2947                                             Oyono, Ferdinand
## 2948                                             Delany, Samuel R
## 2949                                              Nesvadba, Josef
## 2950                                         Barthelme, Frederick
## 2951                                           Sciascia, Leonardo
## 2952                                           Sciascia, Leonardo
## 2953                                                 Adams, Alice
## 2954                                                    Traven, B
## 2955                                            Le Guin, Ursula K
## 2956                                             Tournier, Michel
## 2957                                                   Wain, John
## 2958                                               Zelazny, Roger
## 2959                                                 London, Jack
## 2960                                               Alain-Fournier
## 2961                                                Serge, Victor
## 2962                                         Rosa, João Guimarães
## 2963                                                 Brooks, John
## 2964                                                 Yaşar, Kemal
## 2965                                             Mikszáth, Kálmán
## 2966                                                Raspail, Jean
## 2967                                       Brenner, Joseph Ḥayyim
## 2968                                                  Liu, Chʻing
## 2969                                            Astrachan, Samuel
## 2970                                               Pinget, Robert
## 2971                                    Turgenev, Ivan Sergeevich
## 2972                                               Ćosić, Dobrica
## 2973                                               Ćosić, Dobrica
## 2974                                          Farmer, Philip José
## 2975                              Strugat͡skiĭ, Arkadiĭ Natanovich
## 2976                                         Strugat͡skiĭ, Arkadiĭ
## 2977                                                   Read, Miss
## 2978                                                  Zola, Émile
## 2979                                               Yates, Richard
## 2980                                             Werstein, Irving
## 2981                                          Sorrentino, Gilbert
## 2982                                              Beckett, Samuel
## 2983                                          Dostoyevsky, Fyodor
## 2984                                                 Yaşar, Kemal
## 2985                                            Fadeev, Aleksandr
## 2986                                               Yáñez, Agustín
## 2987                                             Bassani, Giorgio
## 2988                                                 Johnson, Uwe
## 2989                                               Hwang, Sun-wŏn
## 2990                                            Trollope, Anthony
## 2991                                                             
## 2992                                          Steinhoff, Johannes
## 2993                                            Holmes, Mary Jane
## 2994                                               Ćosić, Dobrica
## 2995                                                Symonds, John
## 2996                                                        Bōtan
## 2997                                               Ćosić, Dobrica
## 2998                                             Bassani, Giorgio
## 2999                                                 Rab, Gusztáv
## 3000                                              Lagerkvist, Pär
## 3001                                               Clark, Eleanor
## 3002                                           Gombrowicz, Witold
## 3003                                                Masters, John
## 3004                                             Pereira, Michael
## 3005                                                Cocteau, Jean
## 3006                                              Azuela, Mariano
## 3007                                                Corman, Avery
## 3008                                          Yehoshua, Abraham B
## 3009                                              Lengyel, József
## 3010                                             Andersch, Alfred
## 3011                                                Cocteau, Jean
## 3012                                                Cocteau, Jean
## 3013                                                 Rab, Gusztáv
## 3014                                               Kazakov, I͡Uriĭ
## 3015                                              Verga, Giovanni
## 3016                                      Brown, Charles Brockden
## 3017                                                Butor, Michel
## 3018                                                 Niven, Larry
## 3019                                        Quevedo, Francisco de
## 3020                                            Innerhofer, Franz
## 3021                              Nabokov, Vladimir Vladimirovich
## 3022                                               Wharton, Edith
## 3023                                              Silone, Ignazio
## 3024                                              Moberg, Vilhelm
## 3025                                         Bourjaily, Vance Nye
## 3026                                            Sadoveanu, Mihail
## 3027                                            Foster, Alan Dean
## 3028                                              Halldór Laxness
## 3029                                                  Gide, André
## 3030                                      Brown, Charles Brockden
## 3031                                               Roy, Gabrielle
## 3032                                               Sluyser, Meyer
## 3033                                                  Anatoliĭ, A
## 3034                                             Blacker, Irwin R
## 3035                                               Lustig, Arnošt
## 3036                                              MacInnes, Helen
## 3037                                                  Arden, John
## 3038                                                      Ba, Jin
## 3039                                                  Wolfe, Gene
## 3040                                               Mitford, Nancy
## 3041                                                   Grekova, I
## 3042                                         Orczy, Emmuska Orczy
## 3043                                       Singer, Isaac Bashevis
## 3044                                       Singer, Isaac Bashevis
## 3045                                                 Sjöwall, Maj
## 3046                                           Alcott, Louisa May
## 3047                                                 Verne, Jules
## 3048                                                             
## 3049                                                  Lin, Haiyin
## 3050                                    Turgenev, Ivan Sergeevich
## 3051                                                 Braine, John
## 3052                                            Dickson, Gordon R
## 3053                                      Du Bois, Shirley Graham
## 3054                     Grimmelshausen, Hans Jakob Christoph von
## 3055                           Korolenko, Vladimir Galaktionovich
## 3056                                                Brunner, John
## 3057                                     Mehdevi, Anne (Sinclair)
## 3058                                            Nowakowski, Marek
## 3059                                             de France, Marie
## 3060                                                 Mann, Thomas
## 3061                                                Rojas, Manuel
## 3062                                               Conrad, Joseph
## 3063                                                  Gide, André
## 3064                                          Boccaccio, Giovanni
## 3065                                                 Franko, Ivan
## 3066                                       Panova, Vera Fedorovna
## 3067                                            Moorcock, Michael
## 3068                                                Morante, Elsa
## 3069                                           Monteilhet, Hubert
## 3070                                                 Goulart, Ron
## 3071                                                Kaniuk, Yoram
## 3072                                            Feinberg, Leonard
## 3073                                              Huffaker, Clair
## 3074                                             Dickens, Charles
## 3075                                                Barash ,Asher
## 3076                                        Hansen, Martin Alfred
## 3077                                             Iskander, Fazilʹ
## 3078                                                Theroux, Paul
## 3079                                              Strachey, Julia
## 3080                                Saltykov, Mikhail Evgrafovich
## 3081                                            Higgins, George V
## 3082                                                Endō, Shūsaku
## 3083                                             Moravia, Alberto
## 3084                                            Barolini, Antonio
## 3085                                           Kazantzakis, Nikos
## 3086                                          Schwarz-Bart, André
## 3087                                           Bulatović, Miodrag
## 3088                                                 London, Jack
## 3089                                          Ó hEithir, Breandán
## 3090                                              Macdonald, Ross
## 3091                                               Eliade, Mircea
## 3092                                              Halldór Laxness
## 3093                              Branner, H. C. (Hans Christian)
## 3094                                                  Giono, Jean
## 3095                                                   Ali, Ahmed
## 3096                                                 Itō, Masashi
## 3097                                              Freuchen, Peter
## 3098                                             Arpino, Giovanni
## 3099                                             Alterman, Nathan
## 3100                                              Brecht, Bertolt
## 3101                                                  Steele, Max
## 3102                                               Morris, Wright
## 3103                                     Chekhov, Anton Pavlovich
## 3104                                                  Cao, Xueqin
## 3105                                              Ellison, Harlan
## 3106                                         Kabak, Aaron Abraham
## 3107                                             Cottle, Thomas J
## 3108                                                  Déry, Tibor
## 3109                                               Hesse, Hermann
## 3110                                              Nievo, Ippolito
## 3111                                                      Parijat
## 3112                                           Vaidya, Karuna Kar
## 3113                                                    Agi͡eev, M
## 3114                                             Tournier, Michel
## 3115                                               Ustinov, Peter
## 3116                                                  Mo, Timothy
## 3117                                           Oates, Joyce Carol
## 3118                                                  Shaw, Irwin
## 3119                                                Seeley, Mabel
## 3120                                                             
## 3121                                                Tsuboi, Sakae
## 3122                                          Dostoyevsky, Fyodor
## 3123                                                Gorky, Maksim
## 3124                                                             
## 3125                                         Akutagawa, Ryūnosuke
## 3126                                              Berriault, Gina
## 3127                                                   Lynch, Lee
## 3128                                          Zeno Gandía, Manuel
## 3129                                                 Davis, Terry
## 3130                                              Djilas, Milovan
## 3131                                                Lange, Victor
## 3132                                                  Lind, Jakov
## 3133                                                             
## 3134                                                  Vance, Jack
## 3135                                                             
## 3136                                                Marqués, René
## 3137                                              Linklater, Eric
## 3138                                                 Austen, Jane
## 3139                                        Manning-Sanders, Ruth
## 3140                                                 Verne, Jules
## 3141                                               De Hartog, Jan
## 3142                                                   Holm, Anne
## 3143                                                 Amado, Jorge
## 3144                                     Buchheim, Lothar Günther
## 3145                                               Howes, Barbara
## 3146                                                   Zhou, Erfu
## 3147                                              Macdonald, Ross
## 3148                                                 Ehrlich, Max
## 3149                                                Masters, John
## 3150                                                 Sandel, Cora
## 3151                                                 Sandel, Cora
## 3152                                              Johnson, Eyvind
## 3153                                                 Sandel, Cora
## 3154                                                 Sandel, Cora
## 3155                                                  Boye, Karin
## 3156                              Nabokov, Vladimir Vladimirovich
## 3157                                                Borgen, Johan
## 3158                          Kuprin, A. I. (Aleksandr Ivanovich)
## 3159                                                   Zhou, Libo
## 3160                                                   Ding, Ling
## 3161                                            Duras, Marguerite
## 3162                                            Duras, Marguerite
## 3163                                      Warner, Sylvia Townsend
## 3164                                                 Sandel, Cora
## 3165                                               Innes, Michael
## 3166                                                      Danarto
## 3167                                                 Serling, Rod
## 3168                                             Kataev, Valentin
## 3169                                               Naipaul, Shiva
## 3170                                              Collins, Wilkie
## 3171                                             Bowen, Elizabeth
## 3172                                                Hardy, Thomas
## 3173                                               Murphy, Dennis
## 3174                                        Montherlant, Henry de
## 3175                                            Trollope, Anthony
## 3176                                       Cooper, James Fenimore
## 3177                                          Hardwick, Elizabeth
## 3178                                           Bulatović, Miodrag
## 3179                                      Thayer, Charles Wheeler
## 3180                                                 James, Henry
## 3181                                          Dostoyevsky, Fyodor
## 3182                                            Vanderhaeghe, Guy
## 3183                                                     Oz, Amos
## 3184                                                Wilhelm, Kate
## 3185                                                Muschg, Adolf
## 3186                                               Ćosić, Dobrica
## 3187                                                  Kiš, Danilo
## 3188                                                             
## 3189                                             Keneally, Thomas
## 3190                                                Thomas, Dylan
## 3191                                     Johnson, Pamela Hansford
## 3192                                     Johnson, Pamela Hansford
## 3193                                               Bayer, William
## 3194                              Nabokov, Vladimir Vladimirovich
## 3195                                          Manzoni, Alessandro
## 3196                                            Dickson, Gordon R
## 3197                                                   Boyle, Kay
## 3198                                           Aldington, Richard
## 3199                                              De Vries, Peter
## 3200                                    Drieu La Rochelle, Pierre
## 3201                                                   Carew, Jan
## 3202                                         Tagore, Rabindranath
## 3203                                    Drieu La Rochelle, Pierre
## 3204                                               Anderson, Poul
## 3205                                         Adcock, Thomas Larry
## 3206                                            Nikolaeva, Galina
## 3207                                                Tsuboi, Sakae
## 3208                                             Bessette, Gérard
## 3209                                             Hameiri, Avigdor
## 3210                                              Schneider, Rolf
## 3211                              Nabokov, Vladimir Vladimirovich
## 3212                                    Turgenev, Ivan Sergeevich
## 3213                                                Treece, Henry
## 3214                                                Masters, John
## 3215                                         Gomez-Arcos, Agustin
## 3216                                               Maurois, André
## 3217                                             O'Flaherty, Liam
## 3218                                                Simon, Claude
## 3219                                           Silverberg, Robert
## 3220                                    Turgenev, Ivan Sergeevich
## 3221                                                MacAvoy, R. A
## 3222                                                  Shipp, John
## 3223                                                      Lu, Xun
## 3224                                 Pieyre de Mandiargues, André
## 3225                                               Amis, Kingsley
## 3226                                             Godbout, Jacques
## 3227                                             Lively, Penelope
## 3228                                            Sartre, Jean-Paul
## 3229                                                Shahnon Ahmad
## 3230                                                Shahnon Ahmad
## 3231                                             Arenas, Reinaldo
## 3232                                                Maḥfūẓ, Najīb
## 3233                                                  Franck, Dan
## 3234                                                 Thomas, D. M
## 3235                                          Rilke, Rainer Maria
## 3236                                       Polidori, John William
## 3237                                             Broughton, Rhoda
## 3238                                              Brookner, Anita
## 3239                                               Willard, Nancy
## 3240                                                    Bova, Ben
## 3241                                              Ėrenburg, Ilʹi͡a
## 3242                                                Tremain, Rose
## 3243                                             Tammuz, Benjamin
## 3244                                                  Kidd, David
## 3245                                          Dudint͡sev, Vladimir
## 3246                                                       Bryher
## 3247                                                 Redmon, Anne
## 3248                                                Zweig, Stefan
## 3249                                                Zweig, Stefan
## 3250                                           Sciascia, Leonardo
## 3251                                                 Tert͡s, Abram
## 3252                              Tendri͡akov, Vladimir Fedorovich
## 3253                                            Harner, Michael J
## 3254                                               Faludy, György
## 3255                                              Kunikida, Doppo
## 3256                                             Simenon, Georges
## 3257                                             Simenon, Georges
## 3258                                               Undset, Sigrid
## 3259                                          Scoppettone, Sandra
## 3260                                             Ekwensi, Cyprian
## 3261                                                 Tuohy, Frank
## 3262                                                 Bach, Marcus
## 3263                                            Caldwell, Erskine
## 3264                                                   Premacanda
## 3265                                          Suttner, Bertha von
## 3266                                             Machado de Assis
## 3267                                                Lowry, Robert
## 3268                                            Duras, Marguerite
## 3269                                             Arnott, Kathleen
## 3270                                          Goncourt, Edmond de
## 3271                                                Simon, Claude
## 3272                                             Kataev, Valentin
## 3273                                           Strindberg, August
## 3274                                              Pilʹni͡ak, Boris
## 3275                                                Thomas, Dylan
## 3276                                             Machado de Assis
## 3277                                                Hofmann, Gert
## 3278                                             Callaghan, Barry
## 3279                                                Barash ,Asher
## 3280                                               Németh, László
## 3281                      Marivaux, Pierre Carlet de Chamblain de
## 3282                                            Kāranta, Śivarāma
## 3283                                            Kāranta, Śivarāma
## 3284                                                 Fast, Howard
## 3285                            Sholokhov, Mikhail Aleksandrovich
## 3286                                           Tolstoy, Leo, graf
## 3287                                            Duras, Marguerite
## 3288                                      De Forest, John William
## 3289                                               Sharp, Margery
## 3290                                   Brandão, Ignácio de Loyola
## 3291                                             Ekwensi, Cyprian
## 3292                                                Endō, Shūsaku
## 3293                                             Aksenov, Vasiliĭ
## 3294                                               Maugham, Robin
## 3295                                               Maugham, Robin
## 3296                                           Swarthout, Glendon
## 3297                                              Manning, Olivia
## 3298                                      Mallet-Joris, Françoise
## 3299                                               Cassola, Carlo
## 3300                                               Cassola, Carlo
## 3301                                               Inoue, Yasushi
## 3302                                            Keller, Gottfried
## 3303                                                Memmi, Albert
## 3304                                               Duffy, Maureen
## 3305                                           Maupassant, Guy de
## 3306                                           Maupassant, Guy de
## 3307                                                 Icaza, Jorge
## 3308                                                    Bova, Ben
## 3309                                              Pekić, Borislav
## 3310                                        Mihailović, Dragoslav
## 3311                                                Stewart, Mary
## 3312                                                Lawson, Henry
## 3313                                         Pasolini, Pier Paolo
## 3314                                        Ashton-Warner, Sylvia
## 3315                          Crébillon, Claude-Prosper Jolyot de
## 3316                                            Korboński, Stefan
## 3317                                     Kot͡si͡ubynsʹkyĭ, Mykhaĭlo
## 3318                                              Styron, William
## 3319                                              Styron, William
## 3320                                           Smith, Martin Cruz
## 3321                                       Sillanpää, Frans Eemil
## 3322                                                 Pick, Robert
## 3323                                         Cleeve, Brian Talbot
## 3324                                               Morris, Wright
## 3325                                            Skármeta, Antonio
## 3326                                            Caldwell, Erskine
## 3327                                     Kot͡si͡ubynsʹkyĭ, Mykhaĭlo
## 3328                                        ʻAqqād, ʻAbbās Maḥmūd
## 3329                                                Maḥfūẓ, Najīb
## 3330                                                 Desai, Anita
## 3331                                               Lafferty, R. A
## 3332                                              Shaara, Michael
## 3333                                                 Hersey, John
##                    authordate latestcomp datetype startdate enddate
## 1                  1861-1947.       1900        r      1998    1900
## 2                  1796-1852.       1840        r      1998    1840
## 3                  1819-1893.       1875        r      1974    1875
## 4                       1888-       1959        s      1959        
## 5                       1910-       1961        s      1961        
## 6                  1863-1927.       1916        r      1975    1916
## 7                  1828-1905.       1878        r      1976    1878
## 8                  1859-1932.       1902        r      1976    1902
## 9                  1822-1896.       1896        r      1976    1906
## 10                 1819-1880.       1880        r      1976    1910
## 11                 1875-1947.       1917        r      1970    1917
## 12                                  1919        r      1979    1919
## 13                 1816-1855.       1855        s      1954        
## 14                      1913-       1955        s      1955        
## 15                 12th cent.       1959        s      1959        
## 16                      1902-       1957        s      1957        
## 17                 1843-1916.       1902        r      1970    1902
## 18                 1811-1872.       1872        r      1989    1873
## 19                 1849-1901.       1901        q      1963        
## 20                 1912-2004.       1961        s      1961        
## 21                 1818-1883.       1883        r      1970    1897
## 22                 1875-1950.       1922        r      1990    1922
## 23                                  1989        c      1992    1989
## 24                 1818-1883.       1883        r      1970    1896
## 25                 1818-1883.       1883        r      1970    1896
## 26                 1871-1945.       1928        r      1991    1928
## 27                 1875-1940.       1940        s      1993        
## 28                   d. 1395.       1907        r      1996    1907
## 29                 1870-1902.       1899        r      1995    1899
## 30                 1843-1916.       1916        r      1992    1917
## 31                 1857-1924.       1915        r      1998    1915
## 32                                  1979        s      1979        
## 33                 1866-1941.       1904        r      1990    1904
## 34                                  2000        s      2000        
## 35                      1949-       2005        s      2005        
## 36                 1774-1832.       1806        r      2007    1806
## 37                 1847-1912.       1908        r      2007    1908
## 38                 1806-1844.       1844        q      1900    1983
## 39                 1834-1896.       1890        r      1966    1890
## 40                 1785-1859.       1859        s      1968        
## 41                 1831-1915.       1915        s      1952        
## 42                 1825-1902.       1902        c      1897    1986
## 43                 1831-1890.       1890        s      1991        
## 44                      1920-       1965        s      1965        
## 45                                  1983        q      1900    1983
## 46                 1797-1851.       1851        r      1976    1891
## 47                 1855-1928.       1893        r      1974    1893
## 48                 1799-1850.       1850        r      1983    1900
## 49                 1878-1927.       1920        r      1968    1920
## 50                 1839-1894.       1894        r      1967    1910
## 51                 1640-1715.       1715        r      1965    1908
## 52                 1835-1910.       1897        r      1971    1897
## 53                 1861-1941.       1916        r      1970    1916
## 54                 1798-1874.       1874        s      1958        
## 55                 1746-1827.       1827        r      1988    1885
## 56                 1882-1957.       1957        s      1994        
## 57                 1849-1906.       1906        r      2008    1917
## 58                 1875-1947.       1920        r      1971    1920
## 59                 1879-1969.       1913        r      1991    1913
## 60                                  1987        r      1989    1987
## 61                 1899-1977.       1968        c      1989    1968
## 62                 1897-1961.       1950        q      1950    1959
## 63                 1897-1961.       1950        q      1950    1959
## 64                 1892-1981.       1981        r      1990    1983
## 65                                  1989        c      1990    1989
## 66                 1876-1916.       1916        s      1989        
## 67                 1866-1941.       1941        s      1990        
## 68                                  1959        r      1990    1959
## 69                 1891-1940.       1940        r      1990    1975
## 70                      1948-       1989        s      1989        
## 71                 1871-1900.       1900        r      1990    1984
## 72                                  1989        s      1989        
## 73                 1935-2004.       1987        r      1988    1987
## 74                 1867-1936.       1936        s      1987        
## 75                 1840-1902.       1902        s      1989        
## 76                                  1988        s      1988        
## 77                                  1988        s      1988        
## 78                 1764-1839.       1839        s      1990        
## 79                 1890-1976.       1953        r      1990    1953
## 80                      1918-       1989        s      1989        
## 81                 1816-1895.       1858        r      1990    1858
## 82                 1870-1953.       1953        r      1977        
## 83                 1903-1989.       1942        c      1989    1942
## 84                                  1989        s      1989        
## 85                                  1970        s      1970        
## 86                                  1958        r      1990    1958
## 87                 1850-1893.       1893        s      1972        
## 88                 1912-2001.       1971        r      1989    1971
## 89                                  1988        s      1988        
## 90                 1890-1976.       1937        r      1990    1937
## 91                 1712-1778.       1778        r      1989    1803
## 92                 1844-1924.       1896        r      1972    1896
## 93                 1875-1955.       1955        c      1960        
## 94                                  1974        s      1974        
## 95                 1919-1994.       1973        s      1973        
## 96            1896 or 7-1952.       1952        r      1964    1970
## 97                 1906-1939.       1937        r      1989    1937
## 98                                  1985        s      1985        
## 99                      1936-       1989        s      1989        
## 100                1899-1977.       1977        r      1989    1978
## 101                1859-1952.       1931        r      1990    1931
## 102                1863-1956.       1956        s      1988        
## 103                1903-1989.       1978        c      1989    1978
## 104                1937-1986.       1989        s      1989        
## 105                1749-1791.       1791        s      1986        
## 106                                 1989        s      1989        
## 107                1899-1977.       1977        r      1990        
## 108                1899-1973.       1973        r      1989    1981
## 109                                 1989        s      1989        
## 110                                 1989        s      1989        
## 111                     1931-       1963        c      1988    1963
## 112                1697-1763.       1763        s      1961        
## 113                1835-1910.       1889        r      1963    1889
## 114                1883-1924.       1924        c      1957    1956
## 115                1768-1848.       1848        s      1960        
## 116                1920-1992.       1950        t      1963    1950
## 117                1804-1864.       1864        s      1965        
## 118                1875-1955.       1955        s      1961        
## 119                1815-1882.       1882        s      1958        
## 120                                 1958        s      1958        
## 121                1913-1966.       1966        s      1975        
## 122                1911-1983.       1950        s      1950        
## 123                1883-1924.       1924        s      1953        
## 124                1888-1959.       1959        s      1982        
## 125                1895-1969.       1986        s      1986        
## 126                                 1985        s      1985        
## 127                                 1979        s      1979        
## 128                1904-1991.       1970        s      1970        
## 129                1795-1870.       1870        s      1962        
## 130                     1931-       1961        s      1961        
## 131                1905-1980.       1964               1964        
## 132                                 1961        s      1961        
## 133                    1925-.       1972        s      1972        
## 134                1850-1893.       1893        s      1970        
## 135                1850-1893.       1893        s      1970        
## 136                1843-1916.       1916        s      1974        
## 137                1799-1850.       1850        s      1968        
## 138                1816-1855.       1855        s      1965        
## 139                1875-1955.       1955        s      1961        
## 140                1905-1980.       1964        s      1964        
## 141                                 1961        c      1966    1961
## 142                1809-1849.       1849        s      1971        
## 143                                 1966        s      1966        
## 144                1857-1924.       1920        c      1971    1920
## 145                1713-1768.       1768        s      1954        
## 146                1876-1916.       1916        s      1956        
## 147                                 1969        s      1969        
## 148                1828-1910.       1910        t      1975    1954
## 149                1842-1912.       1912        s      1971        
## 150                                 1976        r      1984    1976
## 151                1888-1959.       1959        m      1983    9999
## 152                1802-1870.       1870        s      1967        
## 153                                 1992        s      1992        
## 154                1628-1688.       1902        r      1951    1902
## 155                1911-2007.       1987        s      1987        
## 156                                 1989        s      1989        
## 157                1903-1989.       1988        s      1988        
## 158                1923-2007.       1991        s      1991        
## 159                                 1902        r      1991    1902
## 160                1893-1944.       1944        c      1988    1969
## 161                                 1986        c      1987    1986
## 162                                 1929        r      1990    1929
## 163                                 1991        s      1991        
## 164                                 1989        s      1989        
## 165                                 1990        s      1990        
## 166                                 1990        s      1990        
## 167                     1940-       1990        s      1990        
## 168                1901-1982.       1982        s      1990        
## 169                1900-1998.       1990        s      1990        
## 170                1897-1955.       1955        s      1983        
## 171                1707-1777.       1777        s      1971        
## 172                     1927-       1961        r      1977    1961
## 173                1767-1849.       1849        r      1967    1893
## 174                1824-1905.       1905        s      1969        
## 175                1902-1987.       1959        c      1960    1959
## 176                1880-1942.       1942        r      1971        
## 177                1904-1991.       1948        r      1971    1948
## 178                1924-2004.       1982        s      1982        
## 179                                 1954        s      1954        
## 180                1907-1990.       1952        r      1960    1952
## 181                     1919-       1961        s      1961        
## 182                1885-1962.       1957        s      1957        
## 183                1903-1977.       1961        s      1961        
## 184                1799-1850.       1850        r      1970        
## 185                1713-1784.       1784        s      1968        
## 186                     1919-       1971        s      1971        
## 187                1842-1914?       1893        r      1971    1893
## 188                                 1962        s      1962        
## 189                                 1962        s      1962        
## 190                1865-1936.       1936        s      1987        
## 191                     1918-       1989        s      1989        
## 192                     1919-       1989        s      1989        
## 193                1918-2009.       1956        m      1956    1961
## 194                1918-2009.       1956        m      1956    1961
## 195                     1951-       1989        c      1990    1989
## 196                1903-1989.       1965        r      1991    1965
## 197                1821-1881.       1881        s      1989        
## 198                1903-1989.       1989        s      1990        
## 199                                 1964        c      1990    1964
## 200                     1924-       1991        s      1991        
## 201                1923-1964.       1964        s      1990        
## 202                                 1990        s      1990        
## 203                1802-1885.       1885        s      1990        
## 204                1895-1968.       1965        r      1977    1965
## 205                     1951-       1989        r      1991    1989
## 206                     1962-       1990        c      1992    1990
## 207                     1944-       1989        s      1989        
## 208                                 1991        s      1991        
## 209                1785-1859.       1859        r      1972    1890
## 210                1856-1916.       1916        s      1987        
## 211                                 1979        s      1979        
## 212                                 1992        s      1992        
## 213                1875-1955.       1955        r      1992    1955
## 214                                 1981        r      1991    1981
## 215                                 1992        s      1992        
## 216                                 1990        s      1990        
## 217                     1950-       1992        s      1992        
## 218                                 1992        s      1992        
## 219                                 1991        s      1991        
## 220                     1921-       1986        s      1986        
## 221                1903-1989.       1989        s      1992        
## 222                     1956-       1991        r      1992    1991
## 223                     1950-       1995        s      1995        
## 224                     1900-       1969        s      1969        
## 225                                 1991        r      1992    1991
## 226                1903-1989.       1989        s      1992        
## 227                1922-1975.       1968        r      1992    1968
## 228                     1944-       1991        s      1991        
## 229                                 1990        s      1990        
## 230                     1940-       1990        s      1990        
## 231                     1953-       1991        s      1991        
## 232                                 1991        s      1991        
## 233                1818-1883.       1883        s      1991        
## 234                     1936-       1990        s      1990        
## 235                1900-1959.       1959        s      1992        
## 236                                 1990        r      1991    1990
## 237                                 1978        r      1991    1978
## 238                 1918-2002       1991        s      1991        
## 239               1894-1939.        1939        s      1991        
## 240                1947-1981.       1985        c      1987    1985
## 241                1899-1960.       1960        s      1990        
## 242                     1962-       1992        s      1992        
## 243                1899-1977.       1977        s      1979        
## 244                     1931-       1970        r      1970    1970
## 245                1819-1880.       1880        n      1952        
## 246                                 1993        s      1993        
## 247                1900-1978.       1978        s      1986        
## 248                1900-1998.       1990        r      1991    1990
## 249                                 1986        s      1986        
## 250                     1949-       1991        s      1991        
## 251                1941-1995.       1991        s      1991        
## 252                                 1991        s      1991        
## 253                1912-1988.       1954        r      1965    1954
## 254                     1936-       1991        s      1991        
## 255                1849-1909.       1909        s      1991        
## 256                                 1992        s      1992        
## 257                1931-2003.       1990        s      1990        
## 258                     1936-       1991        s      1991        
## 259                                 1989        s      1989        
## 260                                 1966        s      1966        
## 261                                 1971        s      1971        
## 262                                 1961        s      1961        
## 263                 1884-1942       1942        s      1965        
## 264                1852-1932.       1903        r      1967    1903
## 265                                 1977        r      1994    1977
## 266                1847-1885.       1885        s      1994        
## 267                     1959-       1989        c      1993    1989
## 268                1917-2010.       1993        s      1993        
## 269                1890-1976.       1951        s      1951        
## 270                     1967-       1993        s      1993        
## 271                                 1957        r      1993    1957
## 272                     1954-       1986        c      1993    1986
## 273                                 1993        s      1993        
## 274                                 1993        s      1993        
## 275                                 1992        s      1992        
## 276                                 1992        s      1992        
## 277                1875-1955.       1955        s      1992        
## 278                                 1992        s      1992        
## 279                     1954-       1986        c      1990    1986
## 280                     1954-       1987        r      1991    1987
## 281                1812-1891.       1891        r      1992    1929
## 282                                 1991        r      1992    1991
## 283                                 1991        r      1992    1991
## 284                                 1993        s      1993        
## 285                                 1988        s      1988        
## 286                                 1988        s      1988        
## 287                1799-1837.       1837        s      1993        
## 288                     1946-       1988        r      1989    1988
## 289                                 1992        r      1993    1992
## 290                                 1990        s      1990        
## 291                1812-1891.       1891        r      1992        
## 292                     1949-       1992        r      1993    1992
## 293                                 1992        s      1992        
## 294                                 1986        s      1986        
## 295                1887-1950.       1950        s      1994        
## 296                                 1990        r      1992    1990
## 297                1775-1817.       1811        r      1994    1811
## 298                1883-1923.       1923        r      1993    1973
## 299                1883-1957.       1918        r      1993    1918
## 300                     1936-       1993        s      1993        
## 301                     1952-       1992        r      1993    1992
## 302                     1926-       1993        s      1993        
## 303                                 1988        s      1988        
## 304                     1934-       1993        s      1993        
## 305                1882-1957.       1957        r      1992    1991
## 306                                 1991        r      1992    1991
## 307                                 1992        c      1993    1992
## 308                                 1993        s      1993        
## 309               1951 May 3-       1991        t      1993    1991
## 310                     1934-       1992        s      1992        
## 311                                 1991        r      1993    1991
## 312                     1941-       1988        r      1989    1988
## 313                                 1993        s      1993        
## 314                     1948-       1992        s      1992        
## 315                                 1955        r      1992    1955
## 316                1847-1912.       1912        s      1993        
## 317                                 1992        s      1992        
## 318                     1930-       1991        s      1991        
## 319                                 1993        s      1993        
## 320                     1952-       1991        s      1991        
## 321                     1938-       1984        r      1988    1984
## 322                1880-1974.       1974        c      1987    1986
## 323                1904-1980.       1980        s      1990        
## 324                     1944-       1980        s      1980        
## 325                                 1987        s      1987        
## 326                     1949-       1992        s      1992        
## 327                                 1994        s      1994        
## 328                1883-1924.       1924        c      1989    1974
## 329                                 1969        s      1969        
## 330                1812-1870.       1870        r      1962    1892
## 331                                 1952        s      1952        
## 332                1920-1993.       1958        t      1959    1958
## 333                1900-1944.       1944        s      1971        
## 334                     1940-       1994        s      1994        
## 335                                 1973        r      1994    1973
## 336                                 1993        s      1993        
## 337                     1944-       1992        s      1992        
## 338                                 1993        s      1993        
## 339                                 1995        s      1995        
## 340                1882-1949.       1949        s      1995        
## 341                                 1995        s      1995        
## 342                                 1992        s      1992        
## 343                1891-1980.       1960        t      1964    1960
## 344                1877-1962.       1957        c      1971    1957
## 345                                 1971        s      1971        
## 346                                 1977        s      1977        
## 347                                 1957        s      1957        
## 348                1804-1864.       1864        s      1961        
## 349                                 1969        c      1984    1969
## 350                     1935-       1994        s      1994        
## 351                     1946-       1994        s      1994        
## 352                                 1989        r      1990    1989
## 353                                 1994        s      1994        
## 354                     1952-       1995        s      1995        
## 355                                 1986        s      1986        
## 356                1890-1976.       1937        r      1992    1937
## 357                1802-1870.       1870        s      1995        
## 358                1775-1817.       1816        r      1994    1816
## 359                1775-1817.       1816        r      1994    1816
## 360                1887-1959.       1959        c      1994    1993
## 361                                 1991        s      1991        
## 362                                 1992        s      1992        
## 363                1907-1998.       1991        s      1991        
## 364                                 1994        s      1994        
## 365                1839-1908.       1908        r      1994    1992
## 366                     1946-       1990        s      1990        
## 367                1912-1979.       1989        r      1992    1989
## 368                1896-1970.       1925        c      1991    1925
## 369                                 1982        s      1982        
## 370                     1899-       1963        s      1963        
## 371                1936-2012.       1994        s      1994        
## 372                                 1993        s      1993        
## 373                     1950-       1993        s      1993        
## 374                                 1917        r      1992    1917
## 375                                 1992        s      1992        
## 376                                 1994        s      1994        
## 377                                 1994        s      1994        
## 378                1845-1900.       1900        r      1994    1955
## 379                                 1977        s      1977        
## 380                1937-1986.       1977        s      1977        
## 381                1848-1917.       1917        s      1969        
## 382                     1920-       1959        s      1959        
## 383                1917-2010.       1962        s      1962        
## 384                                 1966        s      1966        
## 385                1935-2004.       1961        r      1973    1961
## 386                1873-1939.       1939        c      1957    1951
## 387                                 1985        r      1989    1985
## 388                                 1965        r      1995    1965
## 389                                 1991        r      1992    1991
## 390                                 1995        s      1995        
## 391                1861-1921.       1921        s      1994        
## 392                                 1995        s      1995        
## 393                1860-1913.       1913        r      1971        
## 394                1858-1940.       1901        r      1970    1901
## 395                1802-1870.       1870        s      1966        
## 396                1870-1925.       1925        r      1971    1929
## 397                1931-2003.       1997        s      1997        
## 398                                 1994        t      1995    1994
## 399                1928-2002.       1991        t      1996    1991
## 400                1846-1916.       1916        s      1992        
## 401                                 1994        s      1994        
## 402                     1936-       1965        r      1995    1965
## 403                                 1993        t      1995    1993
## 404                                 1882        r      1994    1882
## 405                                 1996        s      1996        
## 406                1867-1957.       1896        r      1970    1896
## 407                     1919-       1994        s      1994        
## 408                1902-1998.       1962        s      1962        
## 409                                 1997        s      1997        
## 410                     1950-       1997        s      1997        
## 411                                 1997        s      1997        
## 412                1873-1954.       1953        s      1953    ????
## 413                1857-1924.       1921        r      1980    1921
## 414                                 1975        s      1975        
## 415                                 1953        t      1954    1953
## 416                1907-1972.       1972        s      1997        
## 417                1810-1857.       1857        r      1977    1910
## 418                1917-2001.       1956        s      1956        
## 419                     1931-       1996        s      1996        
## 420                                 1995        s      1995        
## 421                1942-2008.       1992        s      1992        
## 422                1857-1924.       1924        s      1974        
## 423                                 1995        s      1995        
## 424                                 1995        s      1995        
## 425                1871-1922.       1922        r      1986    1948
## 426                1922-2001.       1996        s      1996        
## 427                                 1997        s      1997        
## 428                1931-2003.       1997        s      1997        
## 429                                 1997        s      1997        
## 430                1833-1908.       1893        r      1996    1893
## 431                1826-1871.       1871        s      1996        
## 432                                 1997        s      1997        
## 433                                 1980        r      1997    1980
## 434                1907-1998.       1995        s      1995        
## 435                1923-2010.       1969        c      1971    1969
## 436                1899-1966.       1966        s      1992        
## 437                                 1993        t      1995    1993
## 438                     1919-       1964        s      1964        
## 439                     1939-       1997        s      1997        
## 440                                 1997        r      1998    1997
## 441                1873-1954.       1954        s      1988        
## 442                1920-2012.       1959        s      1959        
## 443                                 1997        s      1997        
## 444                1799-1850.       1850        s      1998        
## 445                                 1999        s      1999        
## 446                     1920-       1973        t      1974    1973
## 447                                 1987        s      1987        
## 448                1919-1980.       1953        r      1999    1953
## 449                1876-1971.       1933        r      1970    1933
## 450                1834-1896.       1896        r      1973    1897
## 451                                 1999        s      1999        
## 452                                 1985        r      1985        
## 453                                 1998        s      1998        
## 454                     1962-       1999        s      1999        
## 455                                 1999        s      1999        
## 456                1847-1912.       1912        s      2000        
## 457                1848-1907.       1907        s      1958        
## 458                     1954-       1998        s      1998        
## 459                1835-1910.       1910        s      1997        
## 460                                 1998        s      1998        
## 461                                 1999        s      1999        
## 462                                 2000        s      2000        
## 463                1863-1923.       1923        s      1999        
## 464                                 1997        r      1998    1997
## 465                1886-1951.       1951        s      2000        
## 466                     1965-       1999        s      1999        
## 467                1818-1883.       1883        m      1951    9999
## 468                1818-1883.       1883        m      1951    9999
## 469                1818-1883.       1883        m      1951    9999
## 470                                 1999        s      1999        
## 471                                 1998        s      1998        
## 472                     1967-       1997        r      1998    1997
## 473                     1953-       2000        s      2000        
## 474                1818-1883.       1883        r      1960    1950
## 475                1835-1906.       1898        r      2002    1898
## 476                                 2000        s      2000        
## 477                                 2001        s      2001        
## 478                                 1999        s      1999        
## 479                                 1999        s      1999        
## 480                     1952-       1998        s      1998        
## 481                                 2000        s      2000        
## 482                                 1999        s      1999        
## 483                     1963-       2000        s      2000        
## 484                1915-1967.       1967        s      1995        
## 485                                 2001        s      2001        
## 486                     1962-       1996        r      1997    1996
## 487                     1960-       1999        s      1999        
## 488                1915-1967.       1956        t      1996    1956
## 489                                 1999        s      1999        
## 490                                 1998        s      1998        
## 491                1802-1885.       1885        s      1998        
## 492                                 2001        s      2001        
## 493                                 2000        s      2000        
## 494                                 1999        s      1999        
## 495                                 1957        s      1957        
## 496                1848-1917.       1917        s      1969        
## 497                                 2000        s      2000        
## 498                     1961-       2002        s      2002        
## 499                                 1994        r      2000    1994
## 500                                 2001        s      2001        
## 501                                 1993        s      1993        
## 502                1799-1837.       1837        s      1970        
## 503                1815-1882.       1882        r      1957    1941
## 504                     1933-       1979        r      2002    1979
## 505                                 1996        r      1999    1996
## 506                                 1941        r      2002    1941
## 507                1891-1940.       1940        c      1987    1971
## 508                                 1960        s      1960        
## 509                                 2000        s      2000        
## 510                                 1987        s      1987        
## 511                                 2000        s      2000        
## 512                                 2001        s      2001        
## 513                                 1986        s      1986        
## 514                1883-1924.       1924        s      1952        
## 515                1907-1990.       1973        s      1973        
## 516                     1926-       1973        s      1973        
## 517                1849-1906.       1891        r      1969    1891
## 518                                 2007        s      2007        
## 519                1926-2014.       1971        s      1971        
## 520                1901-1970.       1957        s      1957        
## 521                  b. 1855.       1951        s      1951        
## 522                1866-1944.       1944        s      1962        
## 523                1877-1959.       1959        s      1969        
## 524                     1927-       1971        s      1971        
## 525                1902-1972.       1954        s      1954        
## 526                1927-1987.       1963        s      1963        
## 527                                 2001        s      2001        
## 528                1937-1997.       1979        r      1986    1979
## 529                     1929-       2003        s      2003        
## 530                                 2000        s      2000        
## 531                                 2003        s      2003        
## 532                                 2002        s      2002        
## 533                                 2003        s      2003        
## 534                                 1976        s      1976        
## 535                     1934-       2003        s      2003        
## 536                                 2006        s      2006        
## 537                                 2005        r      2006    2005
## 538                     1969-       2005        s      2005        
## 539                                 2006        s      2006        
## 540                                 2006        s      2006        
## 541                1908-1988.       1988        s      2003        
## 542                                 2003        s      2003        
## 543                                 2003        s      2003        
## 544                                 2005        s      2005        
## 545                                 2003        s      2003        
## 546                1885-1970.       1970        s      2002        
## 547                     1954-       2000        s      2000        
## 548                                 2001        s      2001        
## 549                     1948-       2003        s      2003        
## 550                1840-1922.       1922        s      2002        
## 551                                 2002        s      2002        
## 552                                 2003        s      2003        
## 553                1903-1989.       1989        s      2002        
## 554               1894-1939.        1939        r      2002    1979
## 555                                 1998        s      1998        
## 556                                 1998        s      1998        
## 557                                 1992        s      1992        
## 558                                 1990        s      1990        
## 559                                 2002        s      2002        
## 560                     1959-       2002        r      2003    2002
## 561                                 2003        s      2003        
## 562                                 2002        s      2002        
## 563               1894-1939.        1939        s      2003        
## 564                1883-1959.       1959        m      1995    1999
## 565                                 2004        s      2004        
## 566                     1949-       1997        t      1998    1997
## 567                1903-1989.       1989        s      2003        
## 568                                 2001        s      2001        
## 569                1903-1989.       1989        s      2003        
## 570                     1971-       2003        s      2003        
## 571                                 2003        s      2003        
## 572                                 2004        s      2004        
## 573                1955-1991.       1992        r      2004    1992
## 574                1878-1945.       1945        s      2003        
## 575                                 2001        s      2001        
## 576                                 2001        s      2001        
## 577                                 2002        s      2002        
## 578                                 2001        s      2001        
## 579                                 2000        s      2000        
## 580                                 2004        s      2004        
## 581                 1901-1978       1978        s      1998        
## 582                                 2004        s      2004        
## 583                                 2004        s      2004        
## 584                1861-1941.       1941        s      2003        
## 585                     1900-       1962        s      1962        
## 586                1828-1905.       1905        s      2002        
## 587                     1941-       2000        s      2000        
## 588                                 1958        c      1961    1958
## 589                                 1962        s      1962        
## 590                1821-1881.       1881        s      1981        
## 591                                 1948        r      2003    1948
## 592                     1969-       2004        s      2004        
## 593                     1953-       2003        s      2003        
## 594                                 2004        s      2004        
## 595                 1818-1848       1848        s      1964        
## 596                                 1997        s      1997        
## 597                                 2002        s      2002        
## 598                     1920-       1998        s      1998        
## 599                1821-1881.       1881        s      2004        
## 600                     1966-       1995        s      1995        
## 601                                 2004        s      2004        
## 602                1887-1961.       1961        r      2004    1970
## 603                                 2004        s      2004        
## 604                                 2007        s      2007        
## 605                     1915-       1953        s      1953        
## 606                                 2004        s      2004        
## 607                     1940-       2002        t      2004    2002
## 608                                 2007        s      2007        
## 609                     1958-       2005        s      2005        
## 610                     1952-       2005        s      2005        
## 611                1914-2000.       2000        s      2004        
## 612                     1964-       2005        s      2005        
## 613                                 1994        r      2004    1994
## 614                     1944-       2005        s      2005        
## 615                1933-2012.       2004        s      2004        
## 616                1906-2001.       1971        s      1971        
## 617                                 2003        s      2003        
## 618                                 2002        s      2002        
## 619                     1940-       1992        r      1993    1992
## 620                                 2004        s      2004        
## 621                                 2004        t      2005    2004
## 622                                 2005        s      2005        
## 623                1880-1913.       1913        s      2004        
## 624                                 1998        s      1998        
## 625                1908-1986.       1957        r      2005    1957
## 626                                 1993        s      1993        
## 627                     1949-       2005        s      2005        
## 628                1892-1955.       1955        s      1969        
## 629                                 2002        s      2002        
## 630             1935 July 12-       2005        s      2005        
## 631                     1944-       2005        s      2005        
## 632                     1954-       2005        s      2005        
## 633                                 2005        s      2005        
## 634                     1944-       2004        s      2004        
## 635                     1956-       2005        s      2005        
## 636                1883-1945.       1945        s      1987        
## 637                                 2003        s      2003        
## 638                1916-2006.       2003        s      2003        
## 639                                 2005        s      2005        
## 640                                 2005        s      2005        
## 641                                 2000        s      2000        
## 642                1796-1867.       1867        s      1968        
## 643                                 1957        s      1957        
## 644                1878-1968.       1968        s      1988        
## 645                                 1987        s      1987        
## 646                                 1967        s      1967        
## 647                                 1962        s      1962        
## 648                     1912-       1946        c      1974    1946
## 649                                 1992        s      1992        
## 650                     1941-       1982        c      1991    1982
## 651                                 2006        s      2006        
## 652                     1954-       2006        s      2006        
## 653                     1958-       2003        r      2006    2003
## 654                1889-1956.       1951        s      1951        
## 655                                 2000        s      2000        
## 656                     1960-       2003        s      2003        
## 657                                 2001        s      2001        
## 658                                 2002        s      2002        
## 659                                 1999        s      1999        
## 660                                 2005        s      2005        
## 661                     1915-       1955        s      1955        
## 662                                 2006        s      2006        
## 663                                 2006        s      2006        
## 664                                 2005        s      2005        
## 665                     1955-       2006        s      2006        
## 666                                 2005        s      2005        
## 667                                 1998        r      2004    1998
## 668                                 2005        s      2005        
## 669                     1948-       1994        r      1998    1994
## 670                                 2005        s      2005        
## 671                     1954-       2004        s      2004        
## 672                                 1995        t      1996    1995
## 673                     1963-       2006        s      2006        
## 674                     1964-       2005        s      2005        
## 675                                 1931        r      2006    1931
## 676                1912-1993.       1993        s      2004        
## 677                1914-1970.       1970        s      2003        
## 678                1914-1970.       1970        s      200u        
## 679                     1966-       2006        s      2006        
## 680                                 2006        s      2006        
## 681                1864-1941.       1913        r      2003    1913
## 682                     1966-       2006        s      2006        
## 683                                 2006        s      2006        
## 684                                 2006        s      2006        
## 685                                 2008        s      2008        
## 686                                 2006        s      2006        
## 687                     1974-       2006        s      2006        
## 688                     1929-       2006        s      2006        
## 689                     1963-       2006        s      2006        
## 690                1912-1953.       1949        r      2005    1949
## 691                1873-1954.       1954        s      1995        
## 692                     1947-       1997        t      2005    1997
## 693                                 1959        t      1960    1959
## 694                1810-1865.       1865        m      2005    9999
## 695                1880-1974.       1974        s      2008        
## 696                                 2008        s      2008        
## 697                     1963-       2008        s      2008        
## 698                                 2008        s      2008        
## 699                1876-1916.       1916        s      2008        
## 700                                 2008        s      2008        
## 701                                 2007        s      2007        
## 702                     1958-       2008        s      2008        
## 703                     1936-       2008        s      2008        
## 704                     1955-       2007        s      2007        
## 705                     1934-       2006        s      2006        
## 706                1900-1991.       1991        s      2006        
## 707                                 2007        s      2007        
## 708                     1964-       2007        s      2007        
## 709                                 2007        s      2007        
## 710                                 2005        s      2005        
## 711                     1919-       1984        r      2002    1984
## 712                1827-1875.       1875        r      2001    1911
## 713                                 2007        s      2007        
## 714                                 2000        r      2006    2000
## 715                1857-1931.       1931        s      1996        
## 716                1837-1920.       1907        r      1970    1907
## 717                     1900-       1951        r      1976    1951
## 718                                 1950        s      1950        
## 719                1879-1969.       1969        r      1978        
## 720                1879-1969.       1931        r      1978    1931
## 721                1895-1981.       1980        r      1980        
## 722                                 1971        s      1971        
## 723                                 1958        s      1958        
## 724                                 1993        s      1993        
## 725                     1912-       1962        s      1962        
## 726                1914-1978.       1968        s      1968        
## 727                1902-1971.       1971        r      1976        
## 728                                 1980        s      1980        
## 729                                 1972        s      1972        
## 730                                 1972        s      1972        
## 731                                 1976        s      1976        
## 732                                 1981        s      1981        
## 733                                 1992        s      1992        
## 734                1869-1934.       1902        r      1968    1902
## 735                 1903-2008       1972        s      1972        
## 736                                 1991        s      1991        
## 737                     1933-       1983        s      1983        
## 738                     1947-       1984        r      1985    1984
## 739                     1913-       1987        s      1987        
## 740                                 1972        s      1972        
## 741                                 1975        s      1975        
## 742                1917-2006.       1974        s      1974        
## 743                1889-1968.       1964        s      1964        
## 744                1889-1968.       1968        r      1989    uuuu
## 745                     1914-       1976        s      1976        
## 746                     1887-       1928        r      1972    1928
## 747                1865-1947.       1947        r      1978        
## 748                                 1961        s      1961        
## 749                     1941-       1990        s      1990        
## 750                                 1978        s      1978        
## 751                     1945-       1979        s      1979        
## 752                1912-1994.       1956        s      1956        
## 753                1849-1924.       1924        r      1969    uuuu
## 754                1844-1925.       1902        r      1969    1902
## 755                                 1971        s      1971        
## 756                     1950-       2005        s      2005        
## 757                                 1987        t      1996    1987
## 758                     1970-       2006        r      2007    2006
## 759                     1975-       2006        r      2007    2006
## 760                     1969-       2006        s      2006        
## 761                     1968-       2006        s      2006        
## 762                     1953-       2007        s      2007        
## 763                                 2007        s      2007        
## 764                     1908-       1953        t      1954    1953
## 765                                 2007        s      2007        
## 766                     1931-       2006        s      2006        
## 767                                 2007        s      2007        
## 768                                 2006        s      2006        
## 769                1896-1970.       1970        s      1994        
## 770                1821-1881.       1881        s      1994        
## 771                                 2007        s      2007        
## 772                1749-1806.       1806        m      2005    2006
## 773                1749-1806.       1806        m      2005    2006
## 774                     1948-       2006        s      2006        
## 775                     1971-       2007        s      2007        
## 776               1661?-1731.       1731        s      1983        
## 777                1804-1864.       1864        s      1975        
## 778                1850-1894.       1894        s      1993        
## 779                1846-1916.       1916        s      1988        
## 780                1815-1882.       1882        s      1993        
## 781                1821-1881.       1881        s      1985        
## 782                1863-1933.       1933        s      1966        
## 783                1818-1883.       1883        s      1977        
## 784                1890-1960.       1960        s      1986        
## 785                1905-1976.       1976        s      1979        
## 786                1902-1968.       1968        s      1988        
## 787                1904-1977.       1976        s      1976        
## 788                1909-1955.       1955        t      1979    1956
## 789                1821-1881.       1881        s      1979        
## 790                1828-1910.       1910        s      1975        
## 791                1783-1859.       1859        s      1978        
## 792                1854-1900.       1900        s      1976        
## 793                1811-1863.       1863        s      1979        
## 794                1809-1849.       1849        s      1975        
## 795                1811-1896.       1896        s      1979        
## 796                1895-1998.       1970        s      1970        
## 797                1888-1971.       1955        s      1955        
## 798                1914-1989.       1961        s      1961        
## 799                                 1965        s      1965        
## 800                1900-1969.       1964        s      1964        
## 801                     1903-       1950        s      1950        
## 802                                 1969        s      1969        
## 803                                 1986        s      1986        
## 804                1932-2010.       1977        s      1977        
## 805                                 1981        s      1981        
## 806                     1934-       2007        s      2007        
## 807                     1931-       2006        t      2007    2006
## 808                                 2007        s      2007        
## 809                                 2006        s      2006        
## 810                1909-1938.       1938        s      2008        
## 811                                 2008        s      2008        
## 812                     1945-       2008        s      2008        
## 813                                 2008        s      2008        
## 814                     1937-       2008        s      2008        
## 815                1903-1978.       1978        r      1978        
## 816                1885-1951.       1951        s      1975        
## 817                                 1976        s      1976        
## 818                1862-1937.       1937        s      1973        
## 819                1805-1875.       1875        s      1977        
## 820                1828-1910.       1910        s      1994        
## 821                1776-1822.       1822        s      1992        
## 822                1925-2012.       1990        s      1990        
## 823                                 1977        s      1977        
## 824                1818-1883.       1883        s      1992        
## 825                1883-1967.       1943        c      1978    1943
## 826                1925-2006.       1976        s      1976        
## 827                1886-1967.       1967        s      1976        
## 828                1805-1875.       1875        s      1977        
## 829                     1974-       2008        s      2008        
## 830                                 2008        s      2008        
## 831                1807-1892.       1845        r      2007    1845
## 832                                 2000        s      200u        
## 833                1890-1960.       1960        s      1986        
## 834                                 2008        s      2008        
## 835                                 2006        s      2006        
## 836                     1962-       2006        s      2006        
## 837                1938-2005.       2005        s      2008        
## 838                1819-1875.       1875        r      1968    uuuu
## 839                                 2007        s      2007        
## 840                     1969-       2008        t      2009    2008
## 841                     1911-       1972        s      1972        
## 842                     1928-       1961        s      1961        
## 843                1873-1945.       1945        s      1971        
## 844                1896-1983.       1964        s      1964        
## 845                 1898-1985       1962        s      1962        
## 846                                 1955        s      1955        
## 847                1872-1939.       1939        s      1972        
## 848                1880-1918.       1918        s      1967        
## 849                1767-1849.       1849        r      1967    1893
## 850                1837-1909.       1909               1962        
## 851                1932-1994.       1966        t      1968    1966
## 852                1876-1916.       1916        m      1963    1966
## 853                1815-1882.       1882        s      1957        
## 854                1815-1882.       1882        s      1956        
## 855                1850-1894.       1894        s      1959        
## 856                1850-1894.       1894        s      1950        
## 857                1850-1894.       1894        s      1974        
## 858                1843-1916.       1916        s      1957        
## 859                1846-1916.       1896        r      1989    1896
## 860                1885-1976.       1968        s      1968        
## 861                1877-1950.       1922        r      1971    1922
## 862                1898-1956.       1956        s      1956        
## 863                1815-1882.       1882        s      1967        
## 864                1777-1811.       1811        s      1969        
## 865                1865-1936.       1936        s      1987        
## 866                                 1944        r      1962    1944
## 867                1804-1875.       1875        s      1957        
## 868                1875-1955.       1953        s      1953        
## 869                1907-1989.       1951        s      1951        
## 870                1899-1951.       1951        s      1975        
## 871                1891-1974.       1958        s      1958        
## 872                1840-1922.       1922        s      1984        
## 873                1875-1926.       1926        s      1950        
## 874                1713-1784.       1784        s      1972        
## 875                     1908-       1958        s      1958        
## 876                1907-1990.       1964        s      1964        
## 877                                 1965        s      1965    1962
## 878                1855-1906.       1906        s      2002        
## 879                1835-1910.       1910        s      1962        
## 880                     1927-       1962        c      1965    1962
## 881             1933 July 13-       1960        t      1963    1960
## 882                1906-1994.       1954        s      1954        
## 883                                 1960        s      1960        
## 884                                 1963        s      1963        
## 885                1903-1966.       1950        s      1950        
## 886                1920-1978.       1963        s      1963        
## 887                1920-1978.       1967        s      1967    1962
## 888                1850-1893.       1893        s      1971        
## 889                                 1954        s      1954        
## 890                1869-1909.       1894        r      1972    1894
## 891                1881-1942.       1942        r      1971    uuuu
## 892                                 1989        s      1989        
## 893                                 1984        s      1984        
## 894                1871-1919.       1919        c      1961    1958
## 895                1871-1900.       1900        s      1966        
## 896                1741-1803.       1803        s      1962        
## 897                                 1970        s      1970        
## 898                1903-1990.       1961        c      1964    1961
## 899                     1941-       1966        s      1966        
## 900                1906-1970.       1950        s      1950        
## 901                1905-1984.       1959        s      1959        
## 902                1873-1938.       1938        s      1966        
## 903                1819-1891.       1891        s      1984        
## 904                1812-1870.       1870        s      1971        
## 905                                 1972        s      1972        
## 906                                 1959        s      1959        
## 907                                 1958        s      1958        
## 908                1893-1944.       1944        t      1972    1965
## 909                1782-1848.       1848        r      1972    1945
## 910                1914-1970.       1970        s      200u        
## 911                1912-2001.       1962        r      1974    1962
## 912                1903-1923.       1923        s      1971        
## 913                     1927-       1960        s      1960        
## 914                1828-1910.       1910        s      1961        
## 915               1707-1754.        1754        s      1959        
## 916                1821-1880.       1880        s      1972        
## 917                1840-1902.       1902        t      1968    1957
## 918                1894-1959.       1959        s      1970        
## 919                1881-1942.       1942        s      1955        
## 920                1873-1954.       1954        s      1961        
## 921                                 1973        r      1973    uuuu
## 922                                 1968        s      1968        
## 923                1689-1761.       1761        s      1965        
## 924                                 1966        s      1966        
## 925                1873-1945.       1945        r      1971    uuuu
## 926                1886-1957.       1957        s      1961        
## 927                1855-1924.       1886        r      1973    1886
## 928                                 1986        s      1986        
## 929                     1919-       1952        s      1952        
## 930                1906-2001.       1954        s      1954        
## 931                1918-1983,       1961        s      1961        
## 932                     1914-       1955        s      1955        
## 933                                 1954        r      1971    1954
## 934                1876-1945.       1945        s      1963        
## 935                1905-1994.       1969        s      1969        
## 936                1875-1955.       1951        s      1951        
## 937                1911-1975.       1961        s      1961        
## 938                1840-1902.       1902        s      1968        
## 939                1908-1993.       1973        s      1973        
## 940                                 1959        s      1959        
## 941                1899-1973.       1960        s      1960        
## 942                1913-1991.       1956        s      1956        
## 943                1903-1989.       1966        s      1966        
## 944                1835-1910.       1910        s      1967        
## 945                                 1971        s      1971        
## 946                                 1959        s      1959        
## 947                1818-1883.       1883        t      1967    1959
## 948                1903-1989.       1968        s      1968        
## 949                1843-1916.       1916        s      1961        
## 950                1792-1848.       1848        s      1970        
## 951                                 1956        s      1956        
## 952                1918-1999.       1960        s      1960        
## 953                1896-1967.       1955        s      1955        
## 954                1909-1998.       1953        s      1953        
## 955               1869?-1942.       1923        r      1973    1923
## 956                                 1972        s      1972        
## 957                     1923-       2002        s      2002        
## 958                                 1967        s      1967        
## 959                     1930-       1966        s      1966        
## 960                     1918-       1961        s      1961        
## 961                1867-1922.       1922        s      1957        
## 962                                 1973        s      1973        
## 963                                 1963        s      1963        
## 964                                 1975        s      1975        
## 965                     1931-       1963        s      1963        
## 966                     1941-       1970        s      1970        
## 967                     1905-       1969        s      1969        
## 968                     1927-       1962        s      1962        
## 969                     1924-       1958        s      1958        
## 970                1909-1984.       1972        s      1972        
## 971                1909-1984.       1972        s      1972        
## 972                1908-1973.       1963        t      1969    1963
## 973                1876-1916.       1916        m      1963    1966
## 974                1882-1961.       1961        r      1970        
## 975                1863-1919.       1958        r      1958    uuuu
## 976                     1922-       1967        s      1967        
## 977                     1915-       1952        s      1952        
## 978                1767-1849.       1849        r      1952    1910
## 979                1900-1983.       1962        s      1962        
## 980                1908-1993.       1950        s      1950        
## 981                1862-1931.       1931        r      1971    uuuu
## 982                                 1974               1974        
## 983                                 1963               1963        
## 984                                 1987        s      1987        
## 985                1857-1928.       1928        s      1987        
## 986                1889-1979.       1988        r      1988        
## 987                1891-1940.       1940        r      1989    1971
## 988                1904-1991.       1989        s      1989        
## 989                1922-1987.       1985        c      1986    1985
## 990                                 1959        s      1959        
## 991                1899-1977.       1970        r      1989    1970
## 992                                 1989        s      1989        
## 993                1938-2005.       1989        s      1989        
## 994                     1920-       1979        r      1980    1979
## 995                                 1989        s      1989        
## 996                                 1970        r      1988    1970
## 997                1904-1991.       1960        s      1960        
## 998               1707-1754.        1754        s      1989        
## 999                1905-1984.       1984        m      1987    9999
## 1000               1835-1904.       1904        c      1984    1966
## 1001               1867-1931.       1931        s      1956        
## 1002                                1966        c      1983    1966
## 1003                    1946-       1984        s      1984        
## 1004               1885-1970.       1946        r      1984    1946
## 1005                    1942-       1974        c      1984    1974
## 1006               1872-1963.       1961        c      1984    1961
## 1007                    1919-       1963        c      1984    1963
## 1008               1860-1904.       1904        r      1985    1918
## 1009               1890-1963.       1982        s      1982        
## 1010              1894-1939.        1939        s      1983    1974
## 1011               1903-1950.       1950        r      1983    1976
## 1012               1898-1970.       1952        c      1981    1952
## 1013                                1975        c      1976    1975
## 1014                    1945-       1984        s      1984        
## 1015                    1952-       1984        s      1984        
## 1016                                1970        c      1983    1970
## 1017               1908-1944.       1944        s      1985        
## 1018               1885-1970.       1970        s      1984        
## 1019               1935-2004.       1984        s      1984        
## 1020               1850-1893.       1893        r      1985    1903
## 1021                                1959        s      1959        
## 1022               1882-1953.       1950        s      1950        
## 1023               1871-1950.       1950        s      1984        
## 1024                    1946-       1983        r      1984    1983
## 1025                                1985        s      1985        
## 1026               1884-1969.       1926        c      1980    1926
## 1027                                1985        s      1985        
## 1028               1840-1922.       1922        s      1984        
## 1029               1873-1947.       1947        s      1984        
## 1030               1938-2005.       1986        s      1986        
## 1031               1864-1910.       1910        r      1986    1957
## 1032                    1928-       1973        c      1986    1973
## 1033                    1936-       1984        s      1984        
## 1034               1903-1989.       1968        c      1985    1968
## 1035                    1938-       1984        s      1984        
## 1036                                1984        s      1984        
## 1037                                1985        c      1985        
## 1038               1859-1932.       1932        s      1983        
## 1039               1838-1889.       1889        r      1985    1963
## 1040                    1950-       1983        s      1983        
## 1041               1929-1979.       1970        r      1982    1970
## 1042               1894-1961.       1961        r      1983    1982
## 1043               1904-1966.       1958        r      1985    1958
## 1044               1901-1976.       1976        r      1983    1976
## 1045                                1984        s      1984        
## 1046                                1984        s      1984        
## 1047               1893-1973.       1973        s      1985        
## 1048               1891-1940.       1940        c      1984    1967
## 1049                                1985        s      1985        
## 1050               1818-1883.       1883        s      1985        
## 1051                                1972        r      1985    1972
## 1052               1896-1972.       1965        c      1985    1965
## 1053               1886-1951.       1951        s      1986        
## 1054               1860-1904.       1904        s      1985        
## 1055               1888-1957.       1957        s      1985        
## 1056               1862-1949.       1949        s      1984        
## 1057                                1982        s      1982        
## 1058               1867-1936.       1926        r      1975    1926
## 1059                    1917-       1984        s      1984        
## 1060               1931-1993.       1984        s      1984        
## 1061               1899-1973.       1973        s      1976        
## 1062                                1973        s      1973        
## 1063                                1974        c      1986    1974
## 1064                                1985        s      1985        
## 1065                                1973        c      1986    1973
## 1066                                1980        s      1980        
## 1067               1917-1985.       1985        s      1986        
## 1068                                1984        s      1984        
## 1069                    1945-       1987        s      1987        
## 1070               1903-1989.       1986        s      1986        
## 1071               1867-1936.       1936        s      1987        
## 1072                                1984        r      1986    1984
## 1073               1860-1904.       1904        r      1986    1921
## 1074                                1959        c      1986    1959
## 1075                                1984        s      1984        
## 1076               1917-1983.       1985        s      1985        
## 1077               1927-1989.       1962        c      1963    1962
## 1078               1840-1902.       1902        r      1985    1956
## 1079               1925-1981.       1981        r      1985    1983
## 1080                    1927-       1985        c      1986    1985
## 1081               1824-1905.       1905        s      1986        
## 1082               1799-1850.       1850        s      1986        
## 1083               1907-1986.       1986        s      1986        
## 1084                                1985        s      1985        
## 1085               1826-1915.       1915        s      1984        
## 1086                    1957-       1984        s      1984        
## 1087               1935-2004.       1983        s      1983        
## 1088               1847-1912.       1912        c      1979    1973
## 1089               1878-1954.       1954        s      1986        
## 1090                                1987        s      1987        
## 1091               1863-1924.       1924        s      1987        
## 1092               1867-1936.       1926        r      1977    1926
## 1093               1890-1960.       1958        r      1987    1958
## 1094                    1942-       1983        s      1983        
## 1095               1931-1993.       1986        s      1986        
## 1096                                1987        r      1988    1987
## 1097                                1937        r      1976    1937
## 1098                                1981        c      1985    1981
## 1099                    1920-       1965        c      1967    1965
## 1100               1867-1922.       1922        s      1962        
## 1101                    1927-       1980        s      1980        
## 1102                    1900-       1981        s      1981        
## 1103               1903-1989.       1982        r      1982        
## 1104                 d. 1751.       1981        c      1982    1981
## 1105               1926-2003.       1967        r      1982    1967
## 1106               1810-1865.       1865        s      1982        
## 1107               1910-1999.       1955        r      1982    1955
## 1108                                1982        s      1982        
## 1109               1828-1910.       1910        s      1983        
## 1110               1857-1924.       1921        r      1980    1921
## 1111               1857-1924.       1921        r      1980    1921
## 1112               1900-1991.       1981        s      1981        
## 1113                                1980        s      1980        
## 1114               1828-1910.       1910        s      1977    1972
## 1115                    1935-       1957        s      1957        
## 1116               1869-1954.       1954        m      1989    9999
## 1117                                1980        s      1980        
## 1118                    1939-       1979        s      1979        
## 1119                                1980        s      1980        
## 1120                                1980        s      1980        
## 1121               1906-2001.       1961        c      1980    1961
## 1122               1918-2008.       1963        r      1984    1963
## 1123               1899-1973.       1952        s      1952        
## 1124               1849-1912.       1912        r      1981    1967
## 1125               1918-2008.       1969        c      1970    1969
## 1126                    1930-       1980        s      1980        
## 1127               1882-1911.       1911        s      1981        
## 1128               1902-1967.       1965        s      1965        
## 1129              1804?-1891.       1891        r      1972    1896
## 1130                                1979        s      1979        
## 1131         1920 Aug. 2-1997       1959        s      1959        
## 1132                                1980        s      1980        
## 1133                                1977        c      1978    1977
## 1134                                1969        c      1979    1969
## 1135               1925-2013.       1977        c      1978    1977
## 1136                                1959        c      1965    1959
## 1137                                1981        s      1981        
## 1138               1876-1918.       1918        s      1976        
## 1139                                1979        s      1979        
## 1140               1840-1902.       1882        r      1979    1882
## 1141               1904-1991.       1959        s      1959        
## 1142               1869-1951.       1950        r      1980    1950
## 1143               1869-1951.       1951        r      1980        
## 1144                fl. 1961-       1979        s      1979        
## 1145     active 12th century.       1904        r      1978    1904
## 1146               1893-1971.       1971        s      1978        
## 1147               1905-1984.       1978        r      1978        
## 1148                                1977        s      1977        
## 1149                    1919-       1978        s      1978        
## 1150               1840-1928.       1928        s      1978        
## 1151                    1917-       1963        s      1963        
## 1152               1826-1915.       1915        s      1958        
## 1153               1913-1995.       1958        s      1958        
## 1154                                1986        s      1986        
## 1155               1812-1891.       1891        r      1977    1915
## 1156               1812-1891.       1891        r      1977    1894
## 1157               1919-2004.       1976        s      1976        
## 1158               1855-1920.       1897        r      1974    1897
## 1159                    1930-       1976        s      1976        
## 1160               1903-1989.       1976        s      1976        
## 1161                    1930-       1976        s      1976        
## 1162                                1975        s      1975        
## 1163               1873-1924.       1924        r      1977    1930
## 1164               1899-1980.       1954        s      1954        
## 1165                                1976        s      1976        
## 1166                                1965        c      1978    1965
## 1167                                1976        s      1976        
## 1168               1850-1893.       1893        s      1976        
## 1169               1313-1375.       1974        r      1978    1974
## 1170               1908-2004.       1977        s      1977        
## 1171               1838-1917.       1917        s      1976        
## 1172                                1978        s      1978        
## 1173                    1935-       1956        s      1956        
## 1174                                1975        s      1975        
## 1175               1478-1535.       1974        s      1974        
## 1176                                1974        c      1976    1974
## 1177                                1975        s      1975        
## 1178                                1976        s      1976        
## 1179               1904-1973.       1973        s      1975        
## 1180                    1946-       1976        s      1976        
## 1181               1819-1898.       1898        s      1976        
## 1182               1880-1918.       1918        s      1976        
## 1183               1943-1990.       1976        s      1976        
## 1184                                1957        s      1957        
## 1185                    1941-       1975        s      1975        
## 1186               1877-1957.       1927        r      1977    1927
## 1187               1768-1848.       1848        r      1976    1859
## 1188               1902-1974.       1957        s      1957        
## 1189                                1975        s      1975        
## 1190               1861-1928.       1928        s      1964        
## 1191               1860-1904.       1904        s      1964        
## 1192                                1976        s      1976        
## 1193               1888-1948.       1948        s      1975        
## 1194                                1978        s      1978        
## 1195               1494-1576.       1910        r      1978    1910
## 1196       ca. 1330-ca. 1400.       1908        r      1978    1908
## 1197               1888-1923.       1923        r      1974        
## 1198               1911-1977.       1961        s      1961        
## 1199                                1972        s      1972        
## 1200                    1902-       1974        s      1974        
## 1201               1775-1817.       1817               1975        
## 1202               1904-1991.       1974        s      1974        
## 1203                    1927-       1960        s      1960        
## 1204               1890-1976.       1955               1955        
## 1205               1935-2000.       1975        r      1975        
## 1206               1927-2010.       1962        n      1962        
## 1207               1912-1981.       1948        c      1975    1948
## 1208               1928-2011.       1960        r      1961    1960
## 1209               1865-1936.       1936        s      1987        
## 1210               1873-1947.       1943        c      1963    1943
## 1211               1883-1957.       1957        s      1962        
## 1212               1905-2000.       1955        t      1960    1955
## 1213               1832-1910.       1894        r      1972    1894
## 1214               1917-1993.       1963        s      1963        
## 1215                                1967        s      1967        
## 1216               1867-1922.       1922        r      1970    1948
## 1217                                1969        c      1973    1969
## 1218               1816-1855.       1855        s      1953        
## 1219               1890-1976.       1974               1974        
## 1220                    1931-       1963        s      1963        
## 1221                    1944-       1981        s      1981        
## 1222                    1922-       1968        r      1983    1968
## 1223                                1980        s      1980        
## 1224                                1959        c      1960    1959
## 1225               1828-1910.       1910        s      1983        
## 1226               1802-1870.       1870        s      1979        
## 1227                                1983        s      1983        
## 1228               1940-1989.       1984        s      1984        
## 1229                                1983        s      1983        
## 1230                                1982        s      1982        
## 1231               1756-1836.       1836        s      1982        
## 1232               1838-1889.       1889        s      1986        
## 1233               1858-1932.       1932        s      1955        
## 1234                                1986        s      1986        
## 1235               1903-1989.       1969        c      1987    1969
## 1236                                1983        s      1983        
## 1237                                1987        s      1987        
## 1238               1828-1905.       1905        s      1987        
## 1239                    1950-       1986        c      1987    1986
## 1240                    1927-       1988        s      1988        
## 1241                    1950-       1987        s      1987        
## 1242               1931-1993.       1987        s      1987        
## 1243               1749-1832.       1832        s      1988        
## 1244               1892-1955.       1931        c      1988    1931
## 1245                                1986        s      1986        
## 1246                                1988        s      1988        
## 1247               1878-1947.       1947        r      1988    1972
## 1248                                1960        c      1988    1960
## 1249                                1988        s      1988        
## 1250                                1986        s      1986        
## 1251               1883-1924.       1924        s      1988        
## 1252               1904-1991.       1960        s      1960        
## 1253                    1938-       1986        r      1987    1986
## 1254                                1988        r      1988        
## 1255                                1989        s      1989        
## 1256               1902-1968.       1968        s      1985        
## 1257               1917-2010.       1954        s      1954        
## 1258                    1927-       1975        s      1975        
## 1259               1857-1924.       1924        s      1983        
## 1260                    1944-       1974        s      1974        
## 1261                                1985        s      1985        
## 1262                                1988        r      1988        
## 1263               1819-1891.       1891        s      1988        
## 1264                                1987        s      1987        
## 1265               1906-1972.       1964        r      1987    1964
## 1266                    1940-       1988        s      1988        
## 1267                    1918-       1985        s      1985        
## 1268                                1988        s      1988        
## 1269               1628-1688.       1989        s      1989        
## 1270     1904, March 17-1962.       1962        r      1989        
## 1271                                1985        r      1989    1985
## 1272                    1936-       1986        c      1989    1986
## 1273               1812-1870.       1870        c      1989    1970
## 1274                                1819        r      1989    1819
## 1275                                1983        s      1983        
## 1276                                1958        s      1958        
## 1277                                1964        s      1964        
## 1278                                1983        s      1983        
## 1279                    1932-       1969        c      1970    1969
## 1280                                1982        s      1982        
## 1281                                1950        s      1950        
## 1282                                1964        s      1964        
## 1283               1875-1944.       1934        c      1982    1934
## 1284                    1928-       1983        s      1983        
## 1285                                1962        r      1975    1962
## 1286                                1981        s      1981        
## 1287                                1985        s      1985        
## 1288                                1985        s      1985        
## 1289                    1916-       1987        s      1987        
## 1290                                1987        s      1987        
## 1291                                1987        s      1987        
## 1292               1839-1889.       1889        s      1952        
## 1293                    1937-       1983        s      1983        
## 1294               1907-1999.       1965        s      1965        
## 1295               1861-1896.       1896        s      1961        
## 1296               1912-1953.       1950        r      1980    1950
## 1297                                1978        s      1978        
## 1298                    1943-       1980        s      1980        
## 1299                                1950        s      1950        
## 1300                                1977        s      1977        
## 1301                                1977        s      1977        
## 1302               1902-1983.       1964        s      1964        
## 1303                                1958        s      1958        
## 1304               1856-1939.       1915        r      1967    1915
## 1305                                1968        s      1968        
## 1306                                1977        s      1977        
## 1307               1911-1976.       1974        s      1974        
## 1308               1911-1976.       1974        s      1974        
## 1309                                1962        s      1962        
## 1310                                1970        s      1970        
## 1311                 d. 1908.       1874        r      1968    1874
## 1312                                1970        s      1970        
## 1313                    1907-       1955        s      1955        
## 1314               1914-1988.       1967               1967        
## 1315                                1959        s      1959        
## 1316                    1883-       1971        s      1971    1917
## 1317                                1857        r      1974    1857
## 1318                    1912-       1964        c      1965    1964
## 1319               1908-1986.       1963        s      1963        
## 1320                                1975        s      1975        
## 1321               1887-1948.       1935        r      1969    1935
## 1322                    1909-       1968        s      1968        
## 1323               1776-1822.       1822        s      1971        
## 1324               1889-1950.       1934        r      1971    1934
## 1325                                1971        s      1971        
## 1326               1844-1912.       1902        r      1967    1902
## 1327                                1965        s      1965        
## 1328               1912-1953.       1953        s      1954        
## 1329                                1956        s      1956        
## 1330               1887-1961.       1927        r      1969    1927
## 1331               1888-1919.       1919        s      1968        
## 1332               1805-1875.       1875        s      1966        
## 1333               1782-1870.       1853        r      1968    1853
## 1334                                1966        s      1966        
## 1335                                1972        c      1973    1972
## 1336                                1972        s      1972        
## 1337                                1974        s      1974        
## 1338                    1905-       1952        c      1952        
## 1339                    1923-       1974        s      1974        
## 1340                    1921-       1966        s      1966        
## 1341                    1918-       1967        s      1967        
## 1342               1828-1910.       1910               1962        
## 1343               1828-1910.       1910        c      1972    1962
## 1344               1713-1768.       1768        c      1960    1940
## 1345                                1982        s      1982        
## 1346                    1909-       1987        s      1987        
## 1347                                1980        r      1980        
## 1348                    1929-       1964        c      1974    1964
## 1349                                1989        s      1989        
## 1350               1905-1984.       1984        s      1988        
## 1351               1905-1984.       1984        s      1988        
## 1352                                1985        s      1985        
## 1353                                1965        s      1965        
## 1354               1822-1896.       1896        r      1975    1959
## 1355               1844-1901.       1901        s      1985        
## 1356               1904-1991.       1982        s      1982        
## 1357               1892-1962.       1931        r      1970    1931
## 1358                                1962        s      1962        
## 1359                                1963        c      1964    1963
## 1360               1828-1910.       1910        |      1966    ||||
## 1361                                1979        s      1979        
## 1362               1840-1902.       1902        r      1968    1961
## 1363              1780?-1849.       1849        s      1954        
## 1364               1862-1937.       1937        s      1957        
## 1365                    1948-       1977        s      1977        
## 1366              1880?-1970.       1970        r      1975        
## 1367               1911-1983.       1954        s      1954        
## 1368               1805-1875.       1875        s      1974        
## 1369               1898-1970.       1958        s      1958        
## 1370               1880-1942.       1942        m      1953    9999
## 1371               1880-1942.       1942        m      1953    9999
## 1372               1828-1910.       1910        s      1958        
## 1373               1805-1868.       1868        s      1968        
## 1374               1805-1868.       1868        s      1968        
## 1375                                1974        s      1974        
## 1376               1918-2007.       1974        s      1974        
## 1377                    1927-       1976        r      1976        
## 1378                                1964        s      1964        
## 1379               1875-1955.       1955        s      1955        
## 1380                                1971        s      1971        
## 1381               1932-2001.       1960        c      1971    1960
## 1382               1912-2001.       1962        s      1962        
## 1383                    1938-       1964        c      1965    1964
## 1384               1880-1942.       1942        m      1953    9999
## 1385               1819-1880.       1880        s      1962        
## 1386                    1903-       1963        s      1963        
## 1387               1875-1955.       1955        s      1955        
## 1388                    1937-       1975        r      1975        
## 1389               1871-1945.       1945        s      1974        
## 1390              1894-1939.        1931        c      1982    1931
## 1391               1903-1989.       1976        s      1976        
## 1392               1929-2009.       1980        s      1980        
## 1393               1913-1984.       1978        s      1978        
## 1394                                1977        s      1977        
## 1395                                1976        s      1976        
## 1396                                1981        s      1981        
## 1397                                1957        s      1957        
## 1398                                1981        s      1981        
## 1399                                1981        s      1981        
## 1400               1893-1981.       1959        s      1959        
## 1401               1929-1945.       1945        s      1967        
## 1402                                1959        c      1968    1959
## 1403                                1982        s      1982        
## 1404               1880-1942.       1942        s      1966        
## 1405               1883-1924.       1924        s      1956        
## 1406               1903-1966.       1966        |      1966    ||||
## 1407               1905-1980.       1950        s      1950        
## 1408               1902-2000.       1971        s      1971        
## 1409                                1962        s      1962    1964
## 1410               1904-1980.       1956        s      1956        
## 1411                    1934-       1977        s      1977        
## 1412                    1921-       1957        s      1957        
## 1413                                1966        c      1967    1966
## 1414               1538-1612.       1964        s      1964        
## 1415               1885-1959.       1959        s      1959        
## 1416                                1979        s      1979        
## 1417                                1967        s      1967        
## 1418                                1958        s      1958        
## 1419                                1955        s      1955        
## 1420                                1975        s      1975        
## 1421               1856-1935.       1884        r      1978    1884
## 1422                                1974        s      1974        
## 1423                    1930-       1976        s      1976        
## 1424                    1922-       1963        s      1963        
## 1425                                1966        s      1966        
## 1426               1911-1983.       1956        s      1956        
## 1427               1911-1968.       1968        s      1970        
## 1428               1895-1982.       1926        r      1970    1926
## 1429               1926-2011.       1979        s      1979        
## 1430                                1963        s      1963        
## 1431                                1973        s      1973        
## 1432                                1975        s      1975        
## 1433                                1965        s      1965        
## 1434                                1979        s      1979        
## 1435               1809-1849.       1849        s      1965        
## 1436               1809-1849.       1843        r      1968    1843
## 1437                                1966        c      1973    1966
## 1438                                1982        s      1982        
## 1439                                1969        s      1969        
## 1440                                1956        s      1956        
## 1441                                1968        s      1968        
## 1442               1889-1961.       1952        s      1952        
## 1443               1905-1970.       1967        s      1967        
## 1444               1905-1970.       1969        s      1969        
## 1445                                1951        s      1951        
## 1446               1901-1970.       1970        s      1973        
## 1447                                1956        s      1956        
## 1448               1912-1990.       1966        s      1966        
## 1449               1889-1963.       1963        s      1966        
## 1450               1868-1936.       1936        s      1959        
## 1451               1909-1983.       1979        s      1979        
## 1452                                1979        s      1979        
## 1453               1906-1989.       1956        s      1956        
## 1454               1903-1990.       1951        s      1951        
## 1455               1840-1902.       1902        s      1968        
## 1456                                1974        s      1974        
## 1457               1821-1881.       1881        s      1960        
## 1458               1925-1995.       1961        s      1961        
## 1459               1926-1995.       1957        s      1957        
## 1460                                1972        s      1972        
## 1461                                1973        s      1973        
## 1462               1899-1977.       1966        t      1970    1966
## 1463                                1969        c      1970    1969
## 1464               1903-1989.       1978        s      1978        
## 1465               1926-1962.       1960        s      1960        
## 1466               1913-1960.       1958        s      1958        
## 1467               1932-2002.       1980        s      1980        
## 1468               1931-2003.       1980        s      1980        
## 1469               1903-1950.       1950        s      1954        
## 1470                                1968        s      1968        
## 1471               1905-1970.       1955        s      1955        
## 1472               1903-1995.       1962        s      1962        
## 1473               1923-2009.       1970        s      1970        
## 1474               1927-2001.       1964        s      1964        
## 1475               1920-1999.       1969        s      1969        
## 1476               1920-1999.       1955        s      1955        
## 1477               1911-1995.       1958        s      1958        
## 1478                    1920-       1957        s      1957        
## 1479               1857-1903.       1903        s      1974        
## 1480               1857-1903.       1903        s      1969        
## 1481                                1957        s      1957        
## 1482               1880-1970.       1979        s      1979        
## 1483               1927-2001.       1967        s      1967        
## 1484                                1973        s      1973        
## 1485                    1921-       1968        s      1968        
## 1486                                1968        r      1968        
## 1487                    1933-       1967        s      1967        
## 1488               1880-1969.       1969        s      1981        
## 1489                    1912-       1954        s      1954        
## 1490                1923-1996       1959        c      1960    1959
## 1491               1921-1966.       1960        s      1960        
## 1492                    1930-       1978        s      1978        
## 1493                                1815        r      1977    1815
## 1494                                1981        s      1981        
## 1495               1749-1806.       1806        s      1969        
## 1496                                1976        s      1976        
## 1497                                1956        s      1956        
## 1498                    1926-       1959        s      1959        
## 1499                                1962        s      1962        
## 1500                                1970        s      1970        
## 1501                    1923-       1978        s      1978        
## 1502               1921-1966.       1964        s      1964        
## 1503                    1935-       1974        s      1974        
## 1504                    1935-       1967        s      1967        
## 1505                    1927-       1978        s      1978        
## 1506               1904-1991.       1970        m      1970    9999
## 1507               1799-1850.       1850        s      1957        
## 1508               1904-1991.       1948        c      1957    1948
## 1509               1904-1991.       1962        s      1962        
## 1510               1904-1991.       1952        s      1952        
## 1511               1904-1991.       1980        s      1980        
## 1512               1904-1991.       1970        m      1970    9999
## 1513               1904-1991.       1970        m      1970    9999
## 1514               1904-1991.       1969        s      1969        
## 1515                                1975        s      1975        
## 1516                                1978        s      1978        
## 1517               1919-1980.       1966        s      1966        
## 1518               1879-1948.       1948        |      1966    ||||
## 1519               1879-1948.       1948        s      1971        
## 1520               1879-1948.       1948        s      1965        
## 1521                    1899-       1978        s      1978        
## 1522               1879-1948.       1948        s      1971        
## 1523               1925-1988.       1968        s      1968        
## 1524                    1947-       1980        s      1980        
## 1525               1926-2001.       1971        s      1971        
## 1526                                1979        s      1979        
## 1527               1926-2010.       1968        s      1968        
## 1528                                1968        s      1968        
## 1529               1922-2002.       1967        s      1967        
## 1530                                1981        s      1981        
## 1531                                1979        s      1979        
## 1532               1890-1974.       1968        s      1968        
## 1533                    1921-       1967        s      1967        
## 1534                                1978        s      1978        
## 1535                    1934-       1979        s      1979        
## 1536                1927-2011       1969        c      1970    1969
## 1537                1927-2011       1975        s      1975        
## 1538                    1922-       1964        s      1964        
## 1539                1927-2011       1977        s      1977        
## 1540                                1982        s      1982        
## 1541                1910-1987       1954        s      1954        
## 1542                    1936-       1968        s      1968        
## 1543                                1958        s      1958        
## 1544                    1899-       1953        s      1953        
## 1545               1845-1913.       1886        r      1978    1886
## 1546               1912-1996.       1969        c      1970    1969
## 1547               1912-1996.       1961        s      1961        
## 1548               1912-1996.       1959        s      1959        
## 1549               1925-1993.       1972        s      1972        
## 1550               1925-1993.       1970        s      1970        
## 1551                                1964        s      1964        
## 1552               1867-1922.       1922        s      1964        
## 1553               1867-1922.       1922        s      1966        
## 1554                    1933-       1965        s      1965        
## 1555               1914-1998.       1964        s      1964        
## 1556               1864-1927.       1896        r      1975    1896
## 1557                                1960        s      1960        
## 1558                    1919-       1964        s      1964        
## 1559                    1925-       1974        s      1974        
## 1560               1907-2001.       1960        s      1960        
## 1561               1814-1873.       1873        r      1978    1880
## 1562               1925-1998.       1979        s      1979        
## 1563                                1973        s      1973        
## 1564               1819-1898.       1898        s      1964        
## 1565                    1927-       1961        s      1961        
## 1566               1815-1882.       1882        |      1973    ||||
## 1567                    1944-       1972        s      1972        
## 1568                                1974        s      1974        
## 1569                    1919-       1957        s      1957        
## 1570               1925-1997.       1967        s      1967        
## 1571                                1976        r      1976        
## 1572                                1979        r      1979        
## 1573                                1967        s      1967        
## 1574                    1924-       1981        s      1981        
## 1575                                1963        s      1963        
## 1576                    1909-       1960        c      1975    1960
## 1577               1903-1951.       1951        s      1979        
## 1578               1910-1982.       1974        s      1974        
## 1579               1809-1852.       1852        s      1962        
## 1580               1910-1982.       1967        s      1967        
## 1581               1912-1996.       1977        s      1977        
## 1582               1862-1937.       1937        s      1958        
## 1583               1928-1970.       1970        s      1978        
## 1584               1903-1950.       1950        s      1954        
## 1585                                1964        c      1967    1964
## 1586                                1957        s      1957        
## 1587               1906-1977.       1950        s      1950        
## 1588                                1974        s      1974        
## 1589               1815-1882.       1882        s      1973    ||||
## 1590               1899-1977.       1959        s      1959        
## 1591                    1908-       1975        r      1975        
## 1592                                1966        s      1966        
## 1593               1888-1957.       1957        s      1958        
## 1594               1908-1979.       1965        s      1965        
## 1595               1917-1985.       1966        s      1966        
## 1596                                1965        s      1965        
## 1597                                1979        s      1979        
## 1598                                1962        c      1973    1962
## 1599               1922-2004.       1963        s      1963        
## 1600                                1968        s      1968        
## 1601                                1976        s      1976        
## 1602                    1908-       1966        n      1966        
## 1603               1818-1883.       1883        s      1977        
## 1604                    1901-       1955        s      1955        
## 1605               1864-1946.       1946        s      1970        
## 1606                                1956        s      1956        
## 1607                    1896-       1979        s      1979        
## 1608               1905-1983.       1956        s      1956        
## 1609                    1928-       1973        s      1973        
## 1610               1857-1924.       1924        c      1954    1947
## 1611               1876-1916.       1916        s      1957        
## 1612               1920-1992.       1952        q      1952    1969
## 1613                                1981        s      1981        
## 1614                    1927-       1981        s      1981        
## 1615                    1934-       1980        s      1980        
## 1616               1897-1970.       1970        s      1981        
## 1617               1898-1956.       1956        s      1981        
## 1618                                1981        s      1981        
## 1619                                1980        s      1980        
## 1620                                1981        s      1981        
## 1621               1903-1966.       1966        s      1981        
## 1622               1875-1940.       1940        m      1980    9999
## 1623                    1923-       1980        s      1980        
## 1624                                1980        r      1980        
## 1625                                1981        s      1981        
## 1626                                1980        s      1980        
## 1627                                1972        s      1972        
## 1628               1937-2015.       1981        s      1981        
## 1629                                1981        s      1981        
## 1630                    1939-       1980        s      1980        
## 1631                                1981        s      1981        
## 1632               1898-1956.       1956        s      1979        
## 1633                                1972        s      1972        
## 1634               1913-1992.       1960        s      1960        
## 1635                                1978        r      1978        
## 1636                    1943-       1969        s      1969        
## 1637                                1984        s      1984        
## 1638               1860-1904.       1904        s      1982        
## 1639               1867-1905.       1905        s      1982        
## 1640                    1935-       1965        r      1980    1965
## 1641               1923-1996.       1982        s      1982        
## 1642                                1980        s      1980        
## 1643                                1982        s      1982        
## 1644                                1982        s      1982        
## 1645               1878-1956.       1956        s      1982        
## 1646               1897-1999.       1982        s      1982        
## 1647               1901-1985.       1982        s      1982        
## 1648               1862-1937.       1937        s      1960        
## 1649               1862-1937.       1937        s      1956        
## 1650               1799-1850.       1850        s      1957        
## 1651               1628-1703.       1703        s      1961        
## 1652               1811-1896.       1896        s      1961        
## 1653                    1921-       1979        s      1979        
## 1654                 778-897.       1978        s      1978        
## 1655               1890-1938.       1938        s      1964        
## 1656               1828-1905.       1905        s      1956        
## 1657               1860-1904.       1904        s      1968        
## 1658                    1911-       1970        s      1970        
## 1659               1912-1989.       1955        s      1955        
## 1660               1902-1968.       1945        r      1966    1945
## 1661                                1980        s      1980        
## 1662               1884-1937.       1937        s      1978        
## 1663               1909-1994.       1968        s      1968        
## 1664                    1931-       1970        s      1970        
## 1665               1895-1982.       1954        c      1960    1954
## 1666                                1973        s      1973        
## 1667               1910-1998.       1979        s      1979        
## 1668                    1904-       1974        s      1974        
## 1669                                1955        s      1955        
## 1670                    1942-       1970        s      1970        
## 1671               1904-1984.       1960        s      1960        
## 1672                    1937-       1982        s      1982        
## 1673                                1962        s      1962        
## 1674               1880-1942.       1942        m      1965    9999
## 1675               1892-1955.       1953        s      1953        
## 1676               1862-1931.       1931        s      1974        
## 1677               1904-1966.       1966        r      1976        
## 1678                                1977        s      1977        
## 1679               1783-1842.       1842        s      1955        
## 1680                                1968        s      1968        
## 1681               1857-1909.       1909        s      1952        
## 1682                                1975        s      1975        
## 1683                    1911-       1979        s      1979        
## 1684               1881-1936.       1936        s      1980        
## 1685                    1927-       1963        s      1963        
## 1686              1892?-1980.       1962        s      1962        
## 1687                                1964        s      1964        
## 1688               1849-1909.       1909        s      1962        
## 1689               1871-1922.       1922        s      1981        
## 1690               1871-1922.       1922        s      1981        
## 1691               1912-1990.       1964        s      1964        
## 1692                    1938-       1971        s      1971        
## 1693                    1936-       1958        s      1958        
## 1694                                1983        s      1983        
## 1695                                1819        r      1981    1819
## 1696               1897-1989.       1963        s      1963        
## 1697                                1983        s      1983        
## 1698               1910-2002.       1983        s      1983        
## 1699               1909-1984.       1983        s      1983        
## 1700                                1978        r      1983    1978
## 1701                    1930-       1983        s      1983        
## 1702                    1935-       1983        s      1983        
## 1703               1923-2007.       1983        s      1983        
## 1704               1911-2007.       1983        s      1983        
## 1705               1919-1989.       1981        s      1981        
## 1706                                1983        s      1983        
## 1707                    1930-       1983        s      1983        
## 1708                                1983        s      1983        
## 1709               1927-1979.       1979        s      1983        
## 1710               1887-1960.       1960        s      1972        
## 1711               1923-2007.       1972        s      1972        
## 1712                    1945-       1974        s      1974        
## 1713                    1934-       1974        s      1974        
## 1714                                1979        s      1979        
## 1715                                1978        s      1978        
## 1716               1843-1916.       1916        m      1961    9999
## 1717               1828-1910.       1910        s      1950        
## 1718               1898-1997.       1965        |      1965    ||||
## 1719               1895-1958.       1958        s      1962        
## 1720                                1979        s      1979        
## 1721                                1982        s      1982        
## 1722               1869-1951.       1951        s      1958        
## 1723                                1963        s      1963        
## 1724                                1977        c      1978    1977
## 1725                                1974        r      1975    1974
## 1726               1926-1997.       1975        s      1975        
## 1727               1904-1983.       1980        s      1980        
## 1728                                1960        c      1963    1960
## 1729               1906-2001.       1967        s      1967        
## 1730                    1926-       1980        s      1980        
## 1731               1909-1984.       1952        c      1973    1952
## 1732               1881-1936.       1936        s      1960        
## 1733               1873-1954.       1954        s      1964        
## 1734               1873-1954.       1954        s      1960        
## 1735               1906-2001.       1976        s      1976        
## 1736               1922-2008.       1958        c      1958        
## 1737               1883-1957.       1952        c      1953    1952
## 1738                                1969        s      1969        
## 1739                    1927-       1961        s      1961        
## 1740                                1958        s      1958        
## 1741               1881-1936.       1936        s      1972        
## 1742               1875-1955.       1955        s      1961        
## 1743               1912-1990.       1941        r      1962    1941
## 1744                    1931-       1979        s      1979        
## 1745               1893-1944.       1944        s      1969        
## 1746               1907-1990.       1951        s      1951        
## 1747               1915-1983.       1952        s      1952        
## 1748                                1950        r      1961    1950
## 1749                                1968        s      1968        
## 1750                                1970        s      1970        
## 1751               1926-2001.       1972        s      1972        
## 1752               1926-2001.       1979        s      1979        
## 1753                    1929-       1972        s      1972        
## 1754               1916-1999.       1979        s      1979        
## 1755               1911-2006.       1966        s      1966        
## 1756               1903-1977.       1959        s      1959    9999
## 1757                                1967        s      1967        
## 1758                                1973        s      1973        
## 1759               1868-1936.       1936        c      1973    1939
## 1760                    1939-       1980        s      1980        
## 1761               1925-2012.       1981        s      1981        
## 1762               1860-1932.       1932        s      1974        
## 1763               1883-1924.       1924        c      1960    1956
## 1764               1904-1989.       1944        c      1974    1944
## 1765               1933-1991.       1968        s      1968        
## 1766               1903-1977.       1963        s      1963        
## 1767               1903-1977.       1971        s      1971        
## 1768               1911-1993.       1955        r      1955        
## 1769               1908-1966.       1952        s      1952        
## 1770               1917-1979.       1954        s      1954        
## 1771                                1960        s      1960        
## 1772               1896-1957.       1957        s      1960        
## 1773                                1916        r      1971    1916
## 1774               1914-1997.       1975        s      1975        
## 1775               1828-1910.       1904        r      1968    1904
## 1776               1867-1936.       1936        s      1965        
## 1777               1894-1962.       1961        s      1961        
## 1778               1925-2012.       1965        s      1965        
## 1779               1860-1904.       1904        s      1975        
## 1780               1911-1983.       1949        c      1950    1949
## 1781               1900-1944.       1944        s      1976        
## 1782               1910-1982.       1976        m      1976    9999
## 1783               1929-2008.       1973        s      1973        
## 1784               1841-1925.       1953        c      1963    1953
## 1785               1880-1942.       1942        s      1955        
## 1786                                1955        s      1955        
## 1787               1860-1904.       1904        s      1960        
## 1788               1929-2010.       1981        s      1981        
## 1789               1894-1963.       1950        s      1950        
## 1790                                1973        c      1974    1973
## 1791               1867-1916.       1916        s      1950        
## 1792                                1962        s      1962        
## 1793                                1982        s      1982        
## 1794               1867-1916.       1916        m      1972    1986
## 1795               1887-1961.       1961        c      1968    1966
## 1796               1926-2005.       1965        s      1965        
## 1797               1887-1961.       1961        s      1968        
## 1798                    1919-       1970        s      1970        
## 1799                                1979        s      1979        
## 1800               1892-1953.       1953        s      1975        
## 1801                                1960        s      1960        
## 1802                    1932-       1979        s      1979        
## 1803               1903-1950.       1950        s      1954        
## 1804                                1962        s      1962        
## 1805               1812-1870.       1870        s      1951        
## 1806               1895-1976,       1951        s      1951        
## 1807               1863-1923.       1923        s      1963        
## 1808                                1968        s      1968        
## 1809               1788-1857.       1857        s      1966        
## 1810               1871-1945.       1945        s      1956        
## 1811               1911-1983.       1968        s      1968        
## 1812                                1976        s      1976        
## 1813                    1933-       1981        s      1981        
## 1814               1906-1972.       1966        s      1966        
## 1815                    1929-       1980        s      1980        
## 1816                    1919-       1960        s      1960        
## 1817               1859-1916.       1916        s      1956        
## 1818                                1972        s      1972        
## 1819               1694-1778.       1778        s      1961        
## 1820                    1897-       1966        |      1966    ||||
## 1821                    1897-       1974        s      1974        
## 1822                    1897-       1965        |      1965    ||||
## 1823               1860-1904.       1904        q      1960    1969
## 1824               1874-1929.       1929        s      1952        
## 1825               1774-1843.       1843        s      1958        
## 1826                                1976        c      1977    1976
## 1827               1873-1954.       1954        s      1958        
## 1828               1924-1996.       1965        s      1965        
## 1829               1895-1976.       1961        s      1961        
## 1830               1904-1991.       1970        m      1970    9999
## 1831               1899-1994.       1931        c      1960    1931
## 1832               1883-1924.       1924        s      1963        
## 1833               1895-1977.       1970        m      1970    9999
## 1834                                1979        s      1979        
## 1835               1918-2008.       1968        s      1968        
## 1836                                1957        c      1964    1957
## 1837                  b. 978?       1973        s      1973        
## 1838                                1972        s      1972        
## 1839               1908-2004.       1973        s      1973        
## 1840                                1970        s      1970        
## 1841               1804-1864.       1864        m      1962    9999
## 1842               1804-1864.       1864        m      1962    9999
## 1843               1867-1933.       1933        s      1958        
## 1844               1927-2014.       1972        s      1972        
## 1845                                1973        s      1973        
## 1846               1931-2001.       1971        s      1971        
## 1847               1883-1924.       1924        c      1969    1954
## 1848    1140 or 41-1202 or 3.       1976        s      1976        
## 1849               1928-1970.       1970        s      1975        
## 1850               1916-1991.       1957        s      1957        
## 1851                                1973        s      1973        
## 1852               1873-1954.       1954        s      1958        
## 1853                    1919-       1958        s      1958        
## 1854                    1919-       1965        s      1965        
## 1855                    1919-       1972        s      1972        
## 1856                                1982        s      1982        
## 1857                    1892-       1972        s      1972        
## 1858                    1908-       1962        s      1962        
## 1859               1905-1981.       1959        s      1959        
## 1860                                1951        s      1951        
## 1861                                1962        s      1962        
## 1862                                1974        s      1974        
## 1863               1821-1881.       1881        s      1966        
## 1864               1891-1940.       1940        s      1967        
## 1865                                1971        s      1971        
## 1866               1313-1375.       1955        s      1955        
## 1867               1895-1981.       1956        s      1956        
## 1868                                1953        s      1953        
## 1869                                1953        r      1961    1953
## 1870               1881-1936.       1936        c      1971    1941
## 1871               1920-2003.       1980        s      1980        
## 1872                                1959        c      1971    1959
## 1873                                1971        c      1973    1971
## 1874               1815-1882.       1871        r      1978    1871
## 1875               1897-1937.       1937        s      1961        
## 1876               1906-1984.       1965        s      1965        
## 1877               1906-1984.       1969        s      1969        
## 1878                                1963        s      1963        
## 1879               1924-1996.       1967        r      1967        
## 1880                    1939-       1974        t      1975    1974
## 1881               1921-1995.       1975        r      1975        
## 1882               1907-1990.       1963        s      1963        
## 1883               1907-1990.       1975        s      1975        
## 1884                                1971        s      1971        
## 1885                                1975        s      1975        
## 1886                                1981        s      1981        
## 1887               1821-1881.       1881        s      1956        
## 1888               1906-1989.       1966        s      1966        
## 1889               1894-1961.       1961        s      1974        
## 1890                    1926-       1974        s      1974        
## 1891                                1980        s      1980        
## 1892                                1960        s      1960        
## 1893                                1976        s      1976        
## 1894               1908-2001.       1956        s      1956        
## 1895               1840-1928.       1928        s      1975        
## 1896                                1981        s      1981        
## 1897               1869-1951.       1951        s      1951        
## 1898               1875-1955.       1955        s      1964        
## 1899               1890-1948.       1948        c      1965    1956
## 1900               1809-1852.       1852        s      1962        
## 1901               1900-1938.       1938        s      1952        
## 1902                                1977        r      1977        
## 1903               1903-1951.       1951        s      1979        
## 1904               1903-1966.       1964        s      1964        
## 1905                                1968        s      1968        
## 1906                                1966        s      1966        
## 1907               1862-1903.       1903        s      1967        
## 1908                                1978        s      1978        
## 1909               1920-1978.       1964        s      1964        
## 1910                                1981        s      1981        
## 1911               1872-1963.       1963        s      1966        
## 1912               1872-1963.       1952        s      1952        
## 1913               1872-1963.       1961        s      1961        
## 1914               1905-2000.       1953        s      1953        
## 1915               1905-2000.       1962        s      1962        
## 1916               1905-2000.       1963        s      1963        
## 1917               1913-1987.       1957        |      1957    ||||
## 1918               1884-1969.       1950        s      1950        
## 1919               1884-1969.       1956        s      1956        
## 1920               1884-1969.       1959        s      1959        
## 1921               1884-1969.       1963        s      1963        
## 1922               1915-2001.       1959        s      1959        
## 1923                                1975        s      1975        
## 1924               1936-1973.       1969        s      1969        
## 1925 approximately 1490-1553?       1954        s      1954        
## 1926               1903-1994.       1953        s      1953        
## 1927               1764-1823.       1823        s      1968        
## 1928                                1981        s      1981        
## 1929               1689-1761.       1761        s      1972        
## 1930                                1981        s      1981        
## 1931                    1937-       1978        s      1978        
## 1932                    1924-       1956        s      1956        
## 1933                                1956        s      1956        
## 1934               1931-2001.       1966        s      1966        
## 1935               1890-1968.       1953        s      1953        
## 1936                    1894-       1976        s      1976        
## 1937             1940 Oct. 7-       1967        c      1967    1968
## 1938                                1975        s      1975        
## 1939                                1969        s      1969        
## 1940                                1960        s      1960        
## 1941                                1969        s      1969        
## 1942               1918-1980.       1958        s      1958        
## 1943               1918-1980.       1961        s      1961        
## 1944                                1968        s      1968        
## 1945               1930-1995.       1971        s      1971        
## 1946               1930-1995.       1980        s      1980        
## 1947               1887-1968.       1947        c      1957    1947
## 1948                    1932-       1976        s      1976        
## 1949                                1975        s      1975        
## 1950                                1972        c      1973    1972
## 1951                1929-1999       1974        s      1974        
## 1952               1860-1913.       1913        s      1958        
## 1953                                1968        s      1968        
## 1954                    1946-       1978        s      1978        
## 1955               1927-2007.       1972        s      1972        
## 1956                                1969        s      1969        
## 1957                                1973        s      1973        
## 1958                    1911-       1959        s      1959        
## 1959                                1970        c      1971    1970
## 1960                    1925-       1961        s      1961        
## 1961               1913-1980.       1965        s      1965        
## 1962                                1978        s      1978        
## 1963               1915-1965.       1955        s      1955        
## 1964               1913-2007.       1950        s      1950        
## 1965                    1965-       1969        s      1969        
## 1966                                1979        s      1979        
## 1967                    1927-       1971        s      1971        
## 1968               1909-1972.       1957        s      1957        
## 1969                    1933-       1965        s      1965        
## 1970                    1906-       1950        s      1950        
## 1971                    1912-       1960        s      1960        
## 1972                                1969        s      1969        
## 1973               1912-1995.       1955        s      1955        
## 1974                    1931-       1966        s      1966        
## 1975                    1931-       1959        s      1959        
## 1976               1895-1986.       1982        s      1982        
## 1977               1908-1981.       1953        s      1953        
## 1978               1912-1976.       1969        s      1969        
## 1979               1896-1966.       1960        s      1960        
## 1980               1896-1966.       1966        n      1968    1937
## 1981                    1937-       1971        s      1971        
## 1982                                1950        s      1950        
## 1983               1933-1982.       1979        s      1979        
## 1984                    1919-       1971        s      1971        
## 1985               1894-1961.       1961        s      1966        
## 1986               1920-2012.       1969        s      1969        
## 1987               1899-1965.       1965        s      1966        
## 1988                                1970        s      1970        
## 1989               1917-1985.       1978        s      1978        
## 1990               1886-1945.       1945        s      1969        
## 1991                                1964        s      1964        
## 1992               1849-1912.       1912        s      1967        
## 1993                                1978        r      1978        
## 1994               1819-1891.       1891        s      1954        
## 1995               1899-1972.       1959        s      1959        
## 1996                    1934-       1972        s      1972        
## 1997               1876-1938.       1938        s      1964        
## 1998               1828-1910.       1910        s      1957        
## 1999                                1977        s      1977        
## 2000                                1981        s      1981        
## 2001                                1969        s      1969        
## 2002                                1965        s      1965        
## 2003                                1963        s      1963        
## 2004                                1982        s      1982        
## 2005                    1919-       1973        s      1973        
## 2006               1892-1978.       1926        r      1974    1926
## 2007               1897-1962.       1962        s      1964        
## 2008               1897-1962.       1959        s      1959        
## 2009                                1953        c      1954    1953
## 2010               1782-1854.       1854        r      1968    1882
## 2011               1914-2003.       1956        s      1956        
## 2012               1897-1962.       1962        s      1973        
## 2013               1897-1962.       1962        s      1981        
## 2014               1897-1962.       1958        s      1958        
## 2015               1897-1962.       1957        s      1957        
## 2016                                1975        s      1975        
## 2017               1891-1983.       1952        s      1952        
## 2018                                1950        s      1950        
## 2019                                1968        s      1968        
## 2020                                1971        s      1971        
## 2021                                1967        s      1967        
## 2022                    1947-       1980        s      1980        
## 2023                                1968        s      1968        
## 2024               1909-1968.       1966        s      1966        
## 2025                    1915-       1956        c      1961    1956
## 2026                                1965        s      1965        
## 2027               1920-2012.       1976        s      1976        
## 2028               1921-1977.       1957        s      1957        
## 2029               1812-1885.       1885        s      1953        
## 2030                    1931-       1968        c      1974    1968
## 2031               1917-1985.       1970        s      1970        
## 2032               1907-1985.       1960        s      1960        
## 2033                    1928-       1959        r      1959        
## 2034                1903-2008       1963        s      1963        
## 2035               1803-1870.       1870        s      1966        
## 2036               1917-1985.       1955        s      1955        
## 2037                    1935-       1970        s      1970        
## 2038               1894-1961.       1961        s      1965        
## 2039               1896-1977.       1961        s      1961        
## 2040                                1970        s      1970        
## 2041                                1967        s      1967        
## 2042               1882-1949.       1930        c      1952    1930
## 2043                    1925-       1970        s      1970        
## 2044               1912-1981.       1963        s      1963        
## 2045                    1935-       1968        s      1968        
## 2046                    1925-       1974        s      1974        
## 2047                                1958        s      1958        
## 2048               1843-1916.       1916        s      1963        
## 2049                    1938-       1967        s      1967        
## 2050                    1938-       1979        s      1979        
## 2051               1868-1936.       1936        c      1950    1949
## 2052               1868-1936.       1936        s      1955        
## 2053               1868-1936.       1936        s      1956        
## 2054               1860-1904.       1904        q      1950    1959
## 2055               1860-1904.       1904        s      1950        
## 2056               1860-1904.       1904        r      1954    1949
## 2057                                1956        s      1956        
## 2058               1860-1904.       1904        m      1965    1980
## 2059               1818-1883.       1883        s      1962        
## 2060               1818-1883.       1883        s      1951        
## 2061                                1958        s      1958        
## 2062                    1903-       1957        s      1957        
## 2063               1886-1914.       1914        r      1973        
## 2064               1689-1761.       1761        s      1958        
## 2065                                1971        s      1971        
## 2066               1906-2001.       1958        s      1958        
## 2067               1909-1984.       1965        s      1965        
## 2068                    1930-       1968        s      1968        
## 2069               1913-1960.       1960        s      1972        
## 2070               1634-1693.       1979        s      1979        
## 2071                    1939-       1981        s      1981        
## 2072                                1953        s      1953        
## 2073                    1933-       1971        s      1971        
## 2074                                1963        s      1963        
## 2075                    1906-       1970        s      1970        
## 2076                                1974        c      1976    1974
## 2077               1898-1956.       1956        s      1981        
## 2078               1873-1939.       1939        s      1963        
## 2079               1873-1939.       1939        m      1962    9999
## 2080                                1980        s      1980        
## 2081                    1932-       1967        s      1967        
## 2082               1907-1971.       1951        s      1951        
## 2083               1899-1989.       1951        s      1951        
## 2084                    1944-       1978        s      1978        
## 2085                    1944-       1977        s      1977        
## 2086                    1942-       1980        s      1980        
## 2087                                1960        s      1960        
## 2088                                1963        s      1963        
## 2089                                1963        s      1963        
## 2090                    1938-       1979        r      1979        
## 2091                    1938-       1971        s      1971        
## 2092                                1977        s      1977        
## 2093               1914-2001.       1963        s      1963        
## 2094                                1972        s      1972        
## 2095                    1923-       1962        s      1962        
## 2096                    1930-       1973        s      1973        
## 2097               1933-1982.       1981        s      1981        
## 2098               1867-1933.       1933        s      1972        
## 2099               1926-2007.       1979        s      1979        
## 2100               1926-2007.       1970        s      1970        
## 2101                    1925-       1968        s      1968        
## 2102                                1982        s      1982        
## 2103               1907-1964.       1951        c      1952    1951
## 2104               1889-1967.       1922        r      1970    1922
## 2105               1908-1967.       1963        c      1964    1963
## 2106               1908-1967.       1960        c      1961    1960
## 2107                                1976        s      1976        
## 2108                                1981        s      1981        
## 2109               1856-1898.       1898        m      1969    9999
## 2110                    1927-       1964        s      1964        
## 2111                    1930-       1964        s      1964        
## 2112                    1930-       1966        s      1966        
## 2113               1886-1957.       1956        s      1956        
## 2114                                1965        s      1965        
## 2115               1940-2003.       1980        s      1980        
## 2116               1895-1981.       1963        s      1963        
## 2117               1931-2011.       1975        s      1975        
## 2118                                1960        s      1960        
## 2119                                1965        s      1965        
## 2120                                1952        s      1952        
## 2121                                1957        s      1957        
## 2122                                1953        s      1953        
## 2123               1912-1975.       1951        s      1951        
## 2124               1892-1981.       1966        s      1966        
## 2125                1929-2008       1959        s      1959        
## 2126                                1972        s      1972        
## 2127                                1973        s      1973        
## 2128               1892-1981.       1959        s      1959        
## 2129                    1913-       1975        n      1975        
## 2130                    1913-       1968        s      1968        
## 2131                    1913-       1962        s      1962        
## 2132               1877-1962.       1962        s      1969        
## 2133               1925-1970.       1968        s      1968        
## 2134               1877-1962.       1962        s      1969        
## 2135                                1980        s      1980        
## 2136               1843-1916.       1916        m      1961    9999
## 2137                                1975        s      1975        
## 2138                                1983        s      1983        
## 2139               1914-2002.       1971        c      1972    1971
## 2140                                1977        s      1977        
## 2141               1903-1966.       1965        s      1965        
## 2142               1818-1883.       1883        s      1970        
## 2143               1908-1941.       1941        s      1955        
## 2144               1887-1966.       1957        |      1957    ||||
## 2145               1863-1938.       1938        c      1956    1948
## 2146                                1962        c      1963    1962
## 2147               1899-1977.       1971        s      1971        
## 2148               1890-1960.       1958        s      1958        
## 2149               1924-1993.       1970        s      1970        
## 2150               1828-1910.       1910        s      1954        
## 2151               1910-1992.       1964        s      1964        
## 2152                                1953        r      1975    1953
## 2153                                1981        s      1981        
## 2154                                1967        s      1967        
## 2155                                1967        s      1967        
## 2156               1799-1837.       1837        s      1954        
## 2157               1812-1891.       1891        s      1960        
## 2158               1820-1881.       1881        s      1959        
## 2159               1883-1923.       1923        c      1974    1973
## 2160                                1976        c      1978    1976
## 2161                                1970        s      1970        
## 2162               1914-1993.       1977        s      1977        
## 2163                                1978        s      1978        
## 2164                                1965        s      1965        
## 2165                    1932-       1979        s      1979        
## 2166                                1976        s      1976        
## 2167               1918-2008.       1976        c      1977    1976
## 2168                                1954        s      1954        
## 2169                    1945-       1978        s      1978        
## 2170                    1895-       1979        s      1979        
## 2171               1895-1977.       1970        m      1970    9999
## 2172               1895-1977.       1970        m      1970    9999
## 2173                    1935-       1967        s      1967        
## 2174                                1976        s      1976        
## 2175                                1974        s      1974        
## 2176                    1938-       1970        s      1970        
## 2177               1907-1998.       1956        s      1956        
## 2178                    1924-       1959        s      1959        
## 2179                                1963        s      1963        
## 2180               1911-1993.       1956        s      1956        
## 2181                                1974        s      1974        
## 2182                    1934-       1979        s      1979        
## 2183                                1965        s      1965        
## 2184                    1915-       1955        c      1956    1955
## 2185                                1963        s      1963        
## 2186                                1963        s      1963        
## 2187                                1974        s      1974        
## 2188                                1961        s      1961        
## 2189                                1978        s      1978        
## 2190               1914-1997.       1974        s      1974        
## 2191                    1926-       1964        s      1964        
## 2192                                1970        s      1970        
## 2193               1894-1988.       1958        s      1958        
## 2194               1904-2005.       1958        s      1958        
## 2195                                1980        s      1980        
## 2196               1838-1889.       1889        s      1982        
## 2197               1903-1923.       1923        s      1968        
## 2198               1861-1928.       1928        s      1962        
## 2199               1926-2001.       1978        r      1978        
## 2200               1926-2001.       1974        r      1978    1974
## 2201               1926-2001.       1978        r      1978        
## 2202               1924-1996.       1973        r      1979    1973
## 2203                                1969        s      1969        
## 2204                                1959        s      1959        
## 2205               1909-1984.       1945        c      1967    1945
## 2206                    1933-       1969        c      1970    1969
## 2207               1835-1910.       1910        s      1950        
## 2208               1860-1935.       1935        s      1980        
## 2209               1875-1955.       1954        s      1954        
## 2210                                1956        s      1956        
## 2211               1840-1922.       1922        |      1953        
## 2212               1913-1960.       1960        c      1973    1972
## 2213               1840-1902.       1902        s      1955        
## 2214               1925-1970.       1956        s      1956        
## 2215                    1932-       1972        s      1972        
## 2216                                1975        r      1975        
## 2217               1741-1803.       1803        r      1979    1924
## 2218                                1975        s      1975        
## 2219               1899-1960.       1960        s      1967        
## 2220                                1968        s      1968        
## 2221               1873-1952.       1952        s      1979        
## 2222                                1982        s      1982        
## 2223               1916-1986.       1954        s      1954        
## 2224               1902-1968.       1963        s      1963        
## 2225               1915-1981.       1968        s      1968        
## 2226               1924-2003.       1976        s      1976        
## 2227               1925-1970.       1963        s      1963        
## 2228               1910-1992.       1980        r      1980    1980
## 2229               1814-1841.       1841        s      1957        
## 2230               1908-1986.       1974        s      1974        
## 2231                                1963        s      1963        
## 2232                    1929-       1975        s      1975        
## 2233               1843-1916.       1916        m      1961    9999
## 2234               1904-1980.       1976        n      1976        
## 2235                                1975        s      1975        
## 2236                                1962        s      1962        
## 2237                                1971        s      1971        
## 2238               1891-1986.       1958        s      1958        
## 2239               1935-2012.       1972        s      1972        
## 2240               1909-1998.       1952        s      1952        
## 2241                    1928-       1972        s      1972        
## 2242               1873-1954.       1954        s      1971        
## 2243                                1960        s      1960        
## 2244                    1944-       1968        s      1968        
## 2245                    1915-       1966        c      1971    1966
## 2246               1828-1910.       1910        c      1963    1958
## 2247               1903-1966.       1966        s      1981        
## 2248               1880-1961.       1954        s      1954        
## 2249                                1974        r      1974        
## 2250           fl. 1618-1635.       1978        s      1978        
## 2251               1881-1936.       1936        s      1959        
## 2252               1819-1890.       1890        r      1970        
## 2253                    1934-       1978        s      1978        
## 2254                                1957        s      1957        
## 2255               1880-1961.       1961        s      1965        
## 2256               1891-1974.       1964        s      1964        
## 2257               1775-1817.       1817        c      1973    1958
## 2258               1926-2014.       1965        s      1965        
## 2259               1881-1954.       1954        s      1956        
## 2260                                1980        r      1980        
## 2261                    1932-       1981        s      1981        
## 2262                    1950-       1982        s      1982        
## 2263                                1967        s      1967        
## 2264               1843-1916.       1916        m      1961    9999
## 2265               1843-1916.       1916        m      1961    9999
## 2266                    1928-       1980        s      1980        
## 2267                    1928-       1966        s      1966        
## 2268               1918-2009.       1955        s      1955        
## 2269                                1976        s      1976        
## 2270               1808-1889.       1889        s      1964        
## 2271               1875-1940.       1940        m      1980    9999
## 2272               1852-1921.       1908        r      1976    1908
## 2273               1904-1980.       1979        s      1979        
## 2274               1911-1977.       1958        s      1958        
## 2275               1907-1990.       1971        s      1971        
## 2276               1907-1990.       1961        s      1961        
## 2277               1912-1999.       1962        c      1968    1962
## 2278                    1928-       1966        c      1967    1966
## 2279               1891-1974.       1958        s      1958        
## 2280               1891-1974.       1962        s      1962        
## 2281               1878-1947.       1947        s      1972        
## 2282                                1982        s      1982        
## 2283                    1921-       1966        s      1966        
## 2284               1580-1645.       1962        s      1962        
## 2285                                1983        s      1983        
## 2286               1934-1995.       1983        s      1983        
## 2287               1815-1882.       1882        m      1979    1983
## 2288                                1969        s      1969        
## 2289                                1979        r      1979        
## 2290                                1965        s      1965        
## 2291               1898-1947.       1947        s      1974        
## 2292                    1910-       1952        s      1952        
## 2293               1880-1918.       1918        s      1967        
## 2294               1908-1986.       1982        s      1982        
## 2295                                1960        s      1960        
## 2296               1876-1916.       1916        s      1963        
## 2297               1843-1920.       1920        s      1963        
## 2298                                1971        s      1971        
## 2299                                1975        s      1975        
## 2300               1914-2003.       1950        r      1971    1950
## 2301                                1967        s      1967        
## 2302                                1984        s      1984        
## 2303               1903-1977.       1974        s      1974        
## 2304                                1971        s      1971        
## 2305                                1973        r      1973        
## 2306                    1944-       1982        s      1982        
## 2307                                1956        s      1956    ||||
## 2308               1885-1970.       1967        s      1967        
## 2309               1885-1970.       1946        c      1959    1946
## 2310               1850-1893.       1893        s      1955        
## 2311               1916-1992.       1950        c      1966    1950
## 2312               1885-1972.       1972        s      1973        
## 2313                                1958        c      1959    1958
## 2314                                1974        s      1974        
## 2315               1918-2007.       1976        s      1976        
## 2316               1908-1998.       1954        s      1954        
## 2317               1907-1998.       1973        s      1973        
## 2318               1912-2001.       1979        r      1979        
## 2319                    1927-       1968        s      1968        
## 2320               1926-2001.       1971        s      1971        
## 2321               1802-1885.       1885        s      1961        
## 2322                                1969        s      1969        
## 2323               1899-1966.       1966        s      1981        
## 2324                   1899-        1944        c      1968    1944
## 2325                   1899-        1975        r      1975        
## 2326               1908-1988.       1974        r      1974        
## 2327               1903-1966.       1958        s      1958        
## 2328               1929-1945.       1945        s      1954        
## 2329                                1965        s      1965        
## 2330                    1928-       1970        s      1970        
## 2331                    1933-       1965        s      1965        
## 2332               1313-1375.       1955        s      1955        
## 2333               1313-1375.       1955        s      1955        
## 2334               1903-1989.       1977        r      1977        
## 2335               1903-1989.       1968        s      1968        
## 2336               1903-1989.       1975        s      1975        
## 2337                    1940-       1971        s      1971        
## 2338               1940-1989.       1982        s      1982        
## 2339               1898-1956.       1956        s      1983        
## 2340               1828-1905.       1905        s      1960        
## 2341                                1940        c      1978    1940
## 2342               1906-2001.       1983        s      1983        
## 2343               1929-2008.       1966        s      1966        
## 2344                                1970        s      1970        
## 2345                                1963        s      1963        
## 2346                                1981        s      1981        
## 2347               1869-1941.       1941        s      1963        
## 2348               1927-1982.       1965        s      1965        
## 2349               1873-1956.       1929        r      1961    1929
## 2350                                1962        s      1962        
## 2351               1869-1951.       1951        s      1970        
## 2352               1915-1998.       1966        s      1966        
## 2353               1909-1983.       1957        s      1957        
## 2354                                1978        s      1978        
## 2355                                1978        s      1978        
## 2356                    1942-       1977        s      1977        
## 2357               1869-1951.       1951        s      1953        
## 2358               1920-1994.       1959        s      1959        
## 2359               1901-1976.       1968        s      1968        
## 2360                                1960        s      1960        
## 2361                                1982        s      1982        
## 2362               1918-2007.       1976        s      1976        
## 2363               1890-1938.       1930        r      1970    1930
## 2364               1917-1985.       1975        s      1975        
## 2365               1932-2003.       1982        s      1982        
## 2366               1918-2008.       1963        s      1963        
## 2367               1825-1898.       1898        s      1977        
## 2368               1843-1920.       1920        s      1973        
## 2369               1913-1995.       1971        s      1971        
## 2370                    1917-       1966        s      1966        
## 2371               1843-1916.       1916        m      1961    9999
## 2372               1890-1960.       1958        s      1958        
## 2373                                1968        s      1968        
## 2374               1788-1857.       1857        s      1955        
## 2375                    1928-       1981        s      1981        
## 2376               1903-1923.       1923        s      1952        
## 2377               1895-1958.       1958        s      1963        
## 2378               1809-1852.       1852        s      1957        
## 2379                                1978        s      1978        
## 2380                    1905-       1970        s      1970        
## 2381                                1974        |      1974    ||||
## 2382               1923-2007.       1974        c      1976    1974
## 2383               1864-1936.       1936        r      1973        
## 2384                                1965        s      1965        
## 2385                                1967        s      1967        
## 2386                                1972        s      1972        
## 2387               1780-1824.       1818        r      1978    1818
## 2388               1921-1947.       1947        s      1973        
## 2389               1913-1984.       1965        s      1965        
## 2390               1918-2008.       1968        s      1968        
## 2391               1893-1974.       1930        c      1968    1930
## 2392               1908-1981.       1957        s      1957        
## 2393                                1960        s      1960        
## 2394               1910-1971.       1971        s      1974        
## 2395               1905-1973.       1973        r      1977        
## 2396                                1980        s      1980        
## 2397                                1956        s      1956        
## 2398               1740-1814.       1814        s      1963        
## 2399                    1930-       1971        s      1971        
## 2400               1869-1951.       1951        n      1956        
## 2401               1880-1957.       1948        c      1970    1948
## 2402               1918-2008.       1969        s      1969        
## 2403               1860-1904.       1904        s      1950        
## 2404                                1982        s      1982        
## 2405               1903-1989.       1967        s      1967        
## 2406               1909-1955.       1955        s      1957        
## 2407               1918-1986.       1959        s      1959        
## 2408               1912-1999.       1975        s      1975        
## 2409               1913-1982.       1980        s      1980        
## 2410               1903-1976.       1976        s      1977        
## 2411                    1934-       1975        s      1975        
## 2412               1882-1944.       1944        s      1972        
## 2413               1902-1971.       1951        s      1951        
## 2414                    1939-       1979        s      1979        
## 2415               1922-2005.       1981        s      1981        
## 2416               1905-2004.       1960        s      1960        
## 2417                                1976        r      1976        
## 2418               1912-1999.       1976        s      1976        
## 2419                    1939-       1974        s      1974        
## 2420               1912-1999.       1974        s      1974        
## 2421                    1941-       1978        s      1978        
## 2422               1907-1972.       1970        s      1970        
## 2423               1883-1957.       1957        s      1975        
## 2424               1908-1986.       1982        s      1982        
## 2425               1819-1890.       1890        s      1982        
## 2426                    1935-       1973        s      1973        
## 2427                    1935-       1972        s      1972        
## 2428                                1977        s      1977        
## 2429               1922-2008.       1965        s      1965        
## 2430               1877-1962.       1962        s      1973        
## 2431               1785-1873.       1873        s      1956        
## 2432               1891-1974.       1958        s      1958        
## 2433               1891-1974.       1964        s      1964        
## 2434                    1928-       1972        s      1972        
## 2435               1785-1873.       1873        c      1961    1951
## 2436           1665-ca. 1712.       1712        s      1962        
## 2437               1877-1962.       1956        s      1956        
## 2438                                1980        s      1980        
## 2439               1935-2004.       1968        s      1968        
## 2440                                1971        s      1971        
## 2441               1821-1881.       1881        s      1982        
## 2442               1908-2000.       1977        s      1977        
## 2443               1828-1905.       1905        s      1961        
## 2444               1821-1881.       1881        s      1950        
## 2445               1870-1953.       1953        s      1958        
## 2446               1819-1890.       1890        s      1974        
## 2447               1864-1941.       1941        s      1967        
## 2448               1910-1993.       1968        s      1968        
## 2449               1909-1981.       1947        c      1968    1947
## 2450               1849-1912.       1912        s      1967        
## 2451               1899-1972.       1969        s      1969        
## 2452                                1963        s      1963        
## 2453               1922-2008.       1966        s      1966        
## 2454               1905-2000.       1957        s      1957        
## 2455               1941-2005.       1964        s      1964        
## 2456               1926-2014.       1981        s      1981        
## 2457               1828-1905.       1905        s      1960        
## 2458               1828-1905.       1905        s      1960        
## 2459                    1925-       1982        s      1982        
## 2460                                1972        c      1973    1972
## 2461               1910-1998.       1965        s      1965        
## 2462               1902-1967.       1958        s      1958        
## 2463               1860-1904.       1904        s      1956        
## 2464                                1963        s      1963        
## 2465                    1938-       1975        s      1975        
## 2466               1906-1989.       1934        r      1970    1934
## 2467               1776-1822.       1822        s      1982        
## 2468               1910-1998.       1949        c      1971    1949
## 2469               1922-2012.       1968        s      1968        
## 2470               1907-1990.       1983        s      1983        
## 2471               1924-1993.       1966        s      1966        
## 2472                                1971        s      1971        
## 2473               1914-2002.       1960        s      1960        
## 2474                                1978        s      1978        
## 2475               1898-1973.       1951        s      1951        
## 2476               1867-1936.       1936        s      1964        
## 2477               1909-1983.       1965        s      1965        
## 2478               1919-1989.       1982        s      1982        
## 2479               1574-1646.       1958        c      1959    1958
## 2480               1867-1936.       1936        s      1959        
## 2481               13th cent.       1960        s      1960        
## 2482               1898-1973.       1954        s      1954        
## 2483                                1974        s      1974        
## 2484               1793-1866.       1866        s      1972        
## 2485               1905-2000.       1975        n      1975        
## 2486               1871-1945.       1945        s      1956        
## 2487               1908-1979.       1951        s      1951        
## 2488               1908-1979.       1953        s      1953        
## 2489               1828-1910.       1910        s      1967        
## 2490               1934-1969.       1958        s      1958        
## 2491               1934-1969.       1960        s      1960        
## 2492               1926-1982.       1971        s      1971        
## 2493                    1922-       1978        s      1978        
## 2494                                1958        r      1968    1958
## 2495                                1975        s      1975        
## 2496               1914-2000.       1955        s      1955        
## 2497               1905-2000.       1955        s      1955        
## 2498                                1969        s      1969        
## 2499               1917-1985.       1954        s      1954        
## 2500               1845-1900.       1900        s      1967        
## 2501                    1939-       1972        s      1972        
## 2502                    1909-       1969        s      1969        
## 2503                                1935        c      1963    1935
## 2504               1835-1910.       1910        r      1972    1917
## 2505                    1898-       1960        s      1960        
## 2506                                1966        r      1977    1966
## 2507               1917-1985.       1970        s      1970        
## 2508                                1980        s      1980        
## 2509               1819-1898.       1898        s      1982        
## 2510               1927-2010.       1980        s      1980        
## 2511                    1920-       1982        s      1982        
## 2512               1850-1893.       1893        s      1955        
## 2513               1819-1898.       1898        s      1967        
## 2514                                1983        s      1983        
## 2515                                1857        r      1971    1857
## 2516               1821-1880.       1880        s      1950        
## 2517               1821-1881.       1881        s      1950        
## 2518                                1974        s      1974        
## 2519                                1974        s      1974        
## 2520               1898-1973.       1960        s      1960        
## 2521               1828-1905.       1905        s      1951        
## 2522                                1937        c      1968    1937
## 2523               1867-1916.       1916        r      1982    1971
## 2524                    1950-       1981        s      1981        
## 2525                                1959        s      1959        
## 2526                                1982        s      1982        
## 2527               1899-1960.       1960        s      1979        
## 2528                                1958        s      1958        
## 2529               1903-1989.       1972        s      1972        
## 2530               1903-1989.       1968        s      1968        
## 2531               1903-1989.       1964        s      1964        
## 2532               1903-1989.       1959        r      1964    1959
## 2533               1903-1989.       1975        s      1975        
## 2534               1905-1984.       1952        s      1952        
## 2535               1819-1898.       1898        s      1976        
## 2536               1877-1962.       1961        s      1961        
## 2537                    1929-       1979        r      1979        
## 2538                    1950-       1975        s      1975        
## 2539               1872-1943.       1943        s      1976        
## 2540               1880-1942.       1942        m      1953    9999
## 2541               1882-1941.       1941        s      1956        
## 2542               1876-1938.       1938        s      1963        
## 2543               1876-1938.       1938        s      1969        
## 2544                    1935-       1978        s      1978        
## 2545                                1962        s      1962        
## 2546              1814?-1884.       1884        s      1969        
## 2547               1883-1924.       1924        s      1954        
## 2548                                1964        s      1964        
## 2549                                1978        s      1978        
## 2550               1910-1998.       1970        s      1970        
## 2551               1905-1984.       1954        s      1954        
## 2552               1905-1984.       1951        s      1951        
## 2553               1818-1883.       1883        s      1967        
## 2554                                1979        s      1979        
## 2555               1885-1970.       1952        s      1952        
## 2556               1908-1991.       1961        s      1961        
## 2557               1912-1990.       1957        s      1957        
## 2558               1878-1957.       1957        s      1983        
## 2559                                1969        r      1976    1969
## 2560               1899-1972.       1972        s      1974        
## 2561                                1954        s      1954        
## 2562               1891-1980.       1939        c      1973    1939
## 2563               1901-1976.       1937        r      1968    1937
## 2564               1883-1924.       1924        s      1958        
## 2565               1810-1865.       1853        r      1975    1853
## 2566               1908-1998.       1959        s      1959        
## 2567               1885-1939.       1939        s      1977        
## 2568               1860-1904.       1904        s      1954        
## 2569               1843-1916.       1916        s      1983        
## 2570               1875-1961.       1965        s      1965        
## 2571                                1975        s      1975        
## 2572               1910-1967.       1959        c      1961    1959
## 2573               1847-1910.       1910        s      1964        
## 2574               1932-2001.       1980        s      1980        
## 2575                                1979        r      1979        
## 2576               1909-1955.       1954        s      1954        
## 2577               1909-1955.       1955        s      1979        
## 2578               1892-1927.       1927        s      1952        
## 2579                                1983        s      1983        
## 2580               1903-1989.       1954        s      1954        
## 2581               1871-1930.       1930        s      1981        
## 2582               1903-1990.       1961        s      1961        
## 2583               1912-1953.       1949        c      1950    1949
## 2584                                1983        s      1983        
## 2585               1892-1975.       1962        s      1962        
## 2586               1894-1961.       1930        c      1972    1930
## 2587               1906-1989.       1958        s      1958        
## 2588               1910-1967.       1963        c      1964    1963
## 2589               1802-1870.       1870        s      1966        
## 2590               1860-1904.       1904        m      1965    1980
## 2591               1860-1904.       1904        m      1965    1980
## 2592                    1927-       1975        s      1975        
## 2593               1900-1978.       1962        s      1962        
## 2594               1919-2005.       1981        s      1981        
## 2595               1860-1904.       1904        s      1982        
## 2596               1867-1916.       1916        s      1965        
## 2597               1922-2008.       1959        s      1959        
## 2598               1899-1972.       1972        s      1975        
## 2599               1912-1999.       1962        s      1962        
## 2600               1909-1955.       1955        s      1974        
## 2601               1896-1963.       1956        s      1956        
## 2602               1882-1945.       1945        s      1958        
## 2603                    1936-       1983        s      1983        
## 2604               1909-1983.       1960        s      1960        
## 2605               1909-1983.       1965        s      1965        
## 2606                                1983        s      1983        
## 2607                    1922-       1974        s      1974        
## 2608                    1922-       1967        s      1967        
## 2609               1914-2006.       1971        s      1971        
## 2610                    1943-       1971        s      1971        
## 2611                                1967        s      1967        
## 2612               1850-1894.       1894        s      1971        
## 2613               1861-1941.       1941        s      1971        
## 2614                                1982        s      1982        
## 2615               1871-1936.       1936        s      1971        
## 2616                                1973        s      1973        
## 2617               1892-1969.       1969        s      1977        
## 2618                                1969        s      1969        
## 2619                                1953        s      1953        
## 2620                                1973        s      1973        
## 2621                                1978        s      1978        
## 2622                                1971        s      1971        
## 2623               1901-1976.       1976        s      1976        
## 2624                                1975        s      1975        
## 2625               1883-1957.       1957        s      1982        
## 2626                                1978        s      1978        
## 2627               1925-2012.       1978        s      1978        
## 2628               1821-1881.       1881        s      1973        
## 2629               1895-1976.       1963        s      1963        
## 2630               1912-2001.       1965        s      1965        
## 2631               1886-1965.       1965        c      1983    1982
## 2632                                1979        r      1979        
## 2633               1920-2012.       1966        s      1966        
## 2634               1903-1989.       1971        s      1971        
## 2635               1924-1993.       1979        s      1979        
## 2636                                1969        s      1969        
## 2637               1891-1974.       1951        s      1951        
## 2638                    1939-       1972        s      1972        
## 2639               1902-1989.       1957        s      1957        
## 2640               1906-1989.       1959        s      1959        
## 2641                                1982        s      1982        
## 2642               1897-1962.       1962        s      1983        
## 2643               1920-1983.       1963        s      1963        
## 2644               1932-2001.       1978        s      1978        
## 2645               1888-1964.       1964        c      1973    1971
## 2646                                1983        s      1983        
## 2647                                1983        s      1983        
## 2648               1920-2003.       1984        s      1984        
## 2649                    1913-       1956        c      1963    1956
## 2650                                1980        s      1980        
## 2651               1807-1882.       1882        s      1965        
## 2652               1894-1938.       1938        s      1972        
## 2653                    1940-       1989        s      1989        
## 2654                    1915-       1951        s      1951        
## 2655               1934-1995.       1972        s      1972        
## 2656               1923-2012.       1974        s      1974        
## 2657                                1974        s      1974        
## 2658               1888-1970.       1970        s      1985        
## 2659               1590-1650.       1963        s      1963        
## 2660                                1964        s      1964        
## 2661                                1989        s      1989        
## 2662               1908-1966.       1966        s      1973        
## 2663               1930-1989.       1987        s      1987        
## 2664                    1935-       1988        s      1988        
## 2665               1903-1989.       1973        s      1973        
## 2666                 b. 1884.       1968        s      1968        
## 2667                                1958        s      1958        
## 2668               1892-1953.       1953        s      1979        
## 2669               1855-1920.       1920        s      1965        
## 2670               1883-1957.       1957        s      1960        
## 2671                    1928-       1979        s      1979        
## 2672               1840-1902.       1902        s      1956        
## 2673               1891-1974.       1953        s      1953        
## 2674               1872-1936.       1936        s      1972        
## 2675               1930-1989.       1973        r      1973        
## 2676               1902-1967.       1957        s      1957        
## 2677               1911-2006.       1973        s      1973        
## 2678                                1969        s      1969        
## 2679               1931-2008.       1964        s      1964        
## 2680               1897-1968.       1968        s      1983        
## 2681               1857-1924.       1924        s      1951        
## 2682               1885-1951.       1919        r      1970    1919
## 2683                                1980        s      1980        
## 2684                                1978        r      1978        
## 2685               1819-1891.       1891        s      1982        
## 2686               1828-1905.       1905        s      1968        
## 2687                    1928-       1962        s      1962        
## 2688                                1964        s      1964        
## 2689               1903-1990.       1957        s      1957        
## 2690               1903-1990.       1975        s      1975        
## 2691                                1984        s      1984        
## 2692                    1928-       1974        s      1974        
## 2693               1925-1999.       1978        c      1979    1978
## 2694               1910-1992.       1977        r      1977        
## 2695                                1973        s      1973        
## 2696               1873-1954.       1954        s      1956        
## 2697               1828-1910.       1910        s      1969        
## 2698                    1916-       1983        s      1983        
## 2699                                1976        s      1976        
## 2700               1904-2005.       1981        s      1981        
## 2701               1942-1999.       1981        s      1981        
## 2702               1942-1999.       1978        s      1978        
## 2703                    1933-       1972        s      1972        
## 2704               1895-1958.       1940        r      1973    1940
## 2705               1941-2006.       1979        s      1979        
## 2706                                1978        s      1978        
## 2707                                1964        s      1964        
## 2708               1840-1902.       1902        s      1954        
## 2709                                1967        s      1967        
## 2710               1903-1989.       1975        s      1975        
## 2711               1903-1989.       1975        s      1975        
## 2712               1903-1989.       1975        s      1975        
## 2713               1903-1989.       1950        c      1983    1950
## 2714                                1955        s      1955        
## 2715                    1938-       1978        r      1978        
## 2716               1901-1986.       1957        s      1957        
## 2717               1925-1999.       1970        s      1970        
## 2718               1908-1979.       1952        s      1952        
## 2719              1894-1939.        1939        s      1982        
## 2720                                1979        r      1979        
## 2721               1901-1964.       1964        s      1974        
## 2722               1835-1917.       1917        s      1956        
## 2723                                1972        s      1972        
## 2724               1903-1989.       1950        s      1950        
## 2725                                1971        s      1971        
## 2726               1890-1961.       1954        s      1954        
## 2727               1890-1961.       1957        s      1957        
## 2728               1883-1945.       1945        s      1956        
## 2729                                1970        s      1970        
## 2730               1935-2004.       1956        s      1956        
## 2731               1929-2010.       1983        s      1983        
## 2732               1869-1951.       1950        s      1950        
## 2733                    1931-       1960        c      1975    1960
## 2734               1921-1995.       1962        s      1962        
## 2735               1869-1951.       1951        s      1952        
## 2736                                1980        c      1981    1980
## 2737                                1973        s      1973        
## 2738                                1983        s      1983        
## 2739                                1980        s      1980        
## 2740                                1980        s      1980        
## 2741                                1978        c      1983    1978
## 2742                                1983        s      1983        
## 2743               1904-1996.       1984        r      1984        
## 2744                    1954-       1983        s      1983        
## 2745                    1935-       1983        s      1983        
## 2746               1871-1922.       1922        q      1950    1959
## 2747               1918-2008.       1963        s      1963        
## 2748                1902-1963       1963        s      1982        
## 2749                                1964        s      1964        
## 2750                                1974        m      1974    9999
## 2751               1919-2005.       1977        s      1977        
## 2752                                1978        s      1978        
## 2753               1903-1976.       1960        s      1960        
## 2754                                1984        c      1984        
## 2755               1920-2012.       1962        t      1963    1962
## 2756                                1979        s      1979        
## 2757               1867-1931.       1931        s      1983        
## 2758               1902-1980.       1980        s      1982        
## 2759               1913-1995.       1951        s      1951        
## 2760                 d. 1468.       1984        s      1984        
## 2761                                1960        s      1960        
## 2762               1901-1980.       1930        r      1983    1930
## 2763               1843-1916.       1916        m      1967    9999
## 2764               1815-1882.       1847        r      1979    1847
## 2765               1904-1991.       1966        s      1966        
## 2766                    1937-       1966        c      1967    1966
## 2767               1859-1916.       1916        s      1984        
## 2768               1920-1983.       1983        s      1984        
## 2769               1872-1956.       1956        r      1974        
## 2770               1904-2005.       1964        s      1964        
## 2771                                1984        s      1984        
## 2772               1901-1990.       1936        c      1983    1936
## 2773               1907-1990.       1956        s      1956        
## 2774               1809-1852.       1852        s      1957        
## 2775               1908-1986.       1976        r      1979    1976
## 2776               1931-1984.       1984        s      1984        
## 2777               1821-1881.       1881        s      1970        
## 2778               1903-1966.       1929        c      1958    1929
## 2779                    1915-       1956        s      1956        
## 2780                    1918-       1966        s      1966        
## 2781               1894-1954.       1954        r      1954        
## 2782                                1959        m      1959    1965
## 2783               1898-1970.       1957        s      1957        
## 2784                                1979        r      1979        
## 2785               1903-1989.       1970        s      1970        
## 2786               1917-1985.       1985        r      1985        
## 2787                                1984        s      1984        
## 2788                1922-1998       1985        s      1985        
## 2789                                1975        s      1975        
## 2790                                1986        s      1986        
## 2791               1935-2012.       1987        s      1987        
## 2792                    1910-       1984        s      1984        
## 2793                    1936-       1987        s      1987        
## 2794                                1988        s      1988        
## 2795                    1937-       1982        s      1982        
## 2796                    1934-       1983        s      1983        
## 2797                                1974        r      1974        
## 2798               1909-1983.       1954        s      1954        
## 2799                    1948-       1979        s      1979        
## 2800               1915-1983.       1962        s      1962        
## 2801               1916-1986.       1956        s      1956        
## 2802                                1967        s      1967        
## 2803                    1927-       1971        s      1971        
## 2804               1932-2009.       1984        s      1984        
## 2805                                1984        s      1984        
## 2806               1925-1970.       1970        s      1972        
## 2807               1821-1880.       1880        s      1954        
## 2808                                1956        s      1956        
## 2809               1868-1936.       1927        r      1984    1927
## 2810               1547-1616.       1949        c      1964    1949
## 2811                                1978        s      1978        
## 2812               1880-1942.       1942        s      1965        
## 2813               1905-2000.       1966        s      1966        
## 2814               1920-1978.       1953        s      1953        
## 2815               1904-1991.       1952        s      1952        
## 2816               1903-1990.       1963        s      1963        
## 2817                    1928-       1985        s      1985        
## 2818               1920-1978.       1976        s      1976        
## 2819               1899-1977.       1968        c      1981    1968
## 2820               1881-1936.       1936        m      1956    9999
## 2821               1927-2010.       1985        s      1985        
## 2822                    1961-       1984        s      1984        
## 2823                    1948-       1983        s      1983        
## 2824               1912-1990.       1979        s      1979        
## 2825               1804-1864.       1864        s      1963        
## 2826               1918-2008.       1971        s      1971        
## 2827                                1957        s      1957        
## 2828                                1985        r      1985        
## 2829               1925-1997.       1960        s      1960        
## 2830               1905-1983.       1972        s      1972        
## 2831               1904-1964.       1954        c      1985    1954
## 2832                                1985        c      1986    1985
## 2833                                1985        s      1985        
## 2834               1824-1905.       1905        s      1985        
## 2835                    1905-       1951        s      1951        
## 2836                    1938-       1983        s      1983        
## 2837                    1911-       1982        s      1982        
## 2838               1843-1916.       1916        m      1961    9999
## 2839                                1971        s      1971        
## 2840               1890-1947.       1947        n      1975        
## 2841                    1925-       1970        s      1970        
## 2842               1880-1934.       1934        s      1959        
## 2843                    1898-       1983        s      1983        
## 2844               1897-1970.       1969        s      1969        
## 2845               1903-1933.       1933        s      1973        
## 2846               1894-1983.       1960        s      1960        
## 2847               1920-1992.       1968        s      1968        
## 2848                                1983        s      1983        
## 2849                                1978        s      1978        
## 2850               1891-1926.       1926        s      1956        
## 2851               1843-1916.       1916        m      1961    9999
## 2852               1828-1905.       1905        s      1958        
## 2853               1884-1937.       1937        s      1970        
## 2854               1891-1940.       1940        s      1975        
## 2855               1931-2001.       1971        |      1971    ||||
## 2856               1906-1972.       1957        s      1957        
## 2857               1881-1942.       1942        s      1982        
## 2858               1854-1900.       1900        s      1954        
## 2859               1899-1973.       1955        s      1955        
## 2860               12th cent.       1983        s      1983        
## 2861               1870-1953.       1953        s      1983        
## 2862               1819-1898.       1898        s      1962        
## 2863                                1974        c      1976    1974
## 2864               1929-2005.       1978        s      1978        
## 2865               1861-1928.       1928        s      1962        
## 2866               1862-1931.       1931        s      1977        
## 2867               1862-1931.       1929        r      1974    1929
## 2868               1923-2007.       1974        s      1974        
## 2869                                1983        s      1983        
## 2870               1908-1994.       1980        s      1980        
## 2871               1892-1975.       1958        s      1958        
## 2872                                1982        s      1982        
## 2873               1912-1990.       1955        s      1955        
## 2874               1926-2001.       1958        s      1958        
## 2875               1908-1994.       1976        s      1976        
## 2876                    1928-       1970        s      1970        
## 2877                                1965        s      1965        
## 2878                    1939-       1972        s      1972        
## 2879               1925-2012.       1974        s      1974        
## 2880                                1982        s      1982        
## 2881                                1983        s      1983        
## 2882               1906-1989.       1974        s      1974        
## 2883                                1981        s      1981        
## 2884                    1942-       1969        s      1969        
## 2885                                1951        s      1951        
## 2886                                1972        s      1972        
## 2887                                1968        s      1968        
## 2888               1886-1957.       1957        s      1961        
## 2889               1926-2001.       1969        s      1969        
## 2890                                1978        s      1978        
## 2891                                1958        s      1958        
## 2892               1903-1989.       1967        s      1967        
## 2893                    1930-       1969        s      1969        
## 2894                                1958        |      1958    ||||
## 2895               1931-2007.       1983        s      1983        
## 2896                    1939-       1974        s      1974        
## 2897               1809-1852.       1852        s      1982        
## 2898               1897-1973.       1954        c      1955    1954
## 2899               1871-1950.       1932        r      1976    1932
## 2900                                1973        s      1973        
## 2901               1849-1912.       1912        s      1965        
## 2902                                1963        s      1963        
## 2903                                1970        c      1971    1970
## 2904               1908-1951.       1951        s      1951        
## 2905                                1960        |      1960    ||||
## 2906                    1935-       1962        s      1962        
## 2907               1912-1994.       1963        s      1963        
## 2908               1912-1994.       1960        s      1960        
## 2909               1634-1693.       1962        s      1962        
## 2910                                1964        s      1964        
## 2911                                1960        s      1960        
## 2912               1861-1941.       1941        s      1965        
## 2913               1828-1905.       1905        s      1956        
## 2914          1901 or 2-1972.       1966        s      1966        
## 2915               1906-1972.       1962        s      1962        
## 2916                                1977        c      1983    1977
## 2917               1905-1969.       1955        s      1955        
## 2918               1882-1955.       1955        s      1968        
## 2919                    1940-       1969        s      1969        
## 2920                                1977        s      1977        
## 2921                                1972        |      1972    ||||
## 2922               1926-1988.       1952        c      1977    1952
## 2923               1925-1981.       1978        s      1978        
## 2924               1925-1981.       1953        s      1953        
## 2925               1883-1958.       1958        s      1960        
## 2926                                1976        s      1976        
## 2927                                1978        c      1984    1978
## 2928               12th cent.       1976        r      1976        
## 2929               1824-1889.       1889        r      1955        
## 2930                    1938-       1970        c      1970    1971
## 2931               1897-1962.       1962        s      1966    1965
## 2932               1860-1904.       1904        m      1965    1980
## 2933                    1940-       1980        s      1980        
## 2934                                1983        s      1983        
## 2935               1909-1993.       1956        s      1956        
## 2936               1909-1993.       1950        s      1950        
## 2937               1870-1902.       1902        s      1982        
## 2938               1929-1977.       1967        s      1967        
## 2939                                1979        s      1979        
## 2940               1898-1993.       1971        s      1971        
## 2941                                1982        s      1982        
## 2942               1843-1920.       1920        s      1980        
## 2943                                1980        s      1980        
## 2944                    1930-       1964        s      1964        
## 2945               1928-2013.       1982        s      1982        
## 2946               1921-1996.       1982        s      1982        
## 2947               1929-2010.       1966        c      1970    1966
## 2948                                1966        r      1977    1966
## 2949                                1970        c      1971    1970
## 2950                    1943-       1983        s      1983        
## 2951                                1966        s      1966        
## 2952                                1973        s      1973        
## 2953               1926-1999.       1984        s      1984        
## 2954                                1975        s      1975        
## 2955                    1929-       1968        c      1975    1968
## 2956                                1982        s      1982        
## 2957                    1925-       1967        s      1967        
## 2958                    1937-       1980        s      1980        
## 2959               1876-1916.       1916        s      1982        
## 2960               1886-1914.       1914        c      1953    1928
## 2961               1890-1947.       1947        s      1950        
## 2962               1908-1967.       1967        s      1968        
## 2963               1920-1993.       1973        s      1973        
## 2964                    1922-       1973        c      1977    1973
## 2965               1847-1910.       1910        s      1962        
## 2966                                1975        s      1975        
## 2967               1881-1921.       1921        s      1971        
## 2968                    1916-       1964        s      1964        
## 2969                                1965        s      1965        
## 2970                                1967        s      1967        
## 2971               1818-1883.       1883        s      1951        
## 2972                    1921-       1983        m      1983    9999
## 2973                    1921-       1983        m      1983    9999
## 2974                                1971        t      1973    1971
## 2975                                1978        s      1978        
## 2976               1925-1991.       1977        t      1978    1977
## 2977                                1982        r      1982        
## 2978               1840-1902.       1902        s      1969        
## 2979                1926-1992       1984        s      1984        
## 2980                                1971        s      1971        
## 2981                                1979        s      1979        
## 2982               1906-1989.       1970        s      1970        
## 2983               1821-1881.       1881        s      1950        
## 2984                    1922-       1981        s      1981        
## 2985               1901-1956.       1956        s      1956        
## 2986               1904-1980.       1963        s      1963        
## 2987                                1960        s      1960        
## 2988               1934-1984.       1963        s      1963        
## 2989               1915-2000.       1980        s      1980        
## 2990               1815-1882.       1882        r      1958    1946
## 2991                                1979        s      1979        
## 2992                                1977        s      1977        
## 2993               1825-1907.       1897        r      1970    1897
## 2994                    1921-       1983        m      1983    9999
## 2995               1914-2006.       1963        s      1963        
## 2996                                1977        s      1977        
## 2997                    1921-       1981        s      1981        
## 2998                                1972        s      1972        
## 2999               1901-1963.       1963        s      1963        
## 3000               1891-1974.       1971        s      1971        
## 3001               1913-1996.       1974        s      1974        
## 3002                                1978        s      1978        
## 3003               1914-1983.       1951        s      1951        
## 3004                    1928-       1967        s      1967        
## 3005               1889-1963.       1955        s      1955        
## 3006               1873-1952.       1952        s      1963        
## 3007                                1980        s      1980        
## 3008                                1984        s      1984        
## 3009                    1896-       1966        s      1966        
## 3010               1914-1980.       1978        s      1978        
## 3011               1889-1963.       1958        s      1958        
## 3012               1889-1963.       1963        s      1966        
## 3013               1901-1963.       1960        s      1960        
## 3014               1927-1982.       1963        c      1964    1963
## 3015               1840-1922.       1922        s      1955        
## 3016               1771-1810.       1810        r      1963    1887
## 3017                                1959        |      1959    ||||
## 3018                                1974        s      1974        
## 3019               1580-1645.       1963        s      1963        
## 3020                    1944-       1976        s      1976        
## 3021               1899-1977.       1963        c      1979    1963
## 3022               1862-1937.       1937        s      1982        
## 3023               1900-1978.       1978        s      1982        
## 3024               1898-1973.       1956        s      1956        
## 3025               1922-2010.       1955        t      1964    1955
## 3026               1880-1961.       1955        s      1955        
## 3027                    1946-       1972        s      1972        
## 3028               1902-1998.       1969        s      1969        
## 3029               1869-1951.       1951        s      1963        
## 3030               1771-1810.       1810        r      1963    1887
## 3031               1909-1983.       1961        s      1961        
## 3032                                1962        c      1963    1962
## 3033               1929-1979.       1979        s      1984        
## 3034                                1959        s      1959        
## 3035                                1979        s      1979        
## 3036               1907-1985.       1958        s      1958        
## 3037                                1971        s      1971        
## 3038               1904-2005.       1978        s      1978        
## 3039                                1976        s      1976        
## 3040               1904-1973.       1960        s      1960        
## 3041                                1983        s      1983        
## 3042               1865-1947.       1895        r      1969    1895
## 3043               1904-1991.       1960        c      1966    1960
## 3044               1904-1991.       1968        s      1968        
## 3045                    1935-       1975        s      1975        
## 3046               1832-1888.       1888        s      1976        
## 3047               1828-1905.       1905        s      1967        
## 3048                                1970        r      1970        
## 3049                                1963        s      1963        
## 3050               1818-1883.       1883        s      1974        
## 3051                                1957        s      1957        
## 3052                                1967        c      1980    1967
## 3053               1896-1977.       1955        |      1955    ||||
## 3054               1625-1676.       1964        s      1964        
## 3055               1853-1921.       1921        s      1954        
## 3056               1934-1995.       1971        s      1971        
## 3057                                1953        s      1953        
## 3058                    1935-       1984        s      1984        
## 3059     active 12th century.       1954        s      1954        
## 3060               1875-1955.       1955        s      1973        
## 3061               1896-1973.       1955        s      1955        
## 3062               1857-1924.       1924        s      1956        
## 3063               1869-1951.       1951        s      1953        
## 3064               1313-1375.       1972        s      1972        
## 3065               1856-1916.       1916        s      1972        
## 3066               1905-1973.       1973        s      1976        
## 3067                    1939-       1976        s      1976        
## 3068           ca. 1912-1985.       1977        s      1977        
## 3069                                1967        s      1967        
## 3070                    1933-       1971        s      1971        
## 3071                                1977        s      1977        
## 3072                    1914-       1971        s      1971        
## 3073                                1973        s      1973        
## 3074               1812-1870.       1870        r      1972    1908
## 3075               1889-1952.       1952        s      1965        
## 3076               1909-1955.       1955        s      1969        
## 3077                                1984        s      1984        
## 3078                                1971        s      1971        
## 3079                                1978        s      1978        
## 3080               1826-1889.       1889        s      1957        
## 3081               1939-1999.       1984        s      1984        
## 3082               1923-1996.       1984        s      1984        
## 3083               1907-1990.       1978        s      1978        
## 3084                                1964        s      1964        
## 3085               1883-1957.       1953        c      1954    1953
## 3086               1928-2006.       1973        s      1973        
## 3087                    1930-       1959        c      1962    1959
## 3088               1876-1916.       1916        s      1984        
## 3089                    1930-       1978        s      1978        
## 3090               1915-1983.       1961        s      1961        
## 3091               1907-1986.       1981        s      1981        
## 3092               1902-1998.       1966        s      1966        
## 3093               1903-1966.       1951        s      1951        
## 3094               1895-1970.       1959        s      1959        
## 3095               1910-1994.       1964        s      1964        
## 3096                    1921-       1967        s      1967        
## 3097               1886-1957.       1954        c      1955    1954
## 3098               1927-1987.       1962        s      1962        
## 3099               1910-1970.       1970        s      1981        
## 3100               1898-1956.       1956        s      1972        
## 3101                    1922-       1950        s      1950        
## 3102               1910-1998.       1971        s      1971        
## 3103               1860-1904.       1904        s      1972        
## 3104           ca. 1717-1763.       1763        m      1979    9999
## 3105                                1984        s      1984        
## 3106               1880-1944.       1944        s      1968        
## 3107                                1974        s      1974        
## 3108               1894-1977.       1964        s      1964        
## 3109               1877-1962.       1962        s      1971        
## 3110               1831-1861.       1861        s      1957        
## 3111                    1936-       1972        s      1972        
## 3112               1914-1989.       1976        r      1976        
## 3113                                1984        s      1984        
## 3114                                1984        s      1984        
## 3115                                1959        s      1959        
## 3116                                1982        s      1982        
## 3117                    1938-       1964        s      1964        
## 3118               1913-1984.       1965        s      1965        
## 3119               1903-1991.       1950        s      1950        
## 3120                                1981        s      1981        
## 3121               1900-1967.       1967        s      1983        
## 3122               1821-1881.       1881        s      1961        
## 3123               1868-1936.       1936        s      1971        
## 3124                                1970        |      1970    ||||
## 3125               1892-1927.       1927        s      1964        
## 3126                                1962        s      1962        
## 3127                    1931-       1984        s      1984        
## 3128               1855-1930.       1930        s      1982        
## 3129                                1984        s      1984        
## 3130               1911-1995.       1971        s      1971        
## 3131                    1908-       1952        s      1952        
## 3132               1927-2007.       1962        c      1964    1962
## 3133                                1977        s      1977        
## 3134                    1916-       1976        r      1976        
## 3135                                1973        s      1973        
## 3136                                1983        s      1983        
## 3137               1899-1974.       1954        s      1954        
## 3138               1775-1817.       1817        s      1953        
## 3139               1888-1988.       1968        c      1969    1968
## 3140               1828-1905.       1905        s      1962        
## 3141               1914-2002.       1984        s      1984        
## 3142                    1922-       1965        s      1965        
## 3143               1912-2001.       1971        s      1971        
## 3144                                1975        s      1975        
## 3145                                1973        s      1973        
## 3146                                1981        m      1981    9999
## 3147               1915-1983.       1950        s      1950        
## 3148               1909-1983.       1971        s      1971        
## 3149               1914-1983.       1972        s      1972        
## 3150               1880-1974.       1965        s      1965        
## 3151               1880-1974.       1963        s      1963        
## 3152               1900-1976.       1970        s      1970        
## 3153               1880-1974.       1962        s      1962        
## 3154               1880-1974.       1968        s      1968        
## 3155               1900-1941.       1941        s      1966        
## 3156               1899-1977.       1966        c      1979    1966
## 3157               1902-1979.       1979        s      1982        
## 3158               1870-1938.       1938        q      1950    1959
## 3159               1908-1979.       1955        s      1955        
## 3160               1904-1986.       1984        s      1984        
## 3161                                1966        s      1966        
## 3162                                1962        s      1962        
## 3163               1893-1978.       1971        s      1971        
## 3164               1880-1974.       1960        s      1960        
## 3165               1906-1994.       1960        s      1960        
## 3166                    1940-       1978        s      1978        
## 3167               1924-1975.       1962        s      1962        
## 3168               1897-1986.       1976        s      1976        
## 3169                    1945-       1971        r      1971        
## 3170               1824-1889.       1889        s      1955        
## 3171               1899-1973.       1952        s      1952        
## 3172               1840-1928.       1928        s      1974        
## 3173                   1932?-       1958        s      1958        
## 3174               1896-1972.       1960        s      1960        
## 3175               1815-1882.       1882        s      1981        
## 3176               1789-1851.       1851        s      1985        
## 3177                                1979        s      1979        
## 3178                    1930-       1972        s      1972        
## 3179                    1910-       1962        s      1962        
## 3180               1843-1916.       1916        m      1967    9999
## 3181               1821-1881.       1881        s      1985        
## 3182                    1951-       1984        s      1984        
## 3183                    1939-       1975        s      1975        
## 3184                                1981        s      1981        
## 3185                    1934-       1983        s      1983        
## 3186                    1921-       1978        s      1978        
## 3187               1935-1989.       1975        s      1975        
## 3188                                1966        s      1966        
## 3189                                1979        s      1979        
## 3190               1914-1953.       1953        s      1984        
## 3191               1912-1981.       1959        c      1960    1959
## 3192               1912-1981.       1956        s      1956        
## 3193                                1978        s      1978        
## 3194               1899-1977.       1963        s      1963        
## 3195               1785-1873.       1873        s      1952        
## 3196                                1979        s      1979        
## 3197               1902-1992.       1951        s      1951        
## 3198               1892-1962.       1962        s      1967        
## 3199               1910-1993.       1958        s      1958        
## 3200               1893-1945.       1945        s      1965        
## 3201                                1958        s      1958        
## 3202               1861-1941.       1941        c      1966    1956
## 3203               1893-1945.       1945        s      1973        
## 3204               1926-2001.       1975        s      1975        
## 3205                    1947-       1984        s      1984        
## 3206                                1952        s      1952        
## 3207               1900-1967.       1958        s      1958        
## 3208                                1962        c      1977    1962
## 3209               1890-1970.       1952        s      1952        
## 3210                    1932-       1981        s      1981        
## 3211               1899-1977.       1975        s      1975        
## 3212               1818-1883.       1883        s      1970        
## 3213               1911-1966.       1966        s      1966        
## 3214               1914-1983.       1954        s      1954        
## 3215                                1984        s      1984        
## 3216               1885-1967.       1967        s      1967        
## 3217               1896-1984.       1961        s      1961        
## 3218                                1983        s      1983        
## 3219                                1983        s      1983        
## 3220               1818-1883.       1883        q      1960        
## 3221                                1984        s      1984        
## 3222               1784-1834.       1834        s      1969        
## 3223               1881-1936.       1936        s      1953        
## 3224               1909-1991.       1971        s      1971        
## 3225                                1974        s      1974        
## 3226                    1933-       1970        s      1970        
## 3227                    1933-       1984        s      1984        
## 3228               1905-1980.       1950        c      1964    1950
## 3229                    1933-       1973        c      1979    1973
## 3230                    1933-       1980        s      1980        
## 3231               1943-1990.       1971        s      1971        
## 3232               1911-2006.       1992        s      1992        
## 3233                                1994        s      1994        
## 3234                                1993        s      1993        
## 3235               1875-1926.       1926        s      1994        
## 3236               1795-1821.       1821        s      1994        
## 3237               1840-1920.       1920        s      1993        
## 3238                                1993        s      1993        
## 3239                                1984        c      1985    1984
## 3240                    1932-       1971        r      1980    1971
## 3241               1891-1967.       1961        s      1961        
## 3242                                1981        s      1981        
## 3243               1919-1989.       1973        s      1973        
## 3244                                1960        s      1960        
## 3245               1918-1998.       1957        s      1957        
## 3246               1894-1983.       1958        s      1958        
## 3247                                1979        s      1979        
## 3248               1881-1942.       1942        s      1961        
## 3249               1881-1942.       1942        s      1959        
## 3250                                1979        s      1979        
## 3251               1925-1997.       1963        r      1965    1963
## 3252               1923-1984.       1973        s      1973        
## 3253                                1979        s      1979        
## 3254                                1966        s      1966        
## 3255               1871-1908.       1908        c      1983    1982
## 3256               1903-1989.       1974        s      1974        
## 3257               1903-1989.       1965        c      1974    1965
## 3258               1882-1949.       1949        r      1959        
## 3259                                1982        s      1982        
## 3260                    1921-       1962        s      1962        
## 3261               1925-1999.       1984        s      1984        
## 3262                    1906-       1958        s      1958        
## 3263               1903-1987.       1951        s      1951        
## 3264               1881-1936.       1936        s      1967        
## 3265               1843-1914.       1894        r      1972    1894
## 3266               1839-1908.       1908        c      1980    1954
## 3267               1919-1994.       1953        c      1970    1953
## 3268                                1985        s      1985        
## 3269                                1962        c      1963    1962
## 3270               1822-1896.       1896        s      1984        
## 3271                                1961        c      1962    1961
## 3272               1897-1986.       1967        s      1967        
## 3273               1849-1912.       1912        s      1972        
## 3274               1894-1937.       1928        r      1971    1928
## 3275               1914-1953.       1953        s      1976        
## 3276               1839-1908.       1908        s      1952        
## 3277                                1985        s      1985        
## 3278                    1937-       1982        s      1982        
## 3279               1889-1952.       1952        s      1969        
## 3280               1901-1975.       1966        s      1966        
## 3281               1688-1763.       1763        s      1965        
## 3282               1902-1997.       1978        s      1978        
## 3283               1902-1997.       1974        s      1974        
## 3284               1914-2003.       1981        s      1981        
## 3285               1905-1984.       1967        s      1967        
## 3286               1828-1910.       1904        r      1968    1904
## 3287                                1984        s      1984        
## 3288               1826-1906.       1867        r      1969    1867
## 3289               1905-1991.       1964        s      1964        
## 3290                    1936-       1983        s      1983        
## 3291                    1921-       1963        s      1963        
## 3292               1923-1996.       1978        s      1978        
## 3293               1932-2009.       1985        s      1985        
## 3294               1916-1981.       1971        s      1971        
## 3295               1916-1981.       1968        s      1968        
## 3296               1918-1992.       1958        s      1958        
## 3297                                1967        s      1967        
## 3298                    1930-       1975        s      1975        
## 3299                    1917-       1964        s      1964        
## 3300                    1917-       1960        s      1960        
## 3301               1907-1991.       1978        s      1978        
## 3302               1819-1890.       1890        s      1974        
## 3303                                1962        s      1962        
## 3304                                1975        c      1976    1975
## 3305               1850-1893.       1893        s      1961        
## 3306               1850-1893.       1893        s      1965        
## 3307               1906-1978.       1964        s      1964        
## 3308                    1932-       1976        c      1982    1976
## 3309               1930-1992.       1976        s      1976        
## 3310                                1971        s      1971        
## 3311                 d. 1943.       1970        s      1970        
## 3312               1867-1922.       1922        s      1979        
## 3313               1922-1975.       1968        s      1968        
## 3314                                1966        s      1966        
## 3315               1707-1777.       1777        s      1963        
## 3316                                1981        s      1981        
## 3317               1864-1913.       1913        s      1980        
## 3318               1925-2006.       1960        s      1960        
## 3319               1925-2006.       1952        c      1962    1952
## 3320                    1942-       1981        s      1981        
## 3321               1888-1964.       1964        s      1966        
## 3322                    1898-       1954        s      1954        
## 3323                    1921-       1972        c      1973    1972
## 3324               1910-1998.       1976        s      1976        
## 3325                                1983        s      1983        
## 3326               1903-1987.       1953        s      1953        
## 3327               1864-1913.       1913        s      1976        
## 3328               1889-1964.       1964        s      1978        
## 3329               1911-2006.       1978        s      1978        
## 3330                    1937-       1980        s      1980        
## 3331                                1972        s      1972        
## 3332                                1982        s      1982        
## 3333               1914-1993.       1960        c      1981    1960
##                                                                                                                                                              imprint
## 1                                                                                                                                             Boston|L.C. Page|1900.
## 2                                                                                                                           Montreal|A.H. Armour and H. Ramsay|1840.
## 3                                                                                                                                              London|C. Hurst|1974.
## 4                                                                                                                                      New York|Longmans Green|1959.
## 5                                                                                                                                         London|Allen & Unwin|c1961
## 6                                                                                                                              Westport, Conn.|Greenwood Press|1975.
## 7                                                                                                                                Mattituck, N.Y.|Aeonian Press|1976.
## 8                                                                                                                                        New York|Garland Pub.|1976.
## 9                                                                                                                                           New York|H. Fertig|1976.
## 10                                                                                                                                 London|Dent|New York|Dutton|1976.
## 11                                                                                                                                          New York|S. Weiser|1970.
## 12                                                                                                                                          Boston|Gregg Press|1979.
## 13                                                                                                                                  London|Dent|New York|Dutton|1954
## 14                                                                                                                                        New York|McGraw-Hill|c1955
## 15                                                                                                                                  London|Dent|New York|Dutton|1959
## 16                                                                                                                                             New York|Morrow|1957.
## 17                                                                                                                                       Columbus, Ohio|Merrill|1970
## 18                                                                                                                                           New York|Carleton|1873.
## 19                                                                                                                              Brooklyn, N.Y.|Dime Novel Club|1963?
## 20                                                                                                                                  Indianapolis|Bobbs-Merrill|c1961
## 21                                                                                                                 London|W. Heinemann|1897.|New York|AMS Press|1970
## 22                                                                                                                              Atlanta, Ga.|Cherokee Pub. Co.|1990.
## 23                                                                                                              New York, N.Y.|HarperCollins Publishers|1992, c1989.
## 24                                                                                                                London|W. Heinemann|New York|AMS Press|1896, [1970
## 25                                                                                                                London|W. Heinemann|New York|AMS Press|1896, [1970
## 26                                                                                                                     Oxford|New York|Oxford University Press|1991.
## 27                                                                                                                     Oxford|New York|Oxford University Press|1993.
## 28                                                                                                                                      Edinburgh|Mercat Press|1996.
## 29                                                                                                            Oxford [England|New York|Oxford University Press|1995.
## 30                                                                                                                                   Washington|Reprint Service|1992
## 31                                                                                                                                      New York|Alfred Knopf|c1998.
## 32                                                                                                                                  New York|Crown Publishers|c1979.
## 33                                                                                                                                               London|Virago|1990.
## 34                                                                                                       New York, N.Y.|Berkley Prime Crime|Berkley Pub. Group|2000.
## 35                                                                                                                           Port Elgin, Ont.|Brucedale Press|c2005.
## 36                                                                                                                                    Chicago|Valancourt Books|2007.
## 37                                                                                                                                    Chicago|Valancourt Books|2007.
## 38                                                                                                                                            London|E. Wilson|1833.
## 39                                                                                                                                New York|Monthly Review Press|1966
## 40                                                                                                                                          New York|AMS Press|1968.
## 41                                                                                                                                             London|A. Barker|1952
## 42                                                                                                                     Philadelphia|J.B. Lippincott Co.|1897, c1896.
## 43                                                                                                                             New York|Jewish Treasures Pub.|c1991.
## 44                                                                                                                                             New York|Dutton|1965.
## 45                                                                                                                                              New York|Judge|1888.
## 46                                                                                                                     Folcroft, Pa.|Folcroft Library Editions|1976.
## 47                                                                                                                                          London|Bodley Head|1974.
## 48                                                                                                                                        New York|T.Y. Crowell|190-
## 49                                                                                                                                      New York|B. W. Huebsch|1920.
## 50                                                                                                          London|Macmillan and Co.|1910|Johnson Reprint Corp.|1967
## 51                                                                                                                                                    S.l.|s.n.|1908
## 52                                                                                                                                          New York|AMS Press|1971.
## 53                                                                                                                                           New York|AMS Press|1970
## 54                                                                                                                                        Boston|Houghton|pref. 1858
## 55                                                                                                                                           Boston|D.C. Heath|1885.
## 56                                                                                              New York|Arcade Publ.|Distributed by Little, Brown and    Co.|c1994.
## 57                                                                                                                   Merrick, NY|Cross-Cultural Communications|2008.
## 58                                                                                   Boston, Houghton Mifflin, 1920|St. Clair Shores, Mich.,  Scholarly Press, 1971.
## 59                                                                                                                North Ryde, N.S.W.|Collins Angus & Robertson|1991.
## 60                                                                                                                                              London|Minerva|1989.
## 61                                                                                                                               New York|Vintage Books|1989, c1968.
## 62                                                                                                                    Moscow|Foreign Languages Publishing House|n.d.
## 63                                                                                                                    Moscow|Foreign Languages Publishing House|n.d.
## 64                                                                                                                       New York, N.Y.|Alfred A. Knopf|1990, c1983.
## 65                                                                                                                               New York|Vintage Books|1990, c1989.
## 66                                                                                                                                              S.l.|Westvaco|c1989.
## 67                                                                                                                                New York, N.Y.|Penguin Books|1990.
## 68                                                                                                                 Corvallis, Or.|Oregon State University Press|1990
## 69                                                                                                                               London|Collins-Harvill|1990, c1975.
## 70                                                                                                                                Nairobi [Kenya|Longman Kenya|1989.
## 71                                                                                                                   New York|Vintage Books Library of America|1990.
## 72                                                                                                                                      London|Collins Harvill|1989.
## 73                                                                                                                               London|Allison & Busby|1988, c1987.
## 74                                                                                                                               London|New York|Quartet Books|1987.
## 75                                                                                                                                           Gloucester|Sutton|1989.
## 76                                                                                                                Ibadan|Heinemann Educational Books (Nigeria)|1988.
## 77                                                                                                              Enugu, Anambra State, Nigeria|Delta of Nigeria|1988.
## 78                                                                                                                     Lewiston, N.Y., U.S.A.|E. Mellen Press|c1990.
## 79                                                                                                                                             New York|Putnam|1990.
## 80                                                                                          Washington|St. Sophia Religious Association of Ukrainian Catholics|1989.
## 81                                                                                                                                      New York|Howard Fertig|1990.
## 82                                                                                                                       Westport, Conn.|Hyperion Press|1977, c1934.
## 83                                                                                                                  San Diego|Harcourt Brace Jovanovich|1989, c1942.
## 84                                                                                                                                      New York|Berkley Books|1989.
## 85                                                                                                                               London|Calder & Boyars|1973, c1970.
## 86                                                                                                                                       New York|G. Braziller|1990.
## 87                                                                                                                                 Garden City, N.Y.|Doubleday|1972.
## 88                                                                                                                               London|Collins Harvill|1989, c1971.
## 89                                                                                                                    Ljubljana|Drus̆tvo slovenskih pisateljev|c1988.
## 90                                                                                                                                       London|Collins|1990, c1937.
## 91                                                                                                                                      Oxford|Woodstock Books|1989.
## 92                                                                                                                     Freeport, N.Y.|Books for Libraries Press|1972
## 93                                                                                                                                       New York|Vintage Books|1960
## 94                                                                                                                                              London|Collins|1974.
## 95                                                                                                                                         London|Eyre Methuen|1973.
## 96                                                                                                                                        New York|Dell|1964, c1970.
## 97                                                                                                                                  Auckland|New Women's Press|1989.
## 98                                                                                                                                              New York|Jove|c1985.
## 99                                                                                                                             New York|Farrar, Straus, Giroux|1989.
## 100                                                                                                                              New York|Vintage Books|1989, c1965.
## 101                                                                                                                                  New York|H. Fertig|1990, [c1931
## 102                                                                                                                                  Moscow|Raduga Publishers|c1988.
## 103                                                                                                                             Boston, Mass.|G.K. Hall|1989, c1978.
## 104                                                                                                                                    Johannesburg|Ad. Donker|1989.
## 105                                                                                                                                          London|W.H. Allen|1986.
## 106     St. Lucia, Qld., Australia|University of Queensland Press ; Portland, Or.|Distributed in the USA and Canada by International Specialized Book Services|1989.
## 107                                                                                                                                     New York|Vintage Books|1990.
## 108                                                                                                                                 New York|Ecco Press|1989, c1981.
## 109                                                                                                                               Llanrwst|Gwasg Carreg Gwalch|1989.
## 110                                                                                                                                       Dunedin|John McIndoe|1989.
## 111                                                                                                                                    New York|Penguin|1988, c1963.
## 112                                                                                                                              New York|New American Library|1961.
## 113                                                                                                      Scranton, Pa.|London|Toronto|Chandler Publishing Co.|c1963.
## 114                                                                                                                                       New York|Knopf|1957 [c1956
## 115                                                                                                                    Berkeley|University of California Press|1960.
## 116                                                                                                                          Garden City, N.Y.|Doubleday|1963 [c1950
## 117                                                                                                                    London|New York|Oxford University Press|1965.
## 118                                                                                                                                     London|Secker & Warburg|1961
## 119                                                                                                                              London|Oxford University Press|1958
## 120                                                                                                                                     London|Victor Gollancz|1958.
## 121                                                                                                                                 New York|Ballantine Books|c1975.
## 122                                                                                                                                     New York|New Directions|1950
## 123                                                                                                                                    London|Secker & Warburg|1953.
## 124                                                                                 Harmondsworth|Penguin in association with Hamilton|1949, c1940|(1982 [printing])
## 125                                                                                                                           London|Secker & Warburg|1986 printing.
## 126                                                                                                                                Gweru, Zimbabwe|Mambo Press|1985.
## 127                                                                                                                                    New York|Pantheon Books|1979.
## 128                                                                                                                       London|W. Heinemann & The Bodley Head|1970
## 129                                                                                                                                   New York|Hafner Pub. Co.|1962.
## 130                                                                                                                                            London|Gollancz|1961.
## 131                                                                                                                                New York|Bantam Books|1964, c1947
## 132                                                                                                                            New York|The Viking Press|1961,c.1953
## 133                                                                                                                               New York|G.P. Putnam's Sons|c1972.
## 134                                                                                                                                             London|Cassell|1970.
## 135                                                                                                                                             London|Cassell|1970.
## 136                                                                                                                            Harmondsworth|Baltimore|Penguin|1974.
## 137                                                                                                                                London|Dent|New York|Dutton|1968.
## 138                                                                                                                                       London|Folio Society|1965.
## 139                                                                                                                                     London|Secker & Warburg|1961
## 140                                                                                                                                       New York|Bantam Books|1964
## 141                                                                                                                               New York|Dell Pub. Co.|1966, c1961
## 142                                                                                                                                London|Dent|New York|Dutton|1971.
## 143                                                                                                                                             Beirut|Khayats|1966.
## 144                                                                                                                          Cambridge, Mass.|R. Bentley|1971 [c1920
## 145                                                                                                                                            London|Macdonald|1954
## 146                                                                                                                                         New York|Macmillan|1956.
## 147                                                                                                                                 New York|Simon and Schuster|1969
## 148                                                                                                                                 London|Folio Society|1975, c1954
## 149                                                                                                                                            London|Spearman|1971.
## 150                                                                                                                               Harmondsworth|Penguin|1984, c1976.
## 151                                                                                                                                           London|Pan Books|1983-
## 152                                                                                                                                              London|Collins|1967
## 153                                                                                                                                           London|Macmillan|1992.
## 154                                                                                                                  London|Oxford university press, H. Milford|1951
## 155                                                                                                                                     Henley-on-Thames|Ellis|1987.
## 156                                                                                                                    Washington, D.C.|Three Continents Press|1989.
## 157                                                                                                                                         London|H. Hamilton|1988.
## 158                                                                                                                                  London|Sinclair-Stevenson|1991.
## 159                                                                                                                                         Felinfach|Llanerch|1991.
## 160                                                                                               New York|Schocken Books|Distributed by Pantheon Books|1988, c1969.
## 161                                                                                                                     Cairo|American University Press|1987, c1986.
## 162                                                                                                                                 New York, NY|Penguin Books|1990.
## 163                                                                                                                                            London|Mandarin|1991.
## 164                                                                                                                        London|New York|Macmillan Caribbean|1989.
## 165                                                                                                                                            London|Mandarin|1990.
## 166                                                                                                                      San Rafael, Calif.|New World Library|c1990.
## 167                                                         Ringwood, Vic., Australia|Penguin Books, assisted by the Literature Board of the Australia Council|1990.
## 168                                                                                                                                Chicago|Elephant Paperbacks|1990.
## 169                                                                                                                                             London|Quartet|1990.
## 170                                                                                                                                         London|Zomba Books|1983.
## 171                                                                                                                                           New York|B. Blom|1971.
## 172                                                                                                                              New York|Aeonian Press|1977, c1961.
## 173                                                                                                                                         New York|AMS Press|1967.
## 174                                                                                                                                   New York|Ballantine Books|1969
## 175                                                                                                                         New York|Atheneum Publishers|1960 [c1959
## 176                                                                                                                                  London|Granada Publishing|1971.
## 177                                                                                                                     London|W. Heinemann & The Bodley Head|c1971.
## 178                                                                                                                       New York, N.Y.|New American Library|c1982.
## 179                                                                                                                                        New York|Grove Press|1954
## 180                                                                                                                                  London|Secker and Warburg|1960.
## 181                                                                                                                                       New York|Knopf|1954, 1961.
## 182                                                                                                                                      New York|Random House|1957.
## 183                                                                                                                                           Denver|A. Swallow|1961
## 184                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1970
## 185                                                                                                                         Los Angeles|Holloway House Pub. Co.|1968
## 186                                                                                                                                      New York|Collier Books|1971
## 187                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1971
## 188                                                                                                                                    Philadelphia|Lippincott|1962.
## 189                                                                                                                       Detroit|Wayne State University Press|1962.
## 190                                                                                                                        Somerset, U.K.|R.S. Surtees Society|1987.
## 191                                                                                                                                       Cape Town|Tafelberg|c1989.
## 192                                                                                                                                       London|Jonathan Cape|1989.
## 193                                                                                                                                    London|R. Hart-Davis|1956-61.
## 194                                                                                                                                    London|R. Hart-Davis|1956-61.
## 195                                                                                                                                    London|Pan Books|1990, c1989.
## 196                                                                                                                                               Bath|Chivers|1991.
## 197                                                                                                                                  Moscow|Raduga Publishers|c1989.
## 198                                                                                                                                    Boston, Mass.|G.K. Hall|1990.
## 199                                                                                                                            New York|Schocken Books|1990], c1964.
## 200                                                                                                         Columbia, S.C.|University of South Carolina Press|c1991.
## 201                                                                                                                             Atlanta, Ga.|Cherokee Pub. Co.|1990.
## 202                                                                                                                                        Cape Town|Tafelberg|1990.
## 203                                                                                                Stroud|Alan Sutton|Guernsey, Channel Islands|Guernsey Press|1990.
## 204                                                                                                                       Mattituck, N.Y.|Aeonian Press|1977, c1965.
## 205                                                                                                                                  London|Arrow Books|1991, c1989.
## 206                                                                                                       London, Eng.|New York, New York|Penguin Books|1992, c1990.
## 207                                                                                                                              London|New York|Quartet Books|1989.
## 208                                                                                                                                          London|Black Swan|1991.
## 209                                                                                                                   Plainview, N.Y.|Books for Libraries Press|1972
## 210                                                                                                                                     Kiev|Dnipro Publishers|1987.
## 211                                                                                                                                     Singapore|Graham Brash|1979.
## 212                                                                                                                                       London|HarperCollins|1992.
## 213                                                                                                                                     New York|Vintage Books|1992.
## 214                                                                                                                                     New York|Vintage Books|1991.
## 215                                                                                                                                     New York|Bantam Books|c1992.
## 216                                                                                                                                          London|A. Deutsch|1990.
## 217                                                                                                                         New York|HarperCollins Publishers|c1992.
## 218                                                                                                                                           London|Heinemann|1992.
## 219                                                                                                              Newbury, Berkshire [England|Countryside Books|1991.
## 220                                                                                                                         Ibadan|Heinemann Educational Books|1986.
## 221                                                                                                                       San Diego|Harcourt Brace Jovanovich|1992].
## 222                                                                                                                                             London|Penguin|1992.
## 223                                                                                                                                           London|Constable|1995.
## 224                                                                                                                                            Oslo|J. G. Tanum|1969
## 225                                                                                                                                             London|Penguin|1992.
## 226                                                                                                                        New York|Harcourt Brace Jovanovich|c1992.
## 227                                                                                                                                   New York|Pantheon Books|c1992.
## 228                                                                                                                                             London|Quartet|1991.
## 229                                                                                                                                             London|Paladin|1990.
## 230                                                                                                                                        London|Quartet Book|1990.
## 231                                                                                         Elizabeth, New Jersey|Seoul|Hollym International Publishing Corp.|c1991.
## 232                                                                                                                                   London|William Heinemann|1991.
## 233                                                                                                                New York|Knopf|Distributed by Random House|c1991.
## 234                                                                                                                             New York, N.Y.|Delacorte Press|1990.
## 235                                                                                                                                            London|Flamingo|1992.
## 236                                                                                                                                           New York|Morrow|c1991.
## 237                                                                                                                                               London|Arrow|1987.
## 238                                                                                                          London, England|New York, N.Y., USA|Penguin Books|1991.
## 239                                                                                                                                     London|Chatto & Windus|1991.
## 240                                                                                                                          New York, NY|Penguin Books|1987, c1985.
## 241                                                                                                                                            London|Mandarin|1990.
## 242                                                                                                                                                             1992
## 243                                                                                                                                             London|Collins|1979.
## 244                                                                                                                                 London|New English Library|1970.
## 245                                                                                                                                        London|Zodiac Press|1952.
## 246                                                                                                                                       London|Trouser Press|1993.
## 247                                                                                                                                                London|Dent|1986.
## 248                                                                                                                                     London|Mandarin|1991, c1990.
## 249                                                                                                                                           London|Macmillan|1986.
## 250                                                                                                                                             London|Pandora|1991.
## 251                                                                                                                                 London|Saros International|1991.
## 252                                                                                                                            Cape Town|Maskew Miller Longman|1991.
## 253                                                                                                                                  Sydney|Angus and Robertson|1965
## 254                                                                                                                                   New York|William Morrow|c1991.
## 255                                                                                                                                         Boston|D.R. Godine|1991.
## 256                                                                                                                                        New York|W. Morrow|c1992.
## 257                                                                                                                                    London|Secker & Warburg|1990.
## 258                                                                                                                                             London|Quartet|1991.
## 259                                                                                                                                     Cape Town|David Philip|1989.
## 260                                                                                                                                             London|Jenkins|1966.
## 261                                                                                                                                   London|The Folio Society|1971.
## 262                                                                                                                                     London|Chatto & Windus|1961.
## 263                                                                                                                                 Washington|Arfor Publishers|1965
## 264                                                                                                                        Port Washington, N.Y.|Kennikat Press|1967
## 265                                                                                                                             New York|Vintage International|1994.
## 266                                                                                                                                       Seattle|Fjord Press|c1994.
## 267                                                                                                                             London|New York|Penguin|1993, c1989.
## 268                                                                                                                                           New York|Morrow|c1993.
## 269                                                                                                                                        New York|Dodd, Mead|1951.
## 270                                                                                                                             Ibadan, Nigeria|Spectrum Books|1993.
## 271                                                           New York|Collier Books|Toronto|Maxwell Macmillan Canada|New York|Maxwell Macmillan International|1993.
## 272                                                                                                                                     London|Mandarin|1993, c1986.
## 273                                                                                                                                                             1993
## 274                                                                                                                                   New York|Interlink Books|1993.
## 275                                                                                                                                       Oxford, England|Lion|1992.
## 276                                                                                                         London|Hamish Hamilton|New York, N.Y., USA|Penguin|1992.
## 277                                                                                                                                New York|The Modern Library|1992.
## 278                                                                                                                    Enfield Lock, Middlesex|Hisarlik Press|c1992.
## 279                                                                                                                           New York|HarperPaperbacks|1990, c1986.
## 280                                                                                                                               New York|Bantam Books|1991, c1987.
## 281                                                                                                                                     London|David Campbell|c1992.
## 282                                                                                                                                      London|Vintage|1992, c1991.
## 283                                                                                                                                      London|Vintage|1992, c1991.
## 284                                                                                                                                         London|Hutchinson|c1993.
## 285                                                                                                                                           Edinburgh|Floris|1988.
## 286                                                                                                                                  Moscow|Raduga Publishers|c1988.
## 287                                                                                                                                             London|Vintage|1993.
## 288                                                                                               London|Pan Books in association with Secker & Warburg|1989, c1988.
## 289                                                                                                                                      London|Quartet|1993, c1992.
## 290                                                                                                                              London|New York|Bantam Press|c1990.
## 291                                                                                                                 New York|Knopf|Distributed by Random House|1992.
## 292                                                                                                                                London|Women's Press|1993, c1992.
## 293                                                                                                                 Kingston, Jamaica|Kingston Publishers Ltd.|1992.
## 294                                                                                                              Ulaanbaatar [Mongolia|State Pub. House of MPR|1986?
## 295                                                                                                                                  London|Quartet Encounters|1994.
## 296                                                                                                                                London|Women's Press|1992, c1990.
## 297                                                                                                                            London|Routledge/Thoemmes Press|1994.
## 298                                                                                                                                   London|Everyman's|1993, c1973.
## 299                                                                                                                      Lincoln|University of Nebraska Press|c1993.
## 300                                                                                                                                             London|Harvill|1993.
## 301                                                                                                                                      London|Penguin|1993, c1992.
## 302                                                                                                                                    London|Secker & Warburg|1993.
## 303                                                                                                                                   Moscow|Raduga Publishers|1988.
## 304                                                                                                                                             London|Quartet|1993.
## 305                                                                                                                             London|Harvill|1991|(1992[printing])
## 306                                                                                                                                      London|Harvill|1992, c1991.
## 307                                                                                                              Harmondsworth, Middlesex|Penguin Books|1993, c1992.
## 308                                                                                                                                             London|Penguin|1993.
## 309                                                                                                                Harmondsworth, England|Penguin Books|1993, c1991.
## 310                                                                                                                                  Edinburgh|Canongate Press|1992.
## 311                                                                                                                                      London|Minerva|1993, c1991.
## 312                                                                                                                New York, N.Y., U.S.A.|Penguin Books|1989, c1988.
## 313                                                                                                                                   New York|Pantheon Books|c1993.
## 314                                                                                                                                             London|Harvill|1992.
## 315                                                           New York|Collier Books|Toronto|Maxwell Macmillan Canada|New York|Maxwell Macmillan International|1992.
## 316                                                                                                                                New York|Hippocrene/Dedalus|1993.
## 317                                                                                                                                             London|Minerva|1992.
## 318                                                                                                                   Singapore|Oxford|Oxford University Press|1991.
## 319                                                                                                                                             London|Picador|1993.
## 320                                                                                                                           Lusaka|Kenneth Kaunda Foundation|1991.
## 321                                                                                                                     Markham, Ont., Canada|New York|Penguin|1988.
## 322                                                                                                                                London|Women's Press|1987, c1986.
## 323                                                                                                                                       London|André Deutsch|1990.
## 324                                                                                                                                        Sydney|Aurora Press|1980.
## 325                                                                                                                                 Ibadan|Spectrum Books Ltd.|1987.
## 326                                                                                                                          Apollo Bay, Australia|Pascoe Pub.|1992.
## 327                                                                                                                    New York|Baen|Distributed by Paramount|c1994.
## 328                                                                                                                            New York|Schocken Books|1989], c1974.
## 329                                                                                                                                      Harmondsworth|Penguin|1969.
## 330                                                                                                                                      London|Macmillan|1962 [1892
## 331                                                                                                                                       London|Folio Society|1952.
## 332                                                                                                                               New York|Pocket Books|1959, c1958.
## 333                                                                                                                                            London|Heinemann|1971
## 334                                                                                                                                     Auckland, N.Z.|Vintage|1994.
## 335                                                                                                                                             London|Pimlico|1994.
## 336                                                                                                                                      Boston|Perineum Press|1993.
## 337                                                                                                                                   New York|Pantheon Books|c1992.
## 338                                                                                                                                 Berkeley, Calif.|Parallax|c1993.
## 339                                                                                                                                       London|HarperCollins|1995.
## 340                                                                                                                                     New York|Vintage Books|1995.
## 341                                                                                                                                   New York|Interlink Books|1995.
## 342                                                                                                                                             London|Minerva|1992.
## 343                                                                                                                      London|Weidenfeld and Nicolson|1964, c1960.
## 344                                                                                                                                   London|Peter Owen|1971, c1957.
## 345                                                                                                                                    Boston|Houghton Mifflin|1971.
## 346                                                                                                                                  New York|Ballantine Books|1977.
## 347                                                                                                                        New York|Farrar, Straus and Cudahy|c1957.
## 348                                                                                                                                          New York|Macmillan|1961
## 349                                                                                      Ringwood, Vic., Australia|New York, N.Y., U.S.A.|Penguin Books|1984, c1969.
## 350                                                                                                                                      Ringwood, Vic.|Viking|1994.
## 351                                                                                                                              Chippendale, Sydney|Macmillan|1994.
## 352                                                                                                                       New York, N.Y., U.S.A.|Penguin Books|1990.
## 353                                                                                                            Cairo, Egypt|American University in Cairo Press|1994.
## 354                                                                                                                                             London|Picador|1995.
## 355                                                                                                                                      Bne-Berak|L. Friedman|1986?
## 356                                                                                                                                    Boston, Mass.|G.K. Hall|1992.
## 357                                                       London, England|Karnak House|Lawrenceville, NJ|Marketed and distributed in the USA by Red Sea Press|c1995.
## 358                                                                                                                            London|Routledge/Thoemmes Press|1994.
## 359                                                                                                                            London|Routledge/Thoemmes Press|1994.
## 360                                                                                                                             New York|Pantheon Books|1994, c1993.
## 361                                                                                                                                    Fredericton, N.B.|York|c1991.
## 362                                                                                                                               Bangkok, Thailand|D D Books|c1992.
## 363                                                                                                                                        New York|W. Morrow|c1991.
## 364                                                                                                                                             London|Minerva|1994.
## 365                                                                                                                                             London|Penguin|1994.
## 366                                                                                                                                             London|Quartet|1990.
## 367                                                                                                                              New York|Marsilio Publishers|c1992.
## 368                                                                                                                            Boston|Houghton Mifflin|1991], c1925.
## 369                                                                                                              Trumansburg, N.Y.|Freedom,Ca.|Crossing Press|c1982.
## 370                                                                                                                         Chicago|University of Chicago Press|1963
## 371                                                                                                                    Oxford|New York|Oxford University Press|1994.
## 372                                                                                                                                      Basingstoke|Macmillan|1993.
## 373                                                                                                                               Johannesburg|New York|Viking|1993.
## 374                                                                                                                               Iowa City, IA|Penfield Press|1992.
## 375                                                                                                                                        Manchester|Carcanet|1992.
## 376                                                                                                                             Ibadan, Nigeria|Spectrum Books|1994.
## 377                                                                                                                       Ikeja [Nigeria|Foundation Publishers|1994.
## 378                                                                                 Manchester|Carcanet in association with the Calouste Gulbenkian Foundation|1994.
## 379                                                                                                                                     New York|Bantam Books|c1977.
## 380                                                                                                                                     Cape Town|David Philip|1977.
## 381                                                                                                                                       New York|Award Books|1969.
## 382                                                                                                                                          London|Hutchinson|1959.
## 383                                                                                                                                            New York|Morrow|1962.
## 384                                                                                                                                                  Mayflower|1966.
## 385                                                                                                                                      Harmondsworth|Penguin|1973.
## 386                                                                                                                               New York|Vintage Books|1957 [c1951
## 387                                                                                                                                      London|Quartet|1989, c1986.
## 388                                                                                                                London, England|New York, N.Y., USA|Penguin|1995.
## 389                                                                                                                   London|Picador ; published by Pan Books|c1992.
## 390                                                                                                                               London|New York|Bantam Press|1995.
## 391                                                                                                                              Iowa City, IA|Penfield Press|c1994.
## 392                                                                                                                             New York|Woodpecker|Fort Ross|c1995.
## 393                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1971
## 394                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1970
## 395                                                                                                               London|J.M. Dent|New York|E.P. Dutton|1965], 1966.
## 396                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1971
## 397                                                                                                                                             New York|Plume|1997.
## 398                                                                                                                          New York|Fawcett Columbine|1995, c1994.
## 399                                                                                                           Boulder, Co.|Roberts Rinehart Publishers|1996?],c1991.
## 400                                                                                                                                       Chicago|Moody Press|c1992.
## 401                                                                                          Herndon, Va.|WCS Books|Ashville, NC|Distributed by eyeBALL Books|c1994.
## 402                                                                                                                                  New York|Hyperion|1995], c1965.
## 403                                                                                                                                      London|Minerva|1995, c1993.
## 404                                                                                                                       Felinfach [Wales|Llanerch Publishers|1994.
## 405                                                                                                                       Gaborone|African Publishing Services|1996.
## 406                                                                                                                                 Detroit|Singing Tree Press|1970.
## 407                                                                                                                                    New York|Vantage Press|c1994.
## 408                                                                                                                                              London|Methuen|1962
## 409                                                                                                                              London|San Francisco|Thorsons|1997.
## 410                                                                                                                                             Sydney|Picador|1997.
## 411                                                                                   Cape Town|Kwela Books|Johannesburg|Thorold's Africana Books [distributor|1997.
## 412                                                                                                                            New York|Farrar, Straus & Young|c1953
## 413                                                                                                                            New York?|Johnson Reprint Corp.|1980.
## 414                                                                                                                                       London|Folio Society|1975.
## 415                                                                                                                        s.l.|Boar's head Books|c1953, t. p. 1954.
## 416                                                                                                                                   New York|Riverhead Books|1997.
## 417                                                                                                                                         New York|H. Fertig|1977.
## 418                                                                                                                                           London|F. Muller|1956.
## 419                                                                                                                                     London|Chatto & Windus|c1996
## 420                                                                                                                                  Oyster Bay, N.Y.|DM Pub.|c1995.
## 421                                                                                                                                             London|Century|1992.
## 422                                                                                                                               London|Dent|New York|Dutton|c1974.
## 423                                                                                                                                   Montreal|R. Davies Pub.|c1995.
## 424                                                                                                                              Cambridge, MA|Edgewood Press|c1995.
## 425                                                                                                                                         London|Owen|1986, c1948.
## 426                                                                                                                                      London|Michael Joseph|1996.
## 427                                                                                                                        Kent Town, S. Aust.|Wakefield Press|1997.
## 428                                                                                                                                             New York|Plume|1997.
## 429                                                                                                                                 London|Los Angeles|Minerva|1997.
## 430                                                                                                                              United States?|Penfield Press|1996?
## 431                                                                                                                                    U.S.A.?|Scythian Books|c1996.
## 432                                                                                                                          Pietermaritzburg|Shuter & Shooter|1997.
## 433                                                                                                                           Austin|University of Texas Press|1997.
## 434                                                                                                                                   New York|Ballantine Books|1995
## 435                                                                                                                                      Chicago|Regnery|1971, c1969
## 436                                                                                                                       Nanjing, Jiangsu, China|Yilin Press|c1992.
## 437                                                                                                                        New York|Berkley Prime Crime|1995, c1993.
## 438                                                                                                                                            London|J. Murray|1964
## 439                                                                                                                                           London|P. Halban|1997.
## 440                                                                                                                                             New York|Plume|1998.
## 441                                                                                                                                    London|Secker & Warburg|1988.
## 442                                                                                                                                         New York|Doubleday|1959.
## 443                                                                                                                                       Toronto, Ont.|M & S|c1997.
## 444                                                                                                                       New York, N.Y., U.S.A.|Penguin Books|1998.
## 445                                                                                                                                        New York|Woodhouse|c1999.
## 446                                                                                                                          New York|St. Martin's Press|1974, c1973
## 447                                                                                                                            Cape Town|Maskew Miller Longman|1987.
## 448                                                                                                                                        London|Prion|1999, c1953.
## 449                                                                                                                                          New York|AMS Press|1970
## 450                                                                                                                          Brighton|Seattle|Unicorn Bookshop|1973.
## 451                                                                                                                                              New York|ROC|c1999.
## 452                                                                                                                                       London|Marion Boyars|1985.
## 453                                                                                                                             Woodstock, N.Y.|Overlook Press|1998.
## 454                                                                                                                                            London|Flamingo|1999.
## 455                                                                                                                                             London|Harvill|1999.
## 456                                                                                                                             Westcliff-on-Sea|Desert Island|2000.
## 457                                                                                                                       New Hyde Park, N.Y.|University Books|c1958
## 458                                                                                                                                   Johannesburg|Ad. Donker|c1998.
## 459                                                                                                                                  New York|Fawcett Columbine|1997
## 460                                                                                                                                 Cape Town|ESST Publishing|c1998.
## 461                                                                                                                              Kaduna, Nigeria|Nanet Limited|1999.
## 462                                                                                                                                                             2000
## 463                                                                                                                                       London|Pushkin Press|1999.
## 464                                                                                                                                     New York|Vintage Books|1998.
## 465                                                                                                                                             London|Penguin|2000.
## 466                                                                                                                          Nairobi, Kenya|Africawide Network|1999.
## 467                                                                                                                                        London|W. Heinemann|1951-
## 468                                                                                                                                        London|W. Heinemann|1951-
## 469                                                                                                                                        London|W. Heinemann|1951-
## 470                                                                                                                                           Budapest|Corvina|1999.
## 471                                                                                                                                       London|Quartet Books|1998.
## 472                                                                                                                                 Edinburgh|Rebel Inc|1998, c1995.
## 473                                                                                                                               Ringwood, Vic.|Penguin Books|2000.
## 474                                                                                                                               New York|Vintage Books|1960 [c1950
## 475                                                                                                                            Santa Barbara, Calif.|ABC-CLIO|c2002.
## 476                                                                                                                         Milwaukie, Or.|Dark Horse Maverick|2000.
## 477                                                                                                                                           Budapest|Corvina|2001.
## 478                                                                                                                                Budapest|Corvina Books Ltd.|1999.
## 479                                                                                                                                           Budapest|Corvina|1999.
## 480                                                                                                                                     New York|Vintage Books|1998.
## 481                                                                                                                                             London|Penguin|2000.
## 482                                                                                                                             Toronto, Ontario, Canada|Viking|1999
## 483                                                                                                                                  London|New York|Doubleday|2000.
## 484                                                                                                                  Dingle, Co. Kerry, Ireland|Brandon|1995, c1967.
## 485                                                                                                                                  Armonk, N.Y.|M.E. Sharpe|c2001.
## 486                                                                                                                             New York|Harcourt Brace & Co.|c1997.
## 487                                                                                                                          Sag Harbor, N.Y.|Permanent Press|c1999.
## 488                                                                                                                  Dingle, Co. Kerry, Ireland|Brandon|1996, c1956.
## 489                                                                                                                                   Iași|Institutul European|1999.
## 490                                                                                                                             Springfield, VA|Moonfall Press|1998.
## 491                                                                                                                                             London|Penguin|1998.
## 492                                                                                                               Minneapolis, Minn.|Bethany House Publishers|2001].
## 493                                                                                                                                    London|Secker & Warburg|2000.
## 494                                                                                                                             Sydney|Pan Macmillan Australia|1999.
## 495                                                                                                                                 New York|Grove Press|1957, c1937
## 496                                                                                                                                              London|Tandem|1969.
## 497                                                                                                                  Leeuwarden/Ljouwert|Friese Pers Boekerij|c2000.
## 498                                                                                              Berkeley, Calif.|Gato Negro Books/Creative Arts Book Company|c2002.
## 499                                                                                                                                      London|Harvill|2000, c1994.
## 500                                                                                                                                Lagos, Nigeria|Oracle Books|2001.
## 501                                                                                                                                       London|Fourth Estate|1993.
## 502                                                                                                                                       London|Folio Society|1970.
## 503                                                                                                                              London|Oxford University Press|1957
## 504                                                                                                                                    New York|Modern Library|2002.
## 505                                                                                                                                             London|Harvill|1999.
## 506                                                                                                                                       New York|Random House|2002
## 507                                                                                                                       Chicago, Ill.|Academy Chicago|1987, c1971.
## 508                                                                                                                                   London|The Folio Society|1960.
## 509                                                                 London|New York|Kegan Paul International|New York|Distributed by Columbia University Press|2000.
## 510                                                                                                                Walton on Thames, Surrey|Greek Islands Club|1987.
## 511                                                                 London|New York|Kegan Paul International|New York|Distributed by Columbia University Press|2000.
## 512                                                                                                                      Ulaanbaatar|"Asopress" Printeng House|2001.
## 513                                                                                                                                       New Delhi|Roli Books|1986?
## 514                                                                                                                                   New York|Modern Library|c1952.
## 515                                                                                                                                        Bath|Cedric Chivers|1973.
## 516                                                                                                                                          Berlin|Seven Seas|1973.
## 517                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1969
## 518                                                                                                                                 Dublin, Ireland|New Island|2007.
## 519                                                                                                                                            London|Macdonald|1971
## 520                                                                                                                                       New York|Random House|1957
## 521                                                                                              London, New York, [etc.|G. Cumberlege, Oxford University Press|1951
## 522                                                                                                                                    London|Heinemann|1962, c1913.
## 523                                                                                                                                         London|V. Gollancz|1969.
## 524                                                                                                                                    London|Hollis & Carter|c1971.
## 525                                                                                                                                               London|Putnam|1954
## 526                                                                                                                              London|Weidenfeld and Nicolson|1963
## 527                                                                                                           Makurdi, Nigeria|Abogom Printing and Paper Mills|2001.
## 528                                                                                                                 San Diego|Harcourt Brace Jovanovich|1986, c1979.
## 529                                                                                                                               New York|Crossroad Pub. Co.|c2003.
## 530                                                                                                                                 Prague|Twisted Spoon Press|2000.
## 531                                                                                                                                 New York|Simon & Schuster|c2003.
## 532                                                                                                                                       London|HarperCollins|2002.
## 533                                                                                                                                 New York|Crown Publishers|c2003.
## 534                                                                                                                                                  S.l.|s.n.|1976?
## 535                                                                                                                                  Jerusalem|New York|Gefen|c2003.
## 536                                                                                                                                              London|Bantam|2006.
## 537                                                                                                                                San Francisco|MacAdam/Cage|c2006.
## 538                                                                                                                                   Belfast|Blackstaff Press|2005.
## 539                                                                        Brooklyn, NY|Soft Skull Press|Berkeley, Calif.|Distributed by Publishers Group West|2006.
## 540                                                                                                                         New York|Del Rey/Ballantine Books|c2006.
## 541                                                                                                                                     New York|Bantam Books|c2003.
## 542                                                                                                                               New York|G.P. Putnam's Sons|c2003.
## 543                                                                                                                             New York|New American Library|c2003.
## 544                                                                                                                            Dublin|New York|Penguin Ireland|2005.
## 545                                                                                                                   Syracuse, N.Y.|Syracuse University Press|2003.
## 546                                                                                                                                    London|New York|Penguin|2002.
## 547                                                                                                                                      Paris|New York|Calder|2000.
## 548                                                                                                                                    New York|Spuytenduyvil|c2001.
## 549                                                                                                                                             London|Harvill|2003.
## 550                                                                                                                                             Sawtry|Dedalus|2002.
## 551                                                                                                                          Edina, Minn.|Beaver's Pond Press|c2002.
## 552                                                                                                                                        New York|Plume Book|2003.
## 553                                                                                                                              Norfolk, VA|Crippen & Landru|c2002.
## 554                                                  London|Chester Springs, PA|Peter Owen|Chester Springs, PA|Distributed in the USA by Dufour Editions, Inc.|2002.
## 555                                                                                                                               Cairo|State Publishing House|1998.
## 556                                                                                                                                Cairo|State Publishing House|1998
## 557                                                                                                                   Cairo|General Egyptian Book Organization|1992.
## 558                                                                                                                   Cairo|General Egyptian Book Organization|1990.
## 559                                                                                                        Houston, TX|American Institute for Catalan Studies|c2002.
## 560                                                                                                                                        Edinburgh|Canongate|2003.
## 561                                                                                                                             New York|New American Library|c2003.
## 562                                                                                                                                            London|Atlantic|2002.
## 563                                                                                                                             Woodstock, N.Y.|Overlook Press|2003.
## 564                                                                                                                                     London|Allison & Busby|1995-
## 565                                                                                                                      Lincoln|University of Nebraska Press|c2004.
## 566                                                                                                                           New York|Riverhead Books|1998], c1997.
## 567                                                                                                                                             London|Penguin|2003.
## 568                                                                                                                                           Cape Town|Struik|2001.
## 569                                                                                                                                             London|Penguin|2003.
## 570                                                                                                                                             Sydney|Picador|2003.
## 571                                                                                                                                             Sydney|Picador|2003.
## 572                                                                                                                                            New York|Plume|c2004.
## 573                                                                                                                                      London|Serpent's Tail|2004.
## 574                                                                                                                                Prague|Twisted Spoon Press|c2003.
## 575                                                                                                                                     New York, N.Y.|Signet|c2001.
## 576                                                                                                                             San Antonio, Tex.|Wings Press|c2001.
## 577                                                                                                                    Winnipeg|Language Lanterns Publications|2002.
## 578                                                                                                                   Saskatoon|Language Lanterns Publications|2001.
## 579                                                                                                                                        Cape Town|comPress|c2000.
## 580                                                                                                                                     Dublin|Penguin Ireland|2004.
## 581                                                             Providence, RI|Gávea-Brown Publications|Brooklyn, New York|Distributed by Luso-Brazilian Books|c1998
## 582                                                                                                                                      Toronto|Women's Press|2004.
## 583                                                                                                                 Lubbock, Tex.|Texas Tech University Press|c2004.
## 584                                                                                                                        New Delhi|New York, NY|Puffin Books|2003.
## 585                                                                                                                                      Oslo|J.G. Tanum forlag|1962
## 586                                                                                                                                    New York|Modern Library|2002.
## 587                                                                                                                              Saint-Petersburg|Helicon Plus|2000.
## 588                                                                                                                               London|Faber and Faber|1961, c1958
## 589                                                                                                                                            London|Gollancz|1962.
## 590                                                                                                                                 Moscow|Progress Publishers|1977.
## 591                                                                                                                                 New York|Scribner Classics|2003.
## 592                                                                                                                                   New York|Delacorte Press|2004.
## 593                                                                                                                                           Toronto|McArthur|2003.
## 594                                                                                                                             Montgomery, AL|NewSouth Books|c2004.
## 595                                                                                                                                   London|The Folio Society|1964.
## 596                                                                                                                                     Cairo|State Pub. House|1997.
## 597                                                                                                                                              Cairo|G.E.B.O|2002.
## 598                                                                                                                             Washington, DC|Mage Publishers|1998.
## 599                                                                                                                                   New York|Alfred A. Knopf|2004.
## 600                                                                                                                                                             1995
## 601                                                                                                                                                             2004
## 602                                                                                                                      London|Chester Springs, PA|Peter Owen|2004.
## 603                                                                                                                                      New York|Other Press|c2004.
## 604                                                                                                                                                             2007
## 605                                                                                                                                            London|F. Muller|1953
## 606                                                                                                                                  Lewes [England|Book Guild|2004.
## 607                                                                                                                         Guilford, Conn.|Lyons Press|2004, c2002.
## 608                                                                                                                           Riverside, Calif.|Ariadne Press|c2007.
## 609                                                                                                                                     New York|Berkley Books|2005.
## 610                                                                                                    New York|Southern Tier Editions, Harrington Park Press|c2005.
## 611                                                                                                                                             New York|Norton|2004
## 612                                                                                                                                        New York|Dial Press|2005.
## 613                                                                                                                    Oxford|New York|Oxford University Press|2004.
## 614                                                                                                                                         New York|Hyperion|c2005.
## 615                                                                                                                          Camberwell, Vic.|New York|Penguin|2004.
## 616                                                                                                                                  New York|Bard Books|1971, c1967
## 617                                                                                                                                      Wellington, N.Z.|Huia|2003.
## 618                                                                                                                                Cape Town|Progressive Minds|2002.
## 619                                                                                                                                     Port Melbourne|Minerva|1993.
## 620                                                                                                                              Margate, Tas.|Red Hill Books|c2004.
## 621                                                                                                                    Los Angeles, Calif.|Gorsky Press|2005, c2004.
## 622                                                                                                                                      Toronto|Women's Press|2005.
## 623                                                                                                                                    Ottawa|Golden Dog Press|2004.
## 624                                                                                                                                               Vilnius|Vaga|1998.
## 625                                                                                                                           London|New York|Harper Perennial|2005.
## 626                                                                                                                           Houston, Tex.|Arte Publico Press|1993.
## 627                                                                                                                                      London|Serpent's Tail|2005.
## 628                                                                                                                                             London|Panther|1969.
## 629                                                                                                                   Cairo|General Egyptian Book Organization|2002.
## 630                                                                                                                                          Manchester|Crocus|2005.
## 631                                                                                                                                              London|Virgin|2005.
## 632                                                                                                                                    London|New York|Penguin|2005.
## 633                                                                                                                                         New York|Doubleday|2005.
## 634                                                                              London|Arcadia|Chicago|Distributed in the USA by Independent Publishers Group|2004.
## 635                                                                                                                                     London|Chatto & Windus|2005.
## 636                                                                                                                                  Moscow|Raduga Publishers|c1987.
## 637                                                                                                                                       Orlando, FL|Harcourt|2003.
## 638                                                                                                                                            New Delhi|Katha|2003.
## 639                                                                                     Riverdale, NY|Baen Books|New York, NY|Distributed by Simon & Schuster|c2005.
## 640                                                                                                                          Hull [England|Wrecking Ball Press|2005.
## 641                                                                                                                                         London|Milet Publ.|2000.
## 642                                                                                                                                        London|Spring Books|1968.
## 643                                                                                                                                            London|A. Barker|1957
## 644                                                                                                                       Memphis, Tenn.|Peachtree Publishers|c1988.
## 645                                                                                                                                             London|Deutsch|1987.
## 646                                                                                                                                               London|Tandem|1967
## 647                                                                                                                                     New York|Hart Pub. Co.|c1962
## 648                                                                                                                          New York|Sterling Pub. Co.|1974] c1946.
## 649                                                                                                                                     Cook, ACT|Mulini Press|1992.
## 650                                                                                                                           New York|Ballantine Books|1991, c1982.
## 651                                                                                                                                           Cardiff|Parthian|2006.
## 652                                                                                                                               Edinburgh|New York|Canongate|2006.
## 653                                                                                                                               Edinburgh|New York|Canongate|2006.
## 654                                                                                                                                            London|Heinemann|1951
## 655                                                                                                                          Holladay, Utah|Southmoor Studios|c2000.
## 656                                                                                                                                          London|Milet Pub.|2003.
## 657                                                                                                                          Holladay, Utah|Southmoor Studios|c[2001
## 658                                                                                                                          Holladay, Utah|Southmoor Studios|c2002.
## 659                                                                                                                              Canberra, A.C.T.|Mulini Press|1999.
## 660                                                                                                                                     Dublin|Penguin Ireland|2005.
## 661                                                                                                                                          London|Elek Books|1955.
## 662                                                                                               Birmingham|Livingston Press, The University of West Alabama|c2006.
## 663                                                                                                                                       London|Jonathan Cape|2006.
## 664                                                                                                                                              London|Halban|2005.
## 665                                                                                                                                             London|Methuen|2006.
## 666                                                                                                                        Chiang Mai, Thailand|Silkworm Books|2005.
## 667                                                                                                                                        London|Brockhampton|2004.
## 668                                                                                                                                      London|Serpent's Tail|2005.
## 669                                                                                                                                              New York|Delta|1998
## 670                                                                             Sawtry, UK|Dedalus|Gardena, Calif.|Distributed in the U.S. by SCB Distributors|2005.
## 671                                                                                                                Fremantle, W.A.|Fremantle Arts Centre Press|2004.
## 672                                                                                                                   Cambridge, Mass.|Co. of Words Pub.|1996,c1995.
## 673                                                                                                                                            New York|Viking|2006.
## 674                                                                                                                                         Dublin|New Island|c2005.
## 675                                                                                                                             Mineola, NY|Dover Publications|2006.
## 676                                                                                                             Barnsley, South Yorkshire|Pen & Sword Maritime|2004.
## 677                                                                                                                                     Istanbul|Anatolia Pub.|200-?
## 678                                                                                                                             Istanbul, Turkey|Anatolia Pub.|200-?
## 679                                                                                                                                     Dublin|Penguin Ireland|2006.
## 680                                                                                                                             New York|Shaye Areheart Books|c2006.
## 681                                                                                                                         Holicong, PA|Wildside Press|2003, c1913.
## 682                                                                                                                            Dublin|New York|Penguin Ireland|2006.
## 683                                                                                                                                 New York|Crown Publishers|c2006.
## 684                                                                                                                                   New York|Riverhead Books|2006.
## 685                                                                                                         New York|Weinstein|London|Turnaround [distributor|c2008.
## 686                                                                                                  Los Angeles, Calif.|Alyson|London|Turnaround [distributor|2006.
## 687                                                                                                                                          Dublin|New Island|2006.
## 688                                                                                                                                         London|Robert Hale|2006.
## 689                                                                                                                           San Francisco|MacAdam/Cage Pub.|c2006.
## 690                                                                                                          Philadelphia, PA|University of Pennsylvania Press|2005.
## 691                                                                                                                                     New York|Penguin Books|1996?
## 692                                                                                                                             Sisters, Or.|Multnomah|2005], c1997.
## 693                                                                                                                              New York|Vanguard Press|1960, c1959
## 694                                                                                                                                  London|Pickering & Chatto|2005-
## 695                                                        London|Chester Springs, PA|Peter Owen|Chester Springs, PA|Distributed in the USA by Dufour Editions|2008.
## 696                                                                                                                                           London|Doubleday|2008.
## 697                                                                                                                                          London|Black Swan|2008.
## 698                                                                                                                                             London|Picador|2008.
## 699                                                                                                                                            London|Hesperus|2008.
## 700                                                                                                                                          Edinburgh|Polygon|2008.
## 701                                                                        Edinburgh|New York|Canongate|Berkeley, Calif.|Distributed by Publishers Group West|c2007.
## 702                                                                                                                                         London|John Murray|2008.
## 703                                                                                                                                  London|Arcadia Books Ltd.|2008.
## 704                                                                                                                            San Francisco, CA|MacAdam Cage|c2007.
## 705                                                                                                                                       London|Profile Books|2006.
## 706                                                                        Sawtry [England|Dedalus|Gardena, Calif.|Distributed in the U.S. by SCB Distributors|2006.
## 707                                                                                                                                    New Milford, Conn.|Toby|2007.
## 708                                                                                                                                       Norwich|Norvik Press|2007.
## 709                                                                                                                                  Dinas Powys, Wales|Honno|c2007.
## 710                                                                                                                                      Cape Town|Oshun Books|2005.
## 711                                                                                                                                            London|Flamingo|2002.
## 712                                                                                                                                  Einsiedeln|Daimon Verlag|c2001.
## 713                                                                                                                               Brighton, England|Book Guild|2007.
## 714                                                                                                                 New Delhi|New York|Oxford University Press|2006.
## 715                                                                                                                                          Lahore|Sang-e-Meel|1996
## 716                                                                                                                             Westport, Conn.|Greenwood Press|1970
## 717                                                                                                                     Forest Hills, N.Y.|Queens House|1976, c1951.
## 718                                                                                                                                      New York|Arcadia House|1950
## 719                                                                                                                        Larchmont, N.Y.|Queens House|1978, c1950.
## 720                                                                                                                                Larchmont, N.Y.|Queens House|1978
## 721                                                                                      Carbondale|Southern Illinois University Press|London|Feffer & Simons|c1980.
## 722                                                                                                                                             London|Deutsch|1971.
## 723                                                                                                                                          New York|Rinehart|c1958
## 724                                                                                                                           Lusaka, Zambia|Multimedia Zambia|1993.
## 725                                                                                                                                       New York|Random House|1962
## 726                                                                                                                                           New York|Scribner|1968
## 727                                                                                                                      Westport, Conn.|Hyperion Press|1976, c1931.
## 728                                                                                                                              New York|Shengold Publishers|c1980.
## 729                                                                                                                                Garden City, N.Y.|Doubleday|1972.
## 730                                                                                                                                       Philadelphia|Dorrance|1972
## 731                                                                                                                                   London|Millington Books|c1976.
## 732                                                                                                                        New York, N.Y.|New American Library|1981.
## 733                                                                                                                                   New York|Donald I. Fine|c1992.
## 734                                                                                                                        Upper Saddle River, N.J.|Gregg Press|1968
## 735                                                                                                                      Garden City, N.Y.|Doubleday|1971 [i.e. 1972
## 736                                                                                                                                    London|Secker & Warburg|1991.
## 737                                                                                                                           Philadelphia, Pa.|Black-a-Moors|c1983.
## 738                                                                                                                                       London|Joseph|1985, c1984.
## 739                                                                                  Clarence Center, N.Y.|Textile Bridge Press|Buffalo, N.Y.|Labor Arts Books|1987.
## 740                                                                                                                      Veronå|Printed by Stamperia Valdonega|1972.
## 741                                                                                                                                  London|Secker and Warburg|1975.
## 742                                                                                                                                        New York|McGraw-Hill|1974
## 743                                                                                                                                Garden City, N.Y.|Doubleday|1964.
## 744                                                                                                                        New York, N.Y.|New American Library|1989.
## 745                                                                                                                               New York|Simon and Schuster|c1976.
## 746                                                                                                                   Freeport, N.Y.|Books for Libraries Press|1972.
## 747                                                                                                                       New York|American Reprint Co.|1978, c1924.
## 748                                                                                                                                  Indianapolis|Bobbs-Merrill|1961
## 749                                                                                                                                        New York|Doubleday|c1990.
## 750                                                                                                                              Orono, Me.|Puckerbrush Press|c1978.
## 751                                                                                                                               Binghamton, N.Y.|Iris Press|c1979.
## 752                                                                                                                                          Denver|A. Swallow|1956.
## 753                                                                                                                             New York|Johnson Reprint Corp.|1969.
## 754                                                                                                                                          New York|AMS Press|1969
## 755                                                                                                                               New York|Simon and Schuster|c1971.
## 756                                                                                                                                    Artarmon, NSW|Giramondo|2005.
## 757                                                                                                                                 New York|Ballantine|1996, c1987.
## 758                                                                                                                                             London|Vintage|2007.
## 759                                                                                                                                            London|Hesperus|2007.
## 760                                                                                                                              Milsons Point, N.S.W.|Vintage|2006.
## 761                                                                                                                       Prague, Czech Republic|Twisted Spoon|2006.
## 762                                                                        London|Arcadia Books|Chicago|Distributed in the USA by Independent Publishers Group|2007.
## 763                                                                                                                                      New York|Alyson Books|2007.
## 764                                                                                                                     New York|Farrar, Straus & Young|1954, c1953.
## 765                                                                                                                          New York|Nan A. Talese/Doubleday|c2007.
## 766                                                                                                                        New Delhi|Books India International|2006.
## 767                                                                                                                                   Berkeley|Parallax Press|c2007.
## 768                                                                                                                                      New York|Other Press|c2006.
## 769                                                                                                                                  Norwalk, CT|Easton Press|c1994.
## 770                                                                                                                                  Norwalk, CT|Easton Press|c1994.
## 771                                                                                                                             New York|Harper Entertainment|c2007.
## 772                                                                                                                             London|Pickering & Chatto|2005-2006.
## 773                                                                                                                             London|Pickering & Chatto|2005-2006.
## 774                                                                                                                                   Belgrade|Stubovi kulture|2006.
## 775                                                                                                                                           London|Doubleday|2007.
## 776                                                                                                                                Norwalk, Conn.|Easton Press|1983.
## 777                                                                                                                              Norwalk, Conn.|Easton Press [c1975.
## 778                                                                                                                               Norwalk, Conn.|Easton Press|c1993.
## 779                                                                                                                                   Norwalk, Ct.|Easton Press|1988
## 780                                                                                                                                  Norwalk, CT|Easton Press|c1993.
## 781                                                                                                                                   Norwalk, CT|Easton Press|c1987
## 782                                                                                                                                   Norwalk, Ct.|Easton Press|1966
## 783                                                                                                                               Norwalk, Conn.|Easton Press|c1977.
## 784                                                                                                                               Norwalk, Conn.|Easton Press|c1986.
## 785                                                                                                                               Norwalk, Conn.|Easton Press|c1979.
## 786                                                                                                                               Norwalk, Conn.|Easton Press|c1988.
## 787                                                                                                                      Franklin Center, Pa.|Franklin Library|1976.
## 788                                                                                                               Franklin Center, Pa.|Franklin Library|1979, c1956.
## 789                                                                                                                               Norwalk, Conn.|Easton Press|c1979.
## 790                                                                                                                               Norwalk, Conn.|Easton Press|c1975.
## 791                                                                                                                               Norwalk, Conn.|Easton Press|c1978.
## 792                                                                                                                               Norwalk, Conn.|Easton Press|c1976.
## 793                                                                                                                               Norwalk, Conn.|Easton Press|c1979.
## 794                                                                                                                               Norwalk, Conn.|Easton Press|c1975.
## 795                                                                                                                                  Norwalk, CT|Easton Press|c1979.
## 796                                                                                                                                      Harmondsworth|Penguin|1970.
## 797                                                                                                                                          London|Hutchinson|1955.
## 798                                                                                                                           Kathmandu|Himalayan Pioneer Pubs.|1961
## 799                                                                                                                         Chicago|University of Chicago Press|1965
## 800                                                                                                                             London|Oxford University Press|1964.
## 801                                                                                                                                        London|Werner Laurie|1950
## 802                                                                                                                                  New York|Dodd, Mead|1970 [c1968
## 803                                                                                                                                      New York|Random House|1986.
## 804                                                                                                                                      New York|G. Braziller|1977.
## 805                                                                                                                                           London|Heinemann|1981.
## 806                                                                                                             New Orleans, La.|University Press of the South|2007.
## 807                                                                                                                  Petervale, South Africa|Crest Pub.|2007, c2006.
## 808                                                                                                                     Ljubljana|Slovene Writers' Association|2007.
## 809                                                                                                                                 Cape Town|Human & Rousseau|2006.
## 810                                                                                                                                        London|Old St. Pub.|2008.
## 811                                                                                                                                        Reading, UK|Garnet|c2008.
## 812                                                                                                                                Golden, Colo.|Fulcrum Pub.|c2008.
## 813                                                                                                                                        Reading|Garnet Pub.|2008.
## 814                                                                                                                        Westport, Conn.|Libraries Unlimited|2008.
## 815                                                                                                               Franklin Center, Pa.|Franklin Library|1978, c1948.
## 816                                                                                                                      Franklin Center, Pa.|Franklin Library|1975.
## 817                                                                                                                      Franklin Center, Pa.|Franklin Library|1976.
## 818                                                                                                                               Norwalk, Conn.|Easton Press|c1973.
## 819                                                                                                                               Norwalk, Conn.|Easton Press|c1977.
## 820                                                                                                                               Norwalk, Conn.|Easton Press|c1994.
## 821                                                                                                                               Norwalk, Conn.|Easton Press|c1992.
## 822                                                                                                                               Norwalk, Conn.|Easton Press|c1990.
## 823                                                                                                                               Norwalk, Conn.|Easton Press|c1977.
## 824                                                                                                                               Norwalk, Conn.|Easton Press|c1992.
## 825                                                                                                               Franklin Center, Pa.|Franklin Library|1978, c1943.
## 826                                                                                                                      Franklin Center, Pa.|Franklin Library|1976.
## 827                                                                                                                      Franklin Center, Pa.|Franklin Library|1976.
## 828                                                                                                                               Norwalk, Conn.|Easton Press|c1977.
## 829                                                                       S.l.|Heartworm Press|New York, NY|Distributed by] D.A.P./Distributed Art Publishers|c2008.
## 830                                                                             Cardigan [Wales|Parthian|Chester Springs, PA|U.S. distributor, Dufour Editions|2008.
## 831                                                                                                                               Kansas City|Valancourt Books|2007.
## 832                                                                                                                     Nigeria|s.n.|200-?|([Nigeria|printed by OTC)
## 833                                                                                                                               Norwalk, Conn.|Easton Press|c1986.
## 834                                                                                                                                              London|Abacus|2008.
## 835                                                                                                                                        United States?|s.n.|2006.
## 836                                                                                                                               Nashville, TN|Thomas Nelson|c2006.
## 837                                                                                                                        Johannesburg|New York|Penguin Books|2008.
## 838                                                                                                                                London|Dent|New York|Dutton|1968.
## 839                                                                                                                            Dortmund|Verlag für Orientkunde|2007.
## 840                                                                                                                                      London|Phoenix|2009, c2008.
## 841                                                                                                                                    Washington, D.C.|16 May 1972.
## 842                                                                                                                               Philadelphia|Muhlenberg Press|1961
## 843                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1971
## 844                                                                                                                                   Copenhagen|Borgen|1964, c1943.
## 845                                                                                                                                  Indianapolis|Bobbs-Merrill|1962
## 846                                                                                                                                   New York|Whittlesey House|1955
## 847                                                                                                                        Englewood Cliffs, N.J.|Prentice-Hall|1972
## 848                                                                                                                                 Los Angeles|Holloway House|c1967
## 849                                                                                                                                         New York|AMS Press|1967.
## 850                                                                                                                          New York|Farrar, Straus and Cudahy|1962
## 851                                                                                                               Accra|Anowuo Educational Publications|1968] c1966.
## 852                                                                                                                                    London|Bodley Head|1963-1966.
## 853                                                                                                                              London|Oxford University Press|1957
## 854                                                                                          London|New York [etc.|Geoffrey Cumberlege, Oxford University Press|1956
## 855                                                                                                                                       London|Folio Society|1959.
## 856                                                                                                                                    New York|Pantheon books|1950?
## 857                                                                                                                             London|Oxford University Press|1974.
## 858                                                                                                                              London|J.M. Dent & sons, ltd.|1957?
## 859                                                                                                            Gloucester|Sutton|New York, NY|Hippocrene Books|1989.
## 860                                                                                                                        Bloomington|Indiana University Press|1968
## 861                                                                                                                                   Bath|Cedric Chivers Ltd.|1971.
## 862                                                                                                                                        New York|Grove Press|1956
## 863                                                                                                                                 London|Dent|New York|Dutton|1967
## 864                                                                                                                                        London|Sphere Books|1969.
## 865                                                                                                       Oxford [Oxfordshire|New York|Oxford University Press|1987.
## 866                                                                                                                                              London|E. Ward|1962
## 867                                                                                                                                               London|Calder|1957
## 868                                                                                                                                             New York|Knopf|1953.
## 869                                                                                                                                            London|Gollancz|1951.
## 870                                                                                                                        Moscow|Progress Publishers|1975 printing.
## 871                                                                                                                                       New York|Random House|1958
## 872                                                                                                                                             London|Dedalus|1984.
## 873                                                                                                                                       London|Hogarth Press|1950.
## 874                                                                                                                                       London|Folio Society|1972.
## 875                                                                                                                             London|Weidenfeld and Nicolson|c1958
## 876                                                                               Harmondsworth, [Eng.|Penguin Books in association [with] Secker and Warburg.|1964.
## 877                                                                                                     Harmondsworth, Middlesex, England|Penguin Books|1965, c1962.
## 878                                                                                                                    Leyburn, North Yorkshire|Tartarus Press|2002.
## 879                                                                                                                                     Boston|Houghton Mifflin|1962
## 880                                                                                                                            Greenwich, Conn.|Fawcett|1965, c1962.
## 881                                                                                                                    Harmondsworth, Eng.|Penguin Books|1963,c1960.
## 882                                                                                                                                            London|Gollancz|1954.
## 883                                                                                                                                      London|Chapman & Hall|1960.
## 884                                                                                                                                    London|Chapman and Hall|1963.
## 885                                                                                                                                      London|Chapman & Hall|1950.
## 886                                                                                                                                     London|Secker & Warburg|1963
## 887                                                                                                                                 London|W. Heinemann|1967, c1962.
## 888                                                                                                                         London|New York|Franklin Watts Ltd|1971.
## 889                                                                                                                                        Boston|Little, Brown|1954
## 890                                                                                                                                          New York|AMS Press|1972
## 891                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1971
## 892                                                                                                                                         New York|M. Boyars|1989.
## 893                                                                                                                            Henley-on-Thames, Oxon|A. Ellis|1984.
## 894                                                                                                                              New York|Vintage books|1961, c1958.
## 895                                                                                                                                             London|Cassell|1966.
## 896                                                                                                                                       London|Folio Society|1962.
## 897                                                                                                                                           N.Y.|Bantam Books|1970
## 898                                                                                                                               London|MacGibbon & Kee|1964, c1961
## 899                                                                                                                                London|Hodder and Stoughton|1966.
## 900                                                                                               Los Angeles, Ca.|Gateway Editions, distributed by H. Regnery|1950.
## 901                                                                                                                              New York|New American Library|1959.
## 902                                                                                                                                            New York|B. Blom|1966
## 903                                      New York, N.Y.|Literary Classics of the United States|Distributed to the trade in the U.S. and Canada by Viking Press|1984.
## 904                                                                                                                                           London|F. Watts|c1971.
## 905                                                                                                                                       New York|Viking Press|1972
## 906                                                                                                                                             London|J. Cape|1959.
## 907                                                                                                                                    London|Secker & Warburg|1958.
## 908                                                                                                                                New York|Lancer books|1972, c1965
## 909                                                                                                                                 New York|Kraus Reprint Co.|1972.
## 910                                                                                                                             Istanbul, Turkey|Anatolia Pub.|200-?
## 911                                                                                                                                      New York|Knopf|1974, c1962.
## 912                                                                                                                                      Harmondsworth|Penguin|1971.
## 913                                                                                                                                         London|Odhams Press|1960
## 914                                                                                                                                Baltimore, Md.|Penguin Books|1961
## 915                                                                                                                                       London|Folio Society|1959.
## 916                                                                                                                               New York|New American Library|1972
## 917                                                                                                                                         London|Arrow|1968 [c1957
## 918                                                                                                                                              London|P. Owen|1970
## 919                                                                                                                                             London|Cassell|1955.
## 920                                                                                                                                    London|Secker & Warburg|1961.
## 921                                                                                                                                             New York|Putnam|1973
## 922                                                                                                                                              London|Barker|1968.
## 923                                                                                                                          London/New York|Dent/Dutton|1965, cl962
## 924                                                                                                                                          London|Hutchinson|1966.
## 925                                                                                                                    Freeport, N.Y.|Books for Libraries Press|1971
## 926                                                                                                                                   Cleveland|World Pub. Co.|1961.
## 927                                                                                                                  Blauvelt, N.Y.|Rudolf Steiner Publications|1973
## 928                                                                                                                                    New York|Pantheon Books|1986.
## 929                                                                                                                                     London|Faber and Faber|1952.
## 930                                                                                                                  East Lansing|Michigan State College Press|1954.
## 931                                                                                                                                       Taipei|Heritage Press|1961
## 932                                                                                                                            New York|Duell, Sloan and Pearce|1955
## 933                                                                                                          Bath (Portway, Bath, Somerset)|Cedric Chivers Ltd|1971.
## 934                                                                                                                                         London|V. Gollancz|1963.
## 935                                                                                                                                               New York|Avon|1969
## 936                                                                                                                                             New York|Knopf|1951.
## 937                                                                                                                                          London|H. Hamilton|1961
## 938                                                                                                                                 London|New American Library|1968
## 939                                                                                           Morley (Elmfield Rd., Morley, Yorkshire LS27 ONN)|Elmfield Press|1973.
## 940                                                                                                                                          New York|Pantheon|c1959
## 941                                                                                                                                              London|J. Cape|1960
## 942                                                                                                                                    London|Secker & Warburg|1956.
## 943                                                                                                      Harmondsworth|Penguin in association with H. Hamilton|1966.
## 944                                                                                                                                 Harmondsworth|Penguin Books|1967
## 945                                                                                                                                  New York|Delacorte Press|1971].
## 946                                                                                                                                      New York|Noonday Press|1959
## 947                                                                                                                            London|The Folio Society|1967, c1959.
## 948                                                                                                                                      Harmondsworth|Penguin|1968.
## 949                                                                                                                            New York|Appleton-Century-Crofts|1961
## 950                                                                                                                                   London|Rex Collings Ltd.|1970.
## 951                                                                                                                                       London|Jonathan Cape|1956.
## 952                                                                                                                                          London|Hutchinson|1960.
## 953                                                                                                                                           London|Macmillan|1955.
## 954                                                                                                                               London|William Heinemann Ltd|1953.
## 955                                                                                                                                         Bath|Lythway Press|1973.
## 956                                                                                                                             London|Weidenfeld and Nicolson|c1972
## 957                                                                                                                                  Waterville, Me.|Five Star|2002.
## 958                                                                                                                                       New York|Award Books|c1967
## 959                                                                                                                     Nairobi, Kenya|East African Pub. House|1966.
## 960                                                                                                                                          London|H. Hamilton|1961
## 961                                                                                                                     Sydney|London|Angus & Robertson Limited|1957
## 962                                                                                                                                             London|Collins|1973.
## 963                                                                                                                                           Denver|A. Swallow|1963
## 964                                                                                                                                        Johannesburg|Donker|1975.
## 965                                                                                                                                         London|V. Gollancz|1963.
## 966                                                                                                                      Kampala|East African Literature Bureau|1970
## 967                                                                                                                                          Sofia|Sofia-Press|1969.
## 968                                                                                                                                        London|John Murray|c1962.
## 969                                                                                                                                            New York|Dutton|1958.
## 970                                                                                                             Washington|Joint Publications Research Service|1972.
## 971                                                                                                             Washington|Joint Publications Research Service|1972.
## 972                                                                                                                                     New York|Berkley|1969, c1963
## 973                                                                                                                                    London|Bodley Head|1963-1966.
## 974                                                                                                                                   New York|AMS Press|1970, c1925
## 975                                                                                                                                   London|Adventurers Club|c1958.
## 976                                                                                                                                       New York|W. W. Norton|1967
## 977                                                                                                                                        New York|Arts, Inc.|1952.
## 978                                                                                                                                London|Dent|New York|Dutton|1952.
## 979                                                                                                                               Berlin|Seven Seas Publishers|1962.
## 980                                                                                                                                     London|MacGibbon & Kee|1950.
## 981                                                                                                                                   New York|AMS Press|1971, c1926
## 982                                                                                                                                       New York|Dell|1974, c1972.
## 983                                                                                                                                          New York|Ace Books|1963
## 984                                                                                                                                   New York|Pantheon Books|c1987.
## 985                                                                                                                                    New York|Vantage Press|c1987.
## 986                                                                                                                                         New York|H. Fertig|1988.
## 987                                                                                                                    London|Collins-Harvill|1971|(1989 [printing])
## 988                                                                                                                             New York|New American Library|c1989.
## 989                                                                                                                         Garden City, N.Y.|Doubleday|1986, c1985.
## 990                                                                                                                                             New York|Knopf|1959.
## 991                                                                                                                              New York|Vintage Books|1989, c1970.
## 992                                                                                                             St. Lucia, Qld.|University of Queensland Press|1989.
## 993                                                                                                                                           London|M. Joseph|1989.
## 994                                                                                                                                             London|Fontana|1980.
## 995                                                                                                                    New York|Fromm International Pub. Corp.|1989.
## 996                                                                                                                                      London|Fontana|1988, c1970.
## 997                                                                                                                                           London|Heinemann.|1960
## 998                                                                                                                                           New York|Penguin|1989.
## 999                                                                                                                         New York|Holmes & Meier|c1987-<c1988   >
## 1000                                                                                                                            New York|Overlook Press|1984, c1966.
## 1001                                                                                                                                             London|Collins|1956
## 1002                                                                  London|New York|Allison & Busby|New York|Distributed in the USA by Schocken Books|1983, c1966.
## 1003                                                                                                                                 New York|Freundlich Books|1984.
## 1004                                                                                                                                            London|Metheun|1984.
## 1005                                                                         St Lucia, Qld., Australia|New York|University of Queensland Press|1984 printing, c1974.
## 1006                                                                                                                              New York|Harper & Row|1984, c1961.
## 1007                                                                                                                          New York|Simon & Schuster|1984, c1963.
## 1008                                                                                                                                       New York|Ecco Press|1985.
## 1009                                                                                                                             Horsham, Sussex|Caliban Books|1983.
## 1010                                                                                                                     Woodstock, N.Y.|Overlook Press|1983, c1974.
## 1011                                                                                                                                     Harmondsworth|Penguin|1983.
## 1012                                                                                                                                   London|New York|Granada|1981.
## 1013                                                                                                                             London|Chatto & Windus|1976, c1975.
## 1014                                                                                                                                      Ottawa|Oberon Press|c1984.
## 1015                                                                                                                                   New York|Vantage Press|c1984.
## 1016                                                                                                                        London|Melbourne|Hutchinson|1983, c1970.
## 1017                                                                             Boston|Shambhala|New York|Distributed in the U.S. by Random House|1979 [i.e. 1985].
## 1018                                                                                                                                            London|Methuen|1984.
## 1019                                                                                                                                         London|W.H. Allen|1984.
## 1020                                                                                                    New York|Avenel Books|Distributed by Crown Publishers|c1985.
## 1021                                                                                                                              Garden City, N. Y.|Doubleday|1959.
## 1022                                                                                                                                     London|Hamish Hamilton|1950
## 1023                                                                                                                              Woodstock, NY|Overlook Press|1984.
## 1024                                                                                                                              New York|Pocket Books|1984, c1983.
## 1025                                                                                                                                   New York|Pantheon Books|1985.
## 1026                                                                                                                           Sydney|Angus & Robertson|1980, c1926.
## 1027                                                                                                                              Woodstock, NY|Overlook Press|1985.
## 1028                                                                                                                                            London|Dedalus|1984.
## 1029                                                                                                                              New York|New American Library|1984
## 1030                                                                                                                                             London|Viking|1986.
## 1031                                                                                                                                        London|Robin Clark|1986?
## 1032                                                                                                                            New York|Schocken Books|1986, c1973.
## 1033                                                                                                                           Enugu, Nigeria|Fourth Dimension|1984.
## 1034                                                                                                                San Diego|Harcourt Brace Jovanovich|1985, c1968.
## 1035                                                                                                                                               London|Dent|1984.
## 1036                                                                                                                      Toronto, Ont.|Lester & Orpen Dennys|c1984.
## 1037                                                                                                                                            New York|Avon|c1985.
## 1038                                                                                                  Harmondsworth, Middlesex, England|New York, N.Y.|Penguin|1983.
## 1039                                                                                                                     Oxford|Oxford University Press|1985, c1963.
## 1040                                                                                                                                      London|Andre Deutsch|1983.
## 1041                                                                                                                              Harmondsworth|Penguin|1982, c1970.
## 1042                                                                                                                             London|Picador|1982|(1983 printing)
## 1043                                                                                                                                     London|Hogarth|1985, c1958.
## 1044                                                                                                                                  London|Journeyman|1983, c1976.
## 1045                                                                                                                                                S.l.|s.n.|c1984.
## 1046                                                                                                                                 Moscow|Raduga Publishers|c1984.
## 1047                                                                                                                                   London|New York|Quartet|1985.
## 1048                                                                                                                                     London|Fontana|1984, c1967.
## 1049                                                                                                                  London|Eland|New York : Hippocrene Books|1985.
## 1050                                                                                                                                         Gloucester|Sutton|1985.
## 1051                                                                                                                                        London|Robin Clark|1985.
## 1052                                                                                                                             London|New York|Quartet|1985, 1960.
## 1053                                                                                                                                   London|New York|Quartet|1986.
## 1054                                                                                                                                    Gloucester|Alan Sutton|1985.
## 1055                                                                                                                                     Harmondsworth|Penguin|1985.
## 1056                                                                                                                   Quakertown, Pa.|Philosophical Pub. Co.|c1984.
## 1057                                                                                                                               Moscow|Progress Publishers|c1982.
## 1058                                                                                                                                        New York|H. Fertig|1975.
## 1059                                                                                                                                 Moscow|Raduga Publishers|c1984.
## 1060                                                                                                                           Ogui, Enugu, Nigeria|Tana Press|1984.
## 1061                                                                                            Harmondsworth, Middlesex, England|New York, N.Y.|Penguin Books|1976.
## 1062                                                                                                                                 Indianapolis|Bobbs-Merrill|1973
## 1063                                                                                                                San Diego|Harcourt Brace Jovanovich|1986, c1974.
## 1064                                                                                                                                                London|Pan|1985.
## 1065                                                                                                                San Diego|Harcourt Brace Jovanovich|1986, c1973.
## 1066                                                                                                                                        London|Evans Bros.|1980.
## 1067                                                                                                                                    London|Chatto & Windus|1986.
## 1068                                                                       Portales, N.M.|Llano Estacado Center for Advanced Professional Studies and Research|1984.
## 1069                                                                                                         St. Lucia|New York|University of Queensland Press|1987.
## 1070                                                                                                                                           London|Hamilton|1986.
## 1071                                                                                                    London|Dedalus|New York, N.Y., U.S.A.|Hippocrene Books|1987.
## 1072                                                                                                                                         London|Pan|1986, c1984.
## 1073                                                                                                                                New York|Ecco Press|1986, c1972.
## 1074                                                                                                                              New York|G. Braziller|1986] c1959.
## 1075 Ringwood, Victoria, Australia|Viking/Kestrel, published with the assistance of the Literature Board of the Australia Council|New York, N.Y.|Penguin Books|1984.
## 1076                                                                                                                                 Moscow|Raduga Publishers|c1985.
## 1077                                                                                                                         London|Eyre & Spottiswoode|1963, c1962.
## 1078                                                                                                                                     London|Panther|1985, c1956.
## 1079                                                                                                                                      London|Abacus|1985, c1983.
## 1080                                                                                                                       New York, N.Y.|Penguin Books|1986, c1985.
## 1081                                                                                                                               Wheaton, Ill.|Victor Books|c1986.
## 1082                                                                                                                  Blauvelt, N.Y., U.S.A.|Freedeeds Library|1986.
## 1083                                                                                         Boston|Shambhala|New York|Distributed in the U.S. by Random House|1986.
## 1084                                                                                                                                  New York|Available Press|1985.
## 1085                                                                       South Yarra, Vic.|L. O'Neil for C. O'Neil|Melbourne|Distributed by Gordon and Gotch|1984.
## 1086                                                                                                                 Harare, Zimbabwe|College Press (PVT) ltd.|1984.
## 1087                                                                                                                                         London|W.H. Allen|1983.
## 1088                                                                                                                        New York|Taplinger Pub. Co.|1979, c1973.
## 1089                                                                                                                                             Moscow|Raduga|1986.
## 1090                                                                                                                                            London|Methuen|1987.
## 1091                                                                                                                      Bloomington|Indiana University Press|1987.
## 1092                                                                                                                                     New York|Garland Pub.|1978.
## 1093                                                                                                                             London|Collins Harvill|1987, c1958.
## 1094                                                                                                                          Melbourne|Nelson|c1983|(1985 printing)
## 1095                                                                                                                                 Enugu, Nigeria|Tana Press|1986.
## 1096                                                                                                                           London|Methuen Paperback|1988, c1987.
## 1097                                                                                                                                Cambridge, Mass.|C & T Co.|1976.
## 1098                                                                                                                            Kiev|Dnipro Publishers|1985, c 1981.
## 1099                                                                                                                          New York, N.Y.|Avon Books|1967, c1965.
## 1100                                                                                                                                  Sydney|Angus & Robertson|1962.
## 1101                                                                                                                                          Moscow|Progress|c1980.
## 1102                                                                                                          Aylesbury|Sparta, N.J.|Howard Timmins Publishers|1981.
## 1103                                                                                                                New York|Harcourt Brace Jovanovich|1982], c1968.
## 1104                                                                                                                        San Francisco|Harper & Row|1982], c1981.
## 1105                                                                                                                                          New York|Dutton|c1982.
## 1106                                                                                                                                 Leicester, Eng.|Charnwood|1982.
## 1107                                                                                                                        Santa Barbara|Black Sparrow|1982, c1955.
## 1108                                                                                                         St. Lucia|New York|University of Queensland Press|1982.
## 1109                                                                                                                   Oxford|New York|Oxford University Press|1983.
## 1110                                                                                                                           New York?|Johnson Reprint Corp.|1980.
## 1111                                                                                                                           New York?|Johnson Reprint Corp.|1980.
## 1112                                                       Findhorn|Thule Press|Denington Estate, Wellingborough Northants|Distributed by Thorsons Publishers|c1981.
## 1113                                                                                                                          Doncaster, Australia|Bayda Books|1980.
## 1114                                                                                                                         Moscow|Progress Publishers|1977, c1972.
## 1115                                                                                                                                           London|Macdonald|1957
## 1116                                                                                                                                       Seattle|Fjord Press|1989-
## 1117                                                                                                                          Doncaster, Australia|Bayda Books|1980.
## 1118                                                                                                London|Macmillan|Moka, Mauritius|Edition de l'Océan Indien|1979.
## 1119                                                                                                         Toronto|Buffalo [N.Y.|University of Toronto Press|1980.
## 1120                                                                                                                  St. Lucia|University of Queensland Press|1980.
## 1121                                                                                                                                   London|Heinemann|1980, c1961.
## 1122                                                                                                                     Harmondsworth|New York|Penguin|1984, c1963.
## 1123                                                                                                                                           London|J. Cape|1952].
## 1124                                                                                                                                Gloucester, Mass.|P. Smith|1981.
## 1125                                                                                                                      London|Fontana|1970, c1969|(1983 printing)
## 1126                                                                                                                                            Nairobi|Uzima|c1980.
## 1127                                                                                                                                               Kiev|Dnipro|1981.
## 1128                                                                                                                                    London|Mayflower Books|1965.
## 1129                                                                                                                                New York|Kraus Reprint Co.|1972.
## 1130                                                                                                                                            London|R. Hale|1979.
## 1131                                                                                                                       Fresno, Calif.|Academy Library Guild|1959
## 1132                                                                                                              Boroko|Institute of Papua New Guinea Studies|1980.
## 1133                                                                                                                                   London|D. Dobson|1978, c1977.
## 1134                                             London|New York|Allison & Busby|New York, N.Y.|Distributed in the USA by Schocken Books|1979, c1969|(1983 printing)
## 1135                                                                                                                            London|Secker & Warburg|1978, c1977.
## 1136                                                                                                                                   London|J. Calder|1965, c1959.
## 1137                                                                                                                                     New York|McGraw-Hill|c1981.
## 1138                                                                                                                       Ljubljana|Državna založba Slovenije|1976.
## 1139                                                                                                                          San Francisco|Gay Sunshine Press|1979.
## 1140                                                                                                                                        New York|H. Fertig|1979.
## 1141                                                                                                                                           London|Heinemann|1959
## 1142                                                                                                                        Cambridge, Mass.|R. Bentley|1980, c1949.
## 1143                                                                                                                           Cambridge, MA|R. Bentley|1980, c1924.
## 1144                                                                                                       Pyongyang, Korea|Foreign Languages Publishing House|1979.
## 1145                                                                                                                            Westport, Conn.|Hyperion Press|1978.
## 1146                                                                                                                                 London|V. Gollancz|1978, c1931.
## 1147                                                                                          Harmondsworth, Middlesex, England|New York, N.Y., U.S.A.|Penguin|1978.
## 1148                                                                                                                                           London|I. Allen|1977.
## 1149                                                                                                                                            London|J. Cape|1978.
## 1150                                                                                                                Harmondsworth, Eng.|New York|Penguin Books|1978.
## 1151                                                                                                                                            New York|Putnam|1963
## 1152                                                                                                              London|Macmillan|New York|St. Martin's Press|1958.
## 1153                                                                                                                                         Toronto|Macmillan|1958.
## 1154                                                                                                                               Moscow|Progress Publishers|c1986.
## 1155                                                                                                                            Westport, Conn.|Hyperion Press|1977.
## 1156                                                                                                                            Westport, Conn.|Hyperion Press|1977.
## 1157                                                                                                                       London|Collins [for] The Crime Club|1976.
## 1158                                                                                                                                   Johannesburg|AD. Donker|1974.
## 1159                                                                                                                                         London|Hutchinson|1976.
## 1160                                                                                                                            Harmondsworth|New York|Penguin|1976.
## 1161                                                                                                                                       Nairobi|Transafrica|1976.
## 1162                                                                                                                            Ibadan, Nigeria|New Horn Press|1975.
## 1163                                                                                                                            Westport, Conn.|Hyperion Press|1977.
## 1164                                                                                                                                London|Eyre & Spottiswoode|1954.
## 1165                                                                                                                            La Habana|Casa de las Américas|1976.
## 1166                                                                                                                             New York|Vintage Books|1978, c1965.
## 1167                                                                                                                                     Tema|Ghana Pub. Corp.|1976.
## 1168                                                                                                                                          London|Pan Books|1976.
## 1169                                                                                                                                                            1974
## 1170                                                                                                                            London|Weidenfeld and Nicolson|1977.
## 1171                                     Yellowknife, N.W.T.|Programme Development Division, Department of Education, Government of the Northwest Territories|c1976.
## 1172                                                                                                                                 New York|Ballantine Books|1978.
## 1173                                                                                                                                           London|Macdonald|1956
## 1174                                                                                                                                       London|Bodley Head|c1975.
## 1175                                                                                                                               London|Dent|New York|Dutton|1974.
## 1176                                                                                                                        Garden City, N.Y.|Doubleday|1976, c1974.
## 1177                                                                                                                                             Nairobi|Spear|1975.
## 1178                                                                                                                                 New York|Four Winds Press|1976.
## 1179                                                                                                                                           London|Hamilton|1975.
## 1180                                                                                                                   Berkeley, Calif.|Creative Arts Book Co.|1976.
## 1181                                                                                                                               New York|F. Ungar Pub. Co.|c1976.
## 1182                                                                                                                                               London|Owen|1976.
## 1183                                                                                                                     Harmondsworth, Eng.|Baltimore|Penguin|1976.
## 1184                                                                                                                                    London|MacGibbon & Kee|1957.
## 1185                                                                                                              St. Lucia, Q.|University of Queensland Press|1975.
## 1186                                                                                                                            Westport, Conn.|Hyperion Press|1977.
## 1187                                                                                                                                        New York|H. Fertig|1976.
## 1188                                                                                                                                        London|W. Heinemann|1957
## 1189                                                                                                                                           Nairobi|Longman|1975.
## 1190                                                                                   Harmondsworth|Penguin Books in association with Martin Secker & Warburg|1964.
## 1191                                                                                                                                      Haifa|Haifa Pub. Co.|1960.
## 1192                                                                                                                                   London|Allison and Busby|1976
## 1193                                                                                                                                        London|Bodley Head|1975.
## 1194                                                                                                                                    New York|Penguin Books|1978.
## 1195                                                                                                                            Westport, Conn.|Hyperion Press|1978.
## 1196                                                                                                                            Westport, Conn.|Hyperion Press|1978.
## 1197                                                                                                                                  New York|H. Fertig|1974 [c1930
## 1198                                                                                                                          New York|Harcourt, Brace & World|1961.
## 1199                                                                                                                                               London|Cape|1972.
## 1200                                                                                                                                      London|Fontana|1972, 1975.
## 1201                                                                                                Harmondsworth [Eng.|Baltimore|Penguin Books|1966, 1975 printing.
## 1202                                                                                                                         London|W. Heinemann & Bodley Head|1974.
## 1203                                                                                                                                           London|J. Murray|1960
## 1204                                                                                                                                        New York|Dodd, Mead|1955
## 1205                                                                                                                                    New York|Putnam|1975, c1973.
## 1206                                                                                                                            London|New York|Abelard-Schuman|1962
## 1207                                                                                                                                 New York|Scribners̓|1975, c1948.
## 1208                                                                                                                         Garden City, N.Y.|Doubleday|1961 [c1960
## 1209                                                                                                      Oxford [Oxfordshire|New York|Oxford University Press|1987.
## 1210                                                                                                                            Boston|Houghton Mifflin|1963, c1943.
## 1211                                                                                                                                        Oxford|B. Cassirer|1962.
## 1212                                                                                                                            New York|Meridian Books|1960, c1955.
## 1213                                                                                                                   Freeport, N.Y.|Books for Libraries Press|1972
## 1214                                                                                                                                           London|Heinemann|1963
## 1215                                                                                                                                            London|Cassell|1967.
## 1216                                                                                                                                 Sydney|Angus and Robertson|1970
## 1217                                                                                                                           Sydney|Angus & Robertson|1973, c1969.
## 1218                                                                                                                                             London|Collins|1953
## 1219                                                                                                                                 New York|Dodd, Mead|1974, c1935
## 1220                                                                                                                             London|Arthur Barker Limited|c1963.
## 1221                                                                                                                                 Johannesburg|Raven Press|c1981.
## 1222                                                                                                                         London|Writers and Readers|1983, c1968.
## 1223                                                                                                                                    London|Fontana/Collins|1980.
## 1224                                                                                                                           London|New York|Longmans|1960, c1959.
## 1225                                                                                                                               New York|The Modern Library|1983.
## 1226                                                                                                                                London|Dent|New York|Dutton|1979
## 1227                                                                                                                                    New York|Penguin Books|1983.
## 1228                                                                                                                              New York, N.Y.|Penguin Books|1984.
## 1229                                                                                                                                   Boston, Mass.|G.K. Hall|1983.
## 1230                                                                                                                                          Moscow|Progress|c1982.
## 1231                                                                                                                   Oxford|New York|Oxford University Press|1982.
## 1232                                                                                                                                      London|Soho Book Co.|1986.
## 1233                                                                                                                                          London|E. Arnold|1955.
## 1234                                                                                                                                New York, N.Y.|Avon Books|c1986.
## 1235                                                                                                                San Diego|Harcourt Brace Jovanovich|1987, c1969.
## 1236                                                                                                                        Borrowdale, Zimbabwe|Welston Press|1983.
## 1237                                                                                                         St. Lucia|New York|University of Queensland Press|1987.
## 1238                                                                                        Gloucester|Sutton|Toronto, Ontario, Canada|New Canada Publications|1987.
## 1239                                                                           Harmondsworth, Middlesex, Eng.|Penguin Books|New York, NY|Viking Penguin|1987, c1986.
## 1240                                                                                                                                           London|Hamilton|1988.
## 1241                                                                                                                                       New York, N.Y.|Avon|1987.
## 1242                                                                                                          Oakville, Ontario, Canada|New York|Mosaic Press|c1987.
## 1243                                                                                                                                            Sawtry|Dedalus|1988.
## 1244                                                                                                                                 New York|H. Fertig|1988, c1931.
## 1245                                                                                                                               Moscow|Progress Publishers|c1986.
## 1246                                                                                                         St. Lucia|New York|University of Queensland Press|1988.
## 1247                                                                                                                             London|New York|Arkana|1988, c1972.
## 1248                                                                                                                                       Bath|Chivers|1988, c1960.
## 1249                                                                                                                                    New York|Collier Books|1988.
## 1250                                                                                                           Ibadan|Evans Brothers (Nigeria Publishers) Ltd.|1986.
## 1251                                                                                                     New York|Schocken Books|Distibuted by Pantheon Books|c1988.
## 1252                                                                                                                                          London|Heinemann|1960.
## 1253                                                                                                                         London|Futura Publications|1987, c1986.
## 1254                                                                                                                              Manchester, England|Carcanet|1988.
## 1255                                                                                                                                   New York|Pantheon Books|1989.
## 1256                                                                                                                                      Moscow|Vysšaja Škola|1985.
## 1257                                                                                                                                            London|Collins|1954.
## 1258                                                                                                                           London|London Magazine Editions|1975.
## 1259                                                                                                                          Cutchogue, N.Y.|Buccaneer Books|c1983.
## 1260                                                                                                                           South Melbourne, Vic.|Macmillan|1974.
## 1261                                                                                                                                        Tallinn|Perioodika|1985.
## 1262                                                                                                                                     New York, N.Y.|Viking|1988.
## 1263                                                                                                               Oxford, OX|New York|Oxford University Press|1988.
## 1264                                                                                                                                         New York|Atheneum|1987.
## 1265                                                                                                      Manchester|Carcanet|New York|Farrar, Straus & Giroux|1987.
## 1266                                                                                         St Lucia, Qld., Australia|New York|University of Queensland Press|1988.
## 1267                                                                                                                                    Kiev|Dnipro Publishers|1985.
## 1268                                                                     London|New York|M. Boyars|New York|Distributed in the United States by Kampmann & Co.|1988.
## 1269                                                                                                                                        London|Bishopsgate|1989.
## 1270                                                                                                                             New York|Penguin Books|1989, c1953.
## 1271                                                                                                                                     London|Quartet|1989, c1976.
## 1272                                                                                                                          New York|Ballantine Books|1989, c1986.
## 1273                                                                                                                     Harmondsworth, England|Penguin|1989, c1970.
## 1274                                                                                                                               New York|Dover Publications|1989.
## 1275                                                                                                                                         Bucharest|Minerva|1983.
## 1276                                                                                                                                          London|J.M. Dent|1958.
## 1277                                                                                                                   Johannesburg|Afrikaanse Pers-Boekhandel|1964.
## 1278                                                                    Beijing, China|New World Press|Distributed by China Publications Centre (Guoji Shudian)|1983
## 1279                                                                                                                                   London|Macdonald|1970, c1969.
## 1280                                                                Beijing, China|Chinese Literature|Distributed by China Publications Centre (Guoji Shudian)|1982.
## 1281                                                                                                                                             London|G. Bles|1950
## 1282                                                                                                                                           London|E. Ward|c1964.
## 1283                                                                                        Portland, Or.|Finnish-American Literary Heritage Foundation|1982, c1934.
## 1284                                                                                                                                   New York|Harmony Books|c1983.
## 1285                                                                                                                                     Moscow|Raduga|1983], c1975.
## 1286                                                                                                                                        Tallinn|Perioodika|1981.
## 1287                                                                                                                      Bloomington|Indiana University Press|1985?
## 1288                                                                                                          Sydney, NSW, Australia|Western Plains Publishers|1985.
## 1289                                                                                                                 Amherst|University of Massachusetts Press|1987.
## 1290                                                                                Rockville, Md. (11225 Huntover Dr., Rockville, Md. 20852)|Kabel Publishers|1987.
## 1291                                                                                Rockville, Md. (11225 Huntover Dr., Rockville, Md. 20852)|Kabel Publishers|1987.
## 1292                                                                                                                                           London|Routledge|1952
## 1293                                                                                                            South Hadley, Mass.|Bergin & Garvey Publishers|1983.
## 1294                                                                                                                                       New York|H.Z. Walck|1965?
## 1295                                                                                                                                           London|Longmans|1961.
## 1296                                                                                                                                       New York|Arno Press|1980.
## 1297                                                                                                                           Nairobi|Kenya Literature Bureau|1978.
## 1298                                                                                                                                            New York|Knopf|1980.
## 1299                                                                                                                             London|Thomas Nelson and Sons|1950.
## 1300                                                                                                                 Reykjavik, Iceland|Iceland Review Library|1977.
## 1301                                                                                                                 Reykjavik, Iceland|Iceland Review Library|1977.
## 1302                                                                                                                                     Budapest|Corvina Press|1964
## 1303                                                                                                                                      London|A. Probsthain|1958.
## 1304                                                                                                              Nendelm, Liechtenstein|Kraus Reprint Limited|1967.
## 1305                                                                                                                           Toronto|Peter Martin Associates|c1968
## 1306                                                                                                          Rutherford|Fairleigh Dickinson University Press|c1978.
## 1307                                                                                                                             Seoul|Hanguk Munhwa Pub. Co.|c1974.
## 1308                                                                                                                             Seoul|Hanguk Munhwa Pub. Co.|c1974.
## 1309                                                                                                                              Philadelphia|Dufour Editions|1962.
## 1310                                                                                                                                             Adelaide|Rigby|1970
## 1311                                                                                                                                           New York|B. Blom|1968
## 1312                                                                                                                                    London|New York|Hamlyn|c1970
## 1313                                                                                                                                        Rutland, Vt.|Tuttle|1955
## 1314                                                                                                                            Cleveland|World Pub. Co.|1967, c1965
## 1315                                                                                                                                    New York|Roy Publishers|1959
## 1316                                                                                                                                New York|Kraus Reprint Co.|1971.
## 1317                                                                                                     London|Chapman and Hall|1857.|Norwood, Pa.|Norwood ed.|1974
## 1318                                                                                                                                               World|1965, c1964
## 1319                                                                                                    Berea, Ky.|Council of the Southern Mountains Publishers|1963
## 1320                                                                                                                           Lahaska, Pa.|New Hope Pub. Co.|c1975.
## 1321                                                                                                                                         New York|AMS Press|1969
## 1322                                                                                                                 Hong Kong|Chinese University of Hong Kong|1968.
## 1323                                                                                                                Columbia|University of South Carolina Press|1971
## 1324                                                                                                                            Detroit|Blaine Ethridge--Books|1971.
## 1325                                                                                                                                               London|Bell|1971.
## 1326                                                                                                                                    New York|Schocken Books|1967
## 1327                                                                                                London|Phoenix House|Madison|University of Wisconsin Press|1965.
## 1328                                                                                                                                                London|Benn|1954
## 1329                                                                                                                        Tokyo|Rutland, Vt.|C. E. Tuttle Co.|1956
## 1330                                                                                                                          New York|Negro Universities Press|1969
## 1331                                                                                                              Carbondale|Southern Illinois University Press|1968
## 1332                                                                                                                              New York|New American Library|1966
## 1333                                                                                                                                         New York|AMS Press|1968
## 1334                                                                                                                                  Cleveland|World Pub. Co.|c1966
## 1335                                                                                                                               New York|Harper & Row|1973, c1972
## 1336                                                                                                                            London|Oxford University Press|1972.
## 1337                                                                        Austin|Published for the American Folklore Society by the University of Texas Press|1974
## 1338                                                                                                                                    London|Routledge & Paul|1952
## 1339                                                                                                                    Arlington, Va.|Warm-Soft Village Press|1974.
## 1340                                                                                                                        London|Kahn & Averill; Stanmore P.|1966.
## 1341                                                                                                                                         London|Hart-Davis|1967.
## 1342                                                                                                                              New York|New American Library|1962
## 1343                                                                                                                       New York|New American Library|1972, c1962
## 1344                                                                                                                           New York|The Odyssey Press|1960,c1940
## 1345                                                                                                                          Toms River, N.J.|Capricorn Books|1982.
## 1346                                                                                                                          Delhi, India|Mittal Publications|1987.
## 1347                                                                                                                                        New York|Pantheon|c1980.
## 1348                                                                                                                Bloomington|Indiana University Press|1974, c1964
## 1349                                                                                                                      New York, N.Y.|New American Library|c1989.
## 1350                                                                                                                      Moscow|Raduga|Wellingborough|Collets|1988.
## 1351                                                                                                                      Moscow|Raduga|Wellingborough|Collets|1988.
## 1352                                                                                                                   West Bloomfield, Mich.|Phantasia Press|c1985.
## 1353                                                                                                                                        London|V. Gollancz|1965.
## 1354                                                                                                                                        New York|H. Fertig|1975.
## 1355                                                                                                                      Bloomington|Indiana University Press|1985.
## 1356                                                                                                                             London|Sydney|The Bodley Head|1982.
## 1357                                                                                                            Freeport, N.Y.|Books for Libraries Press|1970, c1931
## 1358                                                                                                            Chapel Hill|University of North Carolina Press|1962.
## 1359                                                                                                                                   New York|Atheneum|1964 [c1963
## 1360                                                                                                                                            New York|Norton|1966
## 1361                                                                                                                  Berkeley|University of California Press|c1979.
## 1362                                                                                                                                Gloucester, Mass.|P. Smith|1968.
## 1363                                                                                                                                           |Modern Library|1954.
## 1364                                                                                                                                          New York|Scribner|1957
## 1365                                                                                                                                     New York|Viking Press|1977.
## 1366                                                                                                                              New York|G. Braziller|1975] c1925.
## 1367                                                                                                                                    New York|New Directions|1954
## 1368                                                                                                                               Garden City, N.Y.|Doubleday|1974.
## 1369                                                                                                          Greenwich, Connecticut|Fawcett Publications, Inc.|1958
## 1370                                                                                                                                   London|Secker & Warburg|1953-
## 1371                                                                                                                                   London|Secker & Warburg|1953-
## 1372                                                                                                                           Garden City, N.Y.|Hanover House|1958.
## 1373                                                                                                                           New York|Harcourt, Brace & World|1968
## 1374                                                                                                                                               London|Cape|1968.
## 1375                                                                                                                                            New York|Knopf|1974.
## 1376                                                                                                                                    London|Calder & Boyars|1974.
## 1377                                                                                                                              New York|Harper & Row|1976, c1975.
## 1378                                                                                                                                London|Dent|New York|Dutton|1964
## 1379                                                                                                                                                London|Dent|1955
## 1380                                                                                                                                     New York|Collier Books|1971
## 1381                                                                                                                              New York|Collier Books|1971, c1960
## 1382                                                                                                                                            New York|Knopf|1962.
## 1383                                                                                                                                    London|Heinemann|1965, c1964
## 1384                                                                                                                                   London|Secker & Warburg|1953-
## 1385                                                                                                                           New York|Harcourt, Brace & World|1962
## 1386                                                                                                                                            London|Jarrolds|1963
## 1387                                                                                                                                       New York|A.A. Knopf|1955.
## 1388                                                                                                                              New York|Garland Pub.|1975, c1966.
## 1389                                                                                                                                          New York|Crowell|1974.
## 1390                                                                                                                     Woodstock, N.Y.|Overlook Press|1982, c1931.
## 1391                                                                                                                                          London|Hamilton|c1976.
## 1392                                                                                                                                    New York|Summit Books|c1980.
## 1393                                                                                                                                  New York|Delacorte Press|1978.
## 1394                                                                                                                        New York|New Directions Pub. Corp.|1977.
## 1395                                                                                                                                            New York|Knopf|1976.
## 1396                                                                                                                          New York|Larchwood Publications|c1981.
## 1397                                                                                                                                       Boston|Beacon Press|1957.
## 1398                                                                                                                                             Boston|Godine|1981.
## 1399                                                                                                                                        London|Bodley Head|1981.
## 1400                                                                                                                           London|Licolns-Prager|1959, i.e. 1960
## 1401                                                                                                                               Garden City, N.Y.|Doubleday|1967.
## 1402                                                                                                                               New York|Viking Press|1968, c1959
## 1403                                                                                                                        New York|Harper & Row, Publishers|c1982.
## 1404                                                                                                                                  New York|Delacorte Press|1966.
## 1405                                                                                                                                 London|Secker and Warburg|1956.
## 1406                                                                                                                     Madison|University of Wisconsin Press|1966.
## 1407                                                                                                                                         London|H. Hamilton|1950
## 1408                                                                                                                                            New York|Putnam|1971
## 1409                                                                                                                                  New York|Harcourt|c1962, 1964.
## 1410                                                                                                                                            New York|Knopf|1956.
## 1411                                                                                                                      Urbana|University of Illinois Press|c1977.
## 1412                                                                                                                                     London|Michael Joseph|1957.
## 1413                                                                                                                              New York|Coward-McCann|1967, c1966
## 1414                                                                                                                                    Oxford|Clarendon Press|1964.
## 1415                                                                                                                                 Sydney|Angus and Robertson|1959
## 1416                                                                                                                          Glen Ellen, CA|Entwhistle Books|c1979.
## 1417                                                                                                                                  Winston-Salem|J. F. Blair|1967
## 1418                                                                                                                                   Boston|Houghton Mifflin|1958.
## 1419                                                                                                                                 Sydney|Angus and Robertson|1955
## 1420                                                                                                                                           New York|Dutton|1975.
## 1421                                                                                                                                          New York|Garland|1978.
## 1422                                                                                                                                      New York|Harper & Row|1974
## 1423                                                                                                                               New York|Praeger Publishers|1976.
## 1424                                                                                                                              New York|St. Martin's Press|c1963.
## 1425                                                                                                                                               London|Cape|1966.
## 1426                                                                                                                               Garden City, N.Y.|Doubleday|1956.
## 1427                                                                                                                                London|Eyre & Spottiswoode|1970.
## 1428                                                                                                                                  London|Rex Collings Ltd.|1970.
## 1429                                                                                                                              New York|Simon and Schuster|c1979.
## 1430                                                                                                                                         London|Bodley Head|1963
## 1431                                                                                                                                   London|Barrie & Jenkins|1973.
## 1432                                                                                                                                   London|Barrie & Jenkins|1975.
## 1433                                                                                                                                  Chicago|Quadrangle Books|1965.
## 1434                                                                                                                                    New York|Summit Books|c1979.
## 1435                                                                                                                                         New York|AMS Press|1965
## 1436                                                                                                                       New York|St. John's University Press|1968
## 1437                                                                                                                          St. Albans, Herts.|Panther|1973, c1966
## 1438                                                                                                                                 New York|Ballantine Books|1982.
## 1439                                                                                                                                     New York|Trident Press|1969
## 1440                                                                                                                                New York|Ballantine Books|c1956.
## 1441                                                                                                                                         London|Hart-Davis|1968.
## 1442                                                                                                                                            London|Collins|1952.
## 1443                                                                                                                                     New York|Random House|1967.
## 1444                                                                                                                                     New York|Random House|1969.
## 1445                                                                                                                                 Indianapolis|Bobbs-Merrill|1951
## 1446                                                                                                                                     Morley|Elmfield Press|1973.
## 1447                                                                                                                                             London|J. Cape|1956
## 1448                                                                                                                                           New York|Viking|1966.
## 1449                                                                                                                               New York|New Directions Book|1966
## 1450                                                                                                                                 New York|F. Ungar Pub. Co.|1959
## 1451                                                                                                                              New York|Simon and Schuster|c1979.
## 1452                                                                                                                     New York|Holt, Rinehart, and Winston|c1979.
## 1453                                                                                                                                       New York|Grove Press|1956
## 1454                                                                                                                                        New York|Macmillan|1951.
## 1455                                                                                                                     Ann Arbor|University of Michigan Press|1968
## 1456                                                                                                                               Indianapolis|Bobbs-Merrill|c1974.
## 1457                                                                                                                                           New York|Dutton|1960.
## 1458                                                                                                                              London|Hart-Davis, MacGibbon|1961.
## 1459                                                                                                                                            New York|Knopf|1957.
## 1460                                                                                                                                  London|Chatto and Windus|1972.
## 1461                                                                                                                                      London|Hogarth Press|1973.
## 1462                                                                                                                           New York|Capricorn Books|1970, c1966.
## 1463                                                                                                                                New York|Grove Press|1970, c1969
## 1464                                                                                                                         New York|Harcourt Brace Jovanovich|1978
## 1465                                                                                                                                   New York|Harcourt, Brace|1960
## 1466                                                                                                                                            New York|Knopf|1958.
## 1467                                                                                                           Kuala Lumpur|Heinemann Educational Books (Asia)|1980.
## 1468                                                                                                                       New York|Harcourt Brace Jovanovich|c1980.
## 1469                                                                                                                                   London|Secker & Warburg|1954.
## 1470                                                                                                                           New York|Harcourt, Brace & World|1968
## 1471                                                                                                                                     New York|Random House|1955.
## 1472                                                                                                                         New York|Farrar, Straus and Cudahy|1962
## 1473                                                                                                                                      New York|Harper & Row|1970
## 1474                                                                                                                                           London|A. Blond|1964.
## 1475                                                                                                                                            New York|Putnam|1969
## 1476                                                                                                                                     New York|Random House|c1955
## 1477                                                                                                                                   New York|Harcourt, Brace|1958
## 1478                                                                                                                                              New York|Holt|1957
## 1479                                                                                                     Rutherford, N.J.|Fairleigh Dickinson University Press|1974.
## 1480                                                                                                                                     Brighton|Harvester P.|1969.
## 1481                                                                                                                                            New York|Harper|1957
## 1482                                                                                                                      New York|Coward, McCann & Geoghegan|c1979.
## 1483                                                                                                                                              London|Blond|1967.
## 1484                                                                                                                                  London|Rex Collings Ltd.|1973.
## 1485                                                                                                                                       New York|McGraw-Hill|1968
## 1486                                                                                                                                            New York|Knopf|1968.
## 1487                                                                                                                             New York|Weybright and Talley|c1967
## 1488                                                                                                                   Oxford|New York|Oxford University Press|1981.
## 1489                                                                                                                                            New York|Putnam|1954
## 1490                                                                                                                             Philadelphia|Lippincott|1960 [c1959
## 1491                                                                                                                                     Boston|Little, Brown|c1960.
## 1492                                                                                                                                  Philadelphia|Lippincott|c1978.
## 1493                                                                                                                                       New York|Arno Press|1977.
## 1494                                                                                                                              New York|Simon and Schuster|c1981.
## 1495                                                                                                                                        London|Oxford U.P.|1969.
## 1496                                                                                                                              London|Hart-Davis MacGibbbon|1976.
## 1497                                                                                                          New York|Toronto|London|McGraw-Hill Book Company|1956.
## 1498                                                                                                                                           New York|Harper|1959.
## 1499                                                                                                                                 London|Lawrence & Wishart|1962.
## 1500                                                                                                                                            New York|Knopf|1970.
## 1501                                                                                                                                        London|H. Hamilton|1978.
## 1502                                                                                                                                       New York|McGraw-Hill|1964
## 1503                                                                                                              New York|Knopf; [distributed by Random House|1974.
## 1504                                                                                                                                      Boston|Little, Brown|c1967
## 1505                                                                                                                      St. Petersburg, Fla.|Valkyrie Press|c1978.
## 1506                                                                                                                                          London|Heinemann|1970-
## 1507                                                                                                                                     New York|Citadel Press|1957
## 1508                                                                                                                                     New York|Viking Press|1948.
## 1509                                                                                                                                New York|The Viking Press|c1962.
## 1510                                                                                                                                        London|W. Heinemann|1952
## 1511                                                                                                                              New York|Simon and Schuster|c1980.
## 1512                                                                                                                                          London|Heinemann|1970-
## 1513                                                                                                                                          London|Heinemann|1970-
## 1514                                                                                                                                      New York|Viking Press|1969
## 1515                                                                                                                                         New York|Atheneum|1975.
## 1516                                                                                                                                          New York|Putnam|c1978.
## 1517                                                                                                                        New York|Holt, Rinehart and Winston|1966
## 1518                                                                                                                             Toronto|McClelland and Stewart|1966
## 1519                                                                                                                             Toronto|McClelland and Stewart|1971
## 1520                                                                                                                            Toronto|McClelland and Stewart|1965.
## 1521                                                                                                                          Elgin, Ill.|D. C. Cook Pub. Co.|c1978.
## 1522                                                                                                 Toronto|New York|Ryerson Press, McGraw-Hill Co. of Canada|c1971
## 1523                                                                                                                                London|Collins; Harvill P.|1968.
## 1524                                                                                                                                 Sydney|Angus & Robertson|c1980.
## 1525                                                                                                                                     New York|Random House|c1971
## 1526                                                                                                                               Garden City, N.Y.|Doubleday|1979.
## 1527                                                                                                                         Paris|Nouvelles éditions Debresse|1968.
## 1528                                                                                                                              Garden City, N. Y.|Doubleday|1968.
## 1529                                                                                                                               Garden City, N.Y.|Doubleday|1967.
## 1530                                                                                                                                           New York|Viking|1981.
## 1531                                                                                                              Boroko|Institute of Papua New Guinea Studies|1979.
## 1532                                                                                                                               New York|Phaedra Publishers|c1968
## 1533                                                                                                                         New York|Farrar, Straus and Giroux|1967
## 1534                                                                                                                                     New York|McGraw-Hill|c1978.
## 1535                                                                                                                                        New York|W. Morrow|1979.
## 1536                                                                                                                         New York|Simon and Schuster|1970, c1969
## 1537                                                                                                                                         Toronto|New Press|1975.
## 1538                                                                                                                             Toronto|McClelland and Stewart|1964
## 1539                                                                                                                                         Toronto|Macmillan|1977.
## 1540                                                                                                                                          New York|Putnam|c1982.
## 1541                                                                                                                               Boston|Houghton Mifflin Co.|1954.
## 1542                                                                                                                                      New York|Harper & Row|1968
## 1543                                                                                                                                 Sydney|Angus and Robertson|1958
## 1544                                                                                                                                           New York|Crowell|1953
## 1545                                                                                                                                     New York|Garland Pub.|1979.
## 1546                                                                                                                             Boston|Houghton Mifflin|1970 [c1969
## 1547                                                                                                                                         New York|Macmillan|1961
## 1548                                                                                                                                        New York|Macmillan|1959.
## 1549                                                                                                                                              London|Dobson|1972
## 1550                                                                                                                                            New York|Putnam|1970
## 1551                                                                                                                                            New York|Knopf|1964.
## 1552                                                                                                                                 Sydney|Angus and Robertson|1964
## 1553                                                                                                                                 Sydney|Angus and Robertson|1959
## 1554                                                                                                                                     London|MacGibbon & Kee|1965
## 1555                                                                                                                           Toronto|McClelland and Stewart|c1964.
## 1556                                                                                                                                       New York|Arno Press|1975.
## 1557                                                                                                                                       New York|McGraw-Hill|1960
## 1558                                                                                                                                           London|M. Joseph|1964
## 1559                                                                                                                                    London|Chatto & Windus|1974.
## 1560                                                                                                                                       Boston|Little, Brown|1960
## 1561                                                                                                                                     New York|Garland Pub.|1979.
## 1562                                                                                                                                    New York|Harper & Row|c1979.
## 1563                                                                                                                               Garden City, N.Y.|Doubleday|1973.
## 1564                                                                                                                            London|Oxford University Press|1964.
## 1565                                                                                                                                        New York|Pantheon|c1961.
## 1566                                                                                                                   London|New York|Oxford University Press|1973.
## 1567                                                                                                                                Garden City, N.Y.|Doubleday|1972
## 1568                                                                                                                                               London|Cape|1974.
## 1569                                                                                                                                    London|MacGibbon & Kee|1957.
## 1570                                                                                                                            New York|Grosset and Dunlop|1967. --
## 1571                                                                                                                                     Boston|Little, Brown|c1976.
## 1572                                                                                                                                    New York|Putnam|1979, c1978.
## 1573                                                                                                                               Garden City, N.Y.|Doubleday|1967.
## 1574                                                                                                                                     New York|Arbor House|c1981.
## 1575                                                                                                       Bombay|Published by K. K. Asher for Laxmi Syndicate|1963.
## 1576                                                                                                                    Westport, Conn.|Greenwood Press|1975, c1960.
## 1577                                                                                                                             Boulder, Colo.|Westview Press|1979.
## 1578                                                                                     New York|Twayne Publishers|Indianapolis|distributed by Bobbs-Merrill|c1974.
## 1579                                                                                                                         New York|Farrar, Straus and Cudahy|1962
## 1580                                                                                                        Philadelphia|Jewish Publication Society of America|1967.
## 1581                                                                                                                                          London|Constable|1977.
## 1582                                                                                                                                         New York|Scribner|1958.
## 1583                                                                                                              Singapore|Heinemann Educational Books (Asia)|1978.
## 1584                                                                                                                                   London|Secker & Warburg|1954.
## 1585                                                                                                                         Chester Springs, Pa.|Dufour|1967 [c1964
## 1586                                                                                                                                   New York|Vanguard Press|1957.
## 1587                                                                                                                                            New York|Morrow|1950
## 1588                                                                                                                                    New York|Seabury Press|c1974
## 1589                                                                                                                   London|New York|Oxford University Press|1973.
## 1590                                                                                                                               New York|G.P. Putnam's Sons|1959.
## 1591                                                                                                                                New York|Arno Press|1975, c1935.
## 1592                                                                                                                                New York|Popular Library|c1961].
## 1593                                                                                                                                            New York|Harper|1958
## 1594                                                                                                                                            New York|Putnam|1965
## 1595                                                                                                                                       New York|McGraw-Hill|1966
## 1596                                                                                                                                         London|Macmillan,c1965.
## 1597                                                                                                                                   Ann Arbor, Mich.|Ardis|c1979.
## 1598                                                                                                                                    New York|L. Hill|1973, c1962
## 1599                                                                                                                                  New York|Vanguard Press|c1963.
## 1600                                                                                                                                            New York|Knopf|1968.
## 1601                                                                                                                                  Philadelphia|Lippincott|c1976.
## 1602                                                                                                                Norwalk, Connecticut|Silvermine Publishers|1966.
## 1603                                                                                                                                           Moscow|Progress|1977.
## 1604                                                                                                                                   New York|Harcourt, Brace|1955
## 1605                                                                                                                    Lexington|University Press of Kentucky|1970.
## 1606                                                                                                                                       New York|Grove Press|1956
## 1607                                                                                                                         Peking|Foreign Languages Press|1979. --
## 1608                                                                                                                              New York|New American Library|1956
## 1609                                                                                                                                            New York|Knopf|1973.
## 1610                                                                                                                               New York|Viking Press|1954 [c1947
## 1611                                                                                                                                   New York|Sagamore Press|1957.
## 1612                                                                                                                         Garden City, N.Y.|Doubleday|196-? c1952
## 1613                                                                                                                                      Toronto|Anansi Press|1981.
## 1614                                                                                                                                           London|Heinemann|1981
## 1615                                                                                                                                       New Delhi|Sterling|c1980.
## 1616                                                                                                                                            London|P. Owen|1981.
## 1617                                                                                                                                   London|New York|Granada|1981.
## 1618                                                                                         Dacca|Society for Studies in Praxis|distributor, Universitu Press|1981.
## 1619                                                                                                                               Moscow|Progress Publishers|c1980.
## 1620                                                                                                                                     London|Michael Joseph|1981.
## 1621                                                                                                                             Dublin, Ireland|Poolbeg Press|1981.
## 1622                                                                                                                                         London|Joseph|1980-1982
## 1623                                                                                                                                   London|Secker & Warburg|1980.
## 1624                                                                                                                                   London|Boston|M. Boyars|1980.
## 1625                                                                                                                           Toronto|McClelland and Stewart|c1981.
## 1626                                                                                                                                       Edinburgh|Canongate|1980.
## 1627                                                                                                                                   London|Calder & Boyars|c1972.
## 1628                                                                                                                             London|New York|Quartet Books|1981.
## 1629                                                                                              Beijing|Foreign Languages Press|distributed by Guoji Shudian|1981.
## 1630                                                                                    Kuala Lumpur|Dewan Bahasa dan Pustaka, Ministry of Education, Malaysia|1980.
## 1631                                                                                                                                            London|Collins|1981.
## 1632                                                                                                                         London|The Lion and Unicorn Press|1979.
## 1633                                                                                                                                   New York|Delacorte Press|1972
## 1634                                                                                                                                           London|F. Muller|1960
## 1635                                                                                                                                 Boston|Gregg Press|1978, c1955.
## 1636                                                                                                                                       Boston|Little, Brown|1969
## 1637                                                                                                                                      Edinburgh|Mainstream|1984?
## 1638                                                                                                                                          London|J. Murray|1982.
## 1639                                                                                                                             Manchester|Carcanet New Press|1982.
## 1640                                                                                                             Harmondsworth|Penguin|1968, c1965|(1980 [printing])
## 1641                                                                                                                                            London|P. Owen|1982.
## 1642                                                                                                                          New York|Larchwood Publications|c1980.
## 1643                                                                                                                                    London|Writers Readers|1982.
## 1644                                                                                                                                      Ottawa|Oberon Press|c1982.
## 1645                                                                                                                             Manchester|Carcanet New Press|1982.
## 1646                                                                                                                                       Edinburgh|P. Harris|1982.
## 1647                                                                                                                                      London|Andre Deutsch|1982.
## 1648                                                                                                                                          New York|Scribner|1960
## 1649                                                                                                                                          New York|Scribner|1956
## 1650                                                                                                                                          London|Elek Books|1957
## 1651                                                                                                                                        New York|Dodd, Mead|1961
## 1652                                                                                                                                London|Dent|New York|Dutton|1961
## 1653                                                                                                                     Englewood Cliffs, N.J.|Prentice-Hall|c1979.
## 1654                                                                                       Brookline, Mass.|Autumn Press|New York|distributed by Random House|c1978.
## 1655                                                                                                                                      New York|Bantam Books|1964
## 1656                                                                                                                                    New York|Heritage Press|1956
## 1657                                                                                                                                      New York|Viking Press|1968
## 1658                                                                                                                                         London|Hart-Davis|1970.
## 1659                                                                                                                                   New York|Harcourt,Brace|1955.
## 1660                                                                                                                                      New York|Viking Press|1966
## 1661                                                                                                                              New York|Simon and Schuster|c1980.
## 1662                                                                                                                      Ann Arbor, Mich.|Trilogy Publishers|c1978.
## 1663                                                                                                                                          New York|Scribner|1968
## 1664                                                                                                                                            New York|Morrow|1970
## 1665                                                                                                                                      London|Fontana|1960, c1954
## 1666                                                                                                                         Garden City, N.Y.|Nelson Doubleday|1973
## 1667                                                                                                                     Bloomington|Indiana University Press|c1979.
## 1668                                                                                                                                   Boston|Houghton Mifflin|1974.
## 1669                                                                                                                             Westminster, Md.|Newman Press|1955.
## 1670                                                                                                                                             London|Longman|1970
## 1671                                                                                                                                           London|A. Barker|1960
## 1672                                                                                               New York|Timescape Books|Distributed by Simon and Schuster|c1982.
## 1673                                                                                                                                            London|Collins|1962.
## 1674                                                                                                                                  New York|Capricorn Books|1965-
## 1675                                                                                                                                        New York|Doubleday|1953.
## 1676                                                                                                                                           New York|Penguin|1974
## 1677                                                                                                                               New York|Garland Pub.|1976 [c1937
## 1678                                                                                                              New York|Knopf : distributed by Random House|1977.
## 1679                                                                                                                            New York|Limited Editions Club|1955.
## 1680                                                                                                                       Hong Kong|Hong Kong University Press|1968
## 1681                                                                                                                            Ithaca|Cornell University Press|1952
## 1682                                                                                                                                    New York|Hawthorn Books|1975
## 1683                                                                                                          Larchmont] New York|Larchwood Publication, Ltd.|c1979.
## 1684                                                                                                                                           New Delhi|Vikas|1980.
## 1685                                                                                                                                          London|J. Murray|c1963
## 1686                                                                                                                                    Boston|Western Islands|c1962
## 1687                                                     Garden City, N.Y.|Published in cooperation with the American Museum of Natural History [by] Doubleday|1964.
## 1688                                                                                                                       Lincoln|University of Nebraska Press|1962
## 1689                                                                                                                                    New York|Random House|c1981.
## 1690                                                                                                                                    New York|Random House|c1981.
## 1691                                                                                                                                     New York|Viking Press|1964.
## 1692                                                                                                                                    New York|Vanguard Press|1971
## 1693                                                                                                                               New York|Simon and Schuster|1958.
## 1694                                                                                                                                            London|J. Cape|1983.
## 1695                                                                                                              Delmar, N.Y.|Scholars' Facsimiles & Reprints|1981.
## 1696                                                                                                                                    New York|Walker and Co.|1963
## 1697                                                                                                                            London|New York|Quartet Books|c1983.
## 1698                                                                                                                                   London|Macmillan London|1983.
## 1699                                                                                                                                 Moscow|Raduga Publishers|c1983.
## 1700                                                                                                                                     London|Michael Joseph|1983.
## 1701                                                                                                                                     London|Boston|P. Owen|1983.
## 1702                                                                                                                                      Canada|Oberon Press|c1983.
## 1703                                                                                                                                          London|Heinemann|1983.
## 1704                                                                                                                 Nuffield, Henley on Thames, Oxon|A. Ellis|1983.
## 1705                                                                                                                   Tel Aviv|Hakibbutz Hameuchad Pub. House|1981.
## 1706                                                                                                                                       Cape Town|Tafelberg|1983.
## 1707                                                                                                                     Santa Barbara, Calif.|Cadmus Editions|1983.
## 1708                                                                                                                                 Moscow|Raduga Publishers|c1983.
## 1709                                                                                                                                 Moscow|Raduga Publishers|c1983.
## 1710                                                                                                                            Washington|Black Orpheus Press|1972.
## 1711                                                                                                                                          London|Heinemann|1972.
## 1712                                                                                                                                           London|Gollancz|1974.
## 1713                                                                                                                                     Bombay|Orient Longman|1974.
## 1714                                                                                                                                       New Delhi|Sterling|c1979.
## 1715                                                                                                                                    New York|Summit Books|c1978.
## 1716                                                                                                                                 New York|Scribner|1961?- c1935-
## 1717                                                                                                                                    New York|Modern Library|1950
## 1718                                                                                                                Middletown, Conn.|Wesleyan University Press|1965
## 1719                                                                                                                     Ann Arbor|University of Michigan Press|1962
## 1720                                                                                                                       New York|Harcourt Brace Jovanovich|c1979.
## 1721                                                                                                                      Honolulu|University of Hawaii Press|c1982.
## 1722                                                                                                                                     New York|Vintage Book|1958.
## 1723                                                                                                                          Harmondsworth, Eng.|Penguin Books|1963
## 1724                                                                                                                        Garden City, N.Y.|Doubleday|1978, c1977.
## 1725                                                                                                                             New York|Mason/Charter|1975, c1974.
## 1726                                                                                                                                   Boston|Houghton Mifflin|1975.
## 1727                                                                                                                               Garden City, N.Y.|Doubleday|1980.
## 1728                                                                                                                               New York|Viking Press|1963, c1960
## 1729                                                                                                                                      New York|Viking Press|1967
## 1730                                                                                                                                         New York|Atheneum|1980.
## 1731                                                                                                                  Chatham, N. J.|Chatham Bookseller|1973, c1952.
## 1732                                                                                                                            Peking|Foreign Languages Press|1960.
## 1733                                                                                                                                 London|Secker and Warburg|1964.
## 1734                                                                                                                                 London|Secker and Warburg|1960.
## 1735                                                                                                                                      New York|Viking Press|1976
## 1736                                                                                                                                      New York|Grove Press|c1958
## 1737                                                                                                                         New York|Simon and Schuster|1953 [c1952
## 1738                                                                                                                                          New York|Scribner|1969
## 1739                                                                                                                                    London|Secker & Warburg|1961
## 1740                                                                                                                                            New York|Harper|1958
## 1741                                                                                                                               New Delhi|Sagar Publications|1972
## 1742                                                                                                                                    London|Secker & Warburg|1961
## 1743                                                                                                                                London|Eyre & Spottiswoode|1962.
## 1744                                                                                                                              New York|Simon and Schuster|c1979.
## 1745                                                                                                                                    New York|Vanguard Press|1969
## 1746                                                                                                                                      Boston|Little, Brown|1951.
## 1747                                                                                                                                             New York|Knopf|1952
## 1748                                                                                                                                        London|Bodley Head|1961.
## 1749                                                                                Hong Kong|Commercial Press: distributed by Paragon Book Gallery, New York|1968 ?
## 1750                                                                                                                                         New York|Atheneum|1970.
## 1751                                                                                                                              Garden City, N.Y.|Doubleday|c1972.
## 1752                                                                                                      New York|Berkley Pub. Corp. : distributed by Putnam|c1979.
## 1753                                                                                                      New York|Berkley Pub. Corp. : distributed by Putnam|c1972.
## 1754                                                                                                                                           New York|Morrow|1979.
## 1755                                                                                                                                            Beirut|Khayats|1966.
## 1756                                                                                                                                      Denver|Alan Swallow|c1959-
## 1757                                                                                                                              New York|New American Library|1967
## 1758                                                                                                                                          London|Hienemann|c1973
## 1759                                                                                                                              New York|Octagon Books|1973 [c1939
## 1760                                                                                                                                            New York|Knopf|1980.
## 1761                                                                                                                                    New York|Random House|c1981.
## 1762                                                                                                                                           New York|Twayne|c1974
## 1763                                                                                                                                      New York|Knopf|1960 [c1956
## 1764                                                                                                                                     New York|Morrow|1974 [c1944
## 1765                                                                                                                                      New York|Random House|1968
## 1766                                                                                                                                             London|P. Owen|1963
## 1767                                                                                                                                          London|Peter Owen|1971
## 1768                                                                                                                              New York|Coward-McCann|1955, c1954
## 1769                                                                                                                                  New York|J. Laughlin|c1952. --
## 1770                                                                                                                         New York|Harcourt, Brace & World|c1954.
## 1771                                                                                                                                       New York|Grove Press|1960
## 1772                                                                                                                                          New York|Pantheon|1960
## 1773                                                                                                                                New York|Kraus Reprint Co.|1971.
## 1774                                                                                                                               Garden City, N.Y.|Doubleday|1975.
## 1775                                                                                                                                         New York|AMS Press|1968
## 1776                                                                                                                    London|Toronto|Oxford University Press|1965.
## 1777                                                                                                                               London|Eyre & Spottiswoode|1961].
## 1778                                                                                                                                           New York|Dutton|1965.
## 1779                                                                                                                                Cromer|Swallow House Books|1975.
## 1780                                                                                                                                      New York|Harper|1950, 1949
## 1781                                                                                                                      Harmondsworth|New York|Penguin Books|1976.
## 1782                                                                                                                               Indianapolis|Bobbs-Merrill|c1976-
## 1783                                                                                                                               Garden City, N.Y.|Doubleday|1973.
## 1784                                                                                                                                 New York|Dial Press|1963 [c1953
## 1785                                                                                                                                   London|Secker & Warburg|1955.
## 1786                                                                                                                                      New York|C. Scribner|1955.
## 1787                                                                                                                                   New York|Bloch Pub. Co.|1960.
## 1788                                                                                                                                       New York|Macmillan|c1981.
## 1789                                                                                                                                            New York|Harper|1950
## 1790                                                                                                                      London|Weidenfeld and Nicolson|1974, c1973
## 1791                                                                                                                                             Tokyo|Kenyusha|1950
## 1792                                                                                                                           Garden City, N. Y.|Anchor Books|1962.
## 1793                                                                                                                         Old Westbury, N.Y.|Feminist Press|1982.
## 1794                                                                                                                       Rutland, Vt.|C.E. Tuttle Co.|1972]-c1986.
## 1795                                                                                                                                New York|Grove Press|1968, c1966
## 1796                                                                                                                                       Boston|Little, Brown|1965
## 1797                                                                                                                                               London|Owen|1968.
## 1798                                                                                                                                     New York|Collier Books|1970
## 1799                                                                                                      New York|Berkley Pub. Corp. : distributed by Putnam|c1979.
## 1800                                                                                                                                            London|P. Owen|1975.
## 1801                                                                                                                                      New York|I. Obolensky|1960
## 1802                                                                                                                        New York|Farrar, Straus and Giroux|1979.
## 1803                                                                                                                                   London|Secker & Warburg|1954.
## 1804                                                                                                                                     New York|Collier Books|1962
## 1805                                                                                                                    London|New York|Oxford University Press|1951
## 1806                                                                                                                                        New York|J. Day Co.|1951
## 1807                                                                                                                                            Leyden|Sythoff|1963.
## 1808                                                                                                                                      New York|Eakins Press|1968
## 1809                                                                                                                                     London|Calder & Boyar|1966.
## 1810                                                                                                                                  Cleveland|World Pub. Co.|c1956
## 1811                                                                                                                                   London|Secker & Warburg|1968.
## 1812                                                                                                                                            London|Deutsch|1976.
## 1813                                                                                                                                  London|Secker & Warburg|c1981.
## 1814                                                                                                                                    London|Calder & Boyars|1966.
## 1815                                                                                                                                    New York|Harper & Row|c1980.
## 1816                                                                                                                                           New York|Norton|c1960
## 1817                                                                                                                                   New York|Modern Library|1956.
## 1818                                                                                                                      Manila|Solidaridad Publishing House|c1972.
## 1819                                                                                                                            New York|New American Library|c1961.
## 1820                                                                                                                                               London|Cape|1966.
## 1821                                                                                                                                     London|J. Cape|1971, c1964.
## 1822                                                                                                                                New York|Simon and Schuster|1965
## 1823                                                                                                                                 Moscow|Progress Publishers|196-
## 1824                                                                                                                                    New York|Pantheon Books|1952
## 1825                                                                                                                                    New York|Heritage Press|1958
## 1826                                                                                                                        Garden City, N.Y.|Doubleday|1977, c1976.
## 1827                                                                                                                                   London|Secker & Warburg|1958.
## 1828                                                                                                                                      New York|A. A. Knopf|1965.
## 1829                                                                                                                           New York|Washington Square Press|1961
## 1830                                                                                                                                          London|Heinemann|1970-
## 1831                                                                                                                                    New York|Vintage Books|1960.
## 1832                                                                                                                                   London|Secker & Warburg|1953.
## 1833                                                                                                                             London, Macdonald,1970- [v. 1, 1971
## 1834                                                                                                                             London|Routledge & Kegan Paul|1979.
## 1835                                                                                                                                      New York|Harper & Row|1968
## 1836                                                                                                              Ann Arbor|University of Michigan Press|1964, c1957
## 1837                                                                                                                                    London|Allen and Unwin|1973.
## 1838                                                                                                                                   Boston|Houghton Mifflin|1972.
## 1839                                                                                                                               New York|Simon and Schuster|c1973
## 1840                                                                                                                           New York|Harcourt, Brace & World|1970
## 1841                                                                                                             Columbus|Ohio State University Press|c1962-<c1997 >
## 1842                                                                                                             Columbus|Ohio State University Press|c1962-<c1997 >
## 1843                                                                                                                                             London|Collins|1958
## 1844                                                                                                                                      New York|Harper & Row|1972
## 1845                                                                                                                                            New York|Putnam|1973
## 1846                                                                                                                            Toronto|McClelland and Stewart|c1971
## 1847                                                                                                                             New York|Modern Library|1969, c1954
## 1848                                                                                                               Oxford|Cassirer|London|Distributed by Luzac|1976.
## 1849                                                                                                              Hong Kong|Heinemann Educational Books (Asia)|1975.
## 1850                                                                                                                                       New York|Dial Press|1957.
## 1851                                                                                                                                      New York|Harper & Row|1973
## 1852                                                                                                                                 London|Secker and Warburg|1958.
## 1853                                                                                                                                           London|M. Joseph|1958
## 1854                                                                                                                                     London|MacGibbon & Kee|1965
## 1855                                                                                                                                             London|J. Cape|1972
## 1856                                                                                                               New York|Knopf|Distributed by Random House|c1982.
## 1857                                                                                                                                            London|Collins|1972.
## 1858                                                                                                                           New York|Harcourt, Brace & World|1962
## 1859                                                                                                                               New York|Simon and Schuster|1959.
## 1860                                                                                                                                      New York|W. W. Norton|1951
## 1861                                                                                                                                  London, MacGibbon & Kee, 1962.
## 1862                                                                                                                                    Philadelphia|Lippincott|1974
## 1863                                                                                                                                     Harmondsworth|Penguin|1966.
## 1864                                                                                                                                       New York|Grove Press|1967
## 1865                                                                                                                                      New York|Harper & Row|1971
## 1866                                                                                                                                London|Dent|New York|Dutton|1955
## 1867                                                                                                                                  New York|Harcourt, Brace|c1956
## 1868                                                                                                                        New York|Farrar, Straus and Young|c1953.
## 1869                                                                                                                                        London|Bodley Head|1961.
## 1870                                                                                                                     Westport, Conn.|Greenwood Press|1971, c1941
## 1871                                                                                                                                     New York|Arbor House|c1980.
## 1872                                                                                                                            New York|Delacorte Press|1971, c1959
## 1873                                                                                                                                Chicago|J. P. O'Hara|1973, c1971
## 1874                                                                                                                               New York|Dover Publications|1978.
## 1875                                                                                                                                     New York|Vintage Books|1961
## 1876                                                                                                                                     New York|McGraw-Hill|c1965.
## 1877                                                                                                                                       New York|McGraw-Hill|1969
## 1878                                                                                                                                  Boston|Houghton Mifflin|c1963.
## 1879                                                                                                                                            New York|Knopf|1967.
## 1880                                                                                                                             London|Chatto & Windus|1975, c1974.
## 1881                                                                                                                                New York|Arno Press|1975, c1952.
## 1882                                                                                                                                   London|Secker & Warburg|1963.
## 1883                                                                                                                                   London|Secker & Warburg|1975.
## 1884                                                                                                                                         New York|Atheneum|1971.
## 1885                                                                                                                                Moscow|Progress Publishers|1975.
## 1886                                                                                                                          New York|Farrar, Straus, Giroux|c1981.
## 1887                                                                                                                                     New York|Random House|1956.
## 1888                                                                                                                                  London|Calder and Boyars|1966.
## 1889                                                                                                                                      New York|Random House|1974
## 1890                                                                                                                                     New York|Random House|1974.
## 1891                                                                                                                               Garden City, N.Y.|Doubleday|1980.
## 1892                                                                                                                                     New York|Viking Press|1960.
## 1893                                                                                                                                    New York|Harper & Row|c1976.
## 1894                                                                                                                                           New York|Harper|c1956
## 1895                                                                                                                                           London|Macmillan|1975
## 1896                                                                                                                                            New York|Knopf|1981.
## 1897                                                                                                                                            New York|Knopf|1951.
## 1898                                                                                                                                            New York|Knopf|1964.
## 1899                                                                                                                               New York|Pocket Books|1965, c1956
## 1900                                                                                                                                   Toronto|Acropolis Press|1962.
## 1901                                                                                                                                          New York|Scribner|1952
## 1902                                                                                                                                 Boston|Gregg Press|1977, c1962.
## 1903                                                                            Austin, Tex.|Center for Middle Eastern Studies, University of Texas at Austin|c1979.
## 1904                                                                                                                                      London|Chapman & Hall|1964
## 1905                                                                                                                                    London|Macdonald & Co.|1968.
## 1906                                                                                                                                     London|Calder & Boyars|1966
## 1907                                                                                                                                              London|Blond|1967.
## 1908                                                                                                                                      New York|Dial Press|c1978.
## 1909                                                                                                                                    London|Secker & Warburg|1964
## 1910                                                                                                                   Melbourne, Victoria|T. Nelson Australia|1981.
## 1911                                                                                                                  Hamilton, N. Y.|Colgate University Press|1966.
## 1912                                                                                                                                           London|Macdonald|1952
## 1913                                                                                                                                           London|Macdonald|1961
## 1914                                                                                                                                        London|W. Heinemann|1953
## 1915                                                                                                                                           London|Heinemann|1962
## 1916                                                                                                                                       Boston|Little, Brown|1963
## 1917                                                                                                                                 Indianapolis|Bobbs-Merrill|1957
## 1918                                                                                                                                             London|J. Cape|1950
## 1919                                                                                                                                 Sydney|Angus and Robertson|1956
## 1920                                                                                                                       Melbourne|Australasian Book Society|1959.
## 1921                                                                                                                                             Adelaide|Rigby|1963
## 1922                                                                                                                                   London|Secker & Warburg|c1959
## 1923                                                                                                                                London|Angus and Robertson|1975.
## 1924                                                                                                                                    London|Calder & Boyars|1969.
## 1925                                                                                             London|J. M. Dent & sons, ltd.|New York|E.B.Dutton & co., inc.|1954
## 1926                                                                                                                           Toronto|McClelland and Stewart|c1953.
## 1927                                                                                                                         London|New York [etc.|Oxford U.P.|1968.
## 1928                                                                                                                                          New York|Putnam|c1981.
## 1929                                                                                                                   London|New York|Oxford University Press|1972.
## 1930                                                                                                                                            Canada|Oberon|c1981.
## 1931                                                                                                                               Garden City, N.Y.|Doubleday|1978.
## 1932                                                                                                                                  New York|Ballantine Books|1956
## 1933                                                                                                                               Amsterdam|G.A. van Oorschot|c1956
## 1934                                                                                                                            Toronto|McClelland and Stewart|c1966
## 1935                                                                                                                                  New York|Alfred A. Knopf|1953.
## 1936                                                                                                                       AuTrain, Mich.|Avery Color Studios|c1976.
## 1937                                                                                                                                New York|McGraw-Hill|1967, c1968
## 1938                                                                                                                                      New York|Harper & Row|1975
## 1939                                                                                                                                   New York|Delacorte Press|1969
## 1940                                                                                                                                      New York|Random House|1960
## 1941                                                                                                                                      New York|Harper & Row|1969
## 1942                                                                                                                                        Boston|Beacon Press|1958
## 1943                                                                                                                                    Philadelphia|Lippincott|1961
## 1944                                                                                                                                    New York|Arcadia House|1968.
## 1945                                                                                                                                      New York|Random House|1971
## 1946                                                                                                                                          New York|Dutton|c1980.
## 1947                                                                                                                         Garden City, N.Y.|Doubleday|1957 [c1947
## 1948                                                                                                                             Delhi|Oxford University Press|1976.
## 1949                                                                                                                                      New York|Harper & Row|1975
## 1950                                                                                                                              London|Michael Joseph|1973, c1972.
## 1951                                                                                                                                  New York|A. Fields Books|1974.
## 1952                                                                                                                                    London|Chatto & Windus|1958.
## 1953                                                                                                                                  London|Barrie & Rockliff|1968.
## 1954                                                                                                                              New York|Simon and Schuster|c1978.
## 1955                                                                                                                                New York|Simon and Schuster|1972
## 1956                                                                                                                                       New York|Dial Press|1969.
## 1957                                                                                                                         New York|Harcourt Brace Jovanovich|1973
## 1958                                                                                                                                       Boston|Little, Brown|1959
## 1959                                                                                                                            New York|McCall Pub. Co.|1971, c1970
## 1960                                                                                                                                       New York|T. Crowell|c1961
## 1961                                                                                                                                     New York|Coward-McCann|1965
## 1962                                                                                                                                    New York|Summit Books|c1978.
## 1963                                                                                                                               Garden City, N.Y.|Doubleday|1955.
## 1964                                                                                                                                           New York|Harper|1950.
## 1965                                                                                                                                             London|Muller|1969.
## 1966                                                                                                                                   Boston|Houghton Mifflin|1979.
## 1967                                                                                                                                  Delhi|Vikas Publications|c1971
## 1968                                                                                                                                       New York|Dial Press|1957.
## 1969                                                                                                                                      New York|Grove Press|1965.
## 1970                                                                                                                                         New York|Macmillan|1950
## 1971                                                                                                                                    Philadelphia|Lippincott|1960
## 1972                                                                                                                                   Boston|Houghton Mifflin|1969.
## 1973                                                                                                                                         New York|Rinehart|c1955
## 1974                                                                                                                               New York|Atheneum|1967 [i.e. 1966
## 1975                                                                                                                                          New York|Rinehart|1959
## 1976                                                                                                                     Columbus|Ohio State University Press|c1982.
## 1977                                                                                                                               Garden City, N.Y.|Doubleday|1953.
## 1978                                                                                                                                    London|Chatto & Windus|1969.
## 1979                                                                                                                               New York [N.Y.|C.N. Potter|c1960.
## 1980                                                                                                                                  New York|Avon Books|1968,c1937
## 1981                                                                                                                                      New York|Harper & Row|1971
## 1982                                                                                                                                   New York|Modern Library|1950.
## 1983                                                                                                                        Northridge, Calif.|Lord John Press|1979.
## 1984                                                                                                                                            New York|Knopf|1971.
## 1985                                                                                                                                    New York|New Directions|1966
## 1986                                                                                                                                            New York|Knopf|1969.
## 1987                                                                                                                     Madison|University of Wisconsin Press|1966.
## 1988                                                                                                                                            New York|Walker|1970
## 1989                                                                                                                                     New York|McGraw-Hill|c1978.
## 1990                                                                                                                         Grand Rapids, Mich.|W. B. Eerdmans|1969
## 1991                                                                                                                         New York|Harcourt, Brace & World|c1964.
## 1992                                                                                                                               London|Dent|New York|Dutton|1967.
## 1993                                                                                                                                 Boston|Gregg Press|1978, c1963.
## 1994                                                                                                                                  New York|Hendricks House|1954.
## 1995                                                                                                                                            New York|Knopf|1959.
## 1996                                                                                                                                               London|Dent|1972.
## 1997                                                                                         Calcutta|Published by Pushkarprosad Mukherjee for Silpee Sangstha|1964.
## 1998                                                                                                                             London|Oxford University Press|1957
## 1999                                                                                                                          Toronto|Vancouver|Clarke, Irwin|c1977.
## 2000                                                                                                                                    Toronto|Clarke, Irwin|c1981.
## 2001                                                                                                                                      New York|Viking Press|1969
## 2002                                                                                                                                     New York|Stein and Day|1965
## 2003                                                                                            New York|Stein and Day; distributed by Lippincott, Philadelphia|1963
## 2004                                                                                                                                            London|Collins|1982.
## 2005                                                                                                                                          London|Macmillan|c1973
## 2006                                                                                                       Carbondale|Southern Illinois University Press|1974, c1926
## 2007                                                                                                                                    London|Chatto & Windus|1964.
## 2008                                                                                                                                      New York|Random House|1959
## 2009                                                                                                                                     New York|Harper|1954, c1953
## 2010                                                                                                                                            Bath|C. Chivers|1968
## 2011                                                                                                                                  New York|Blue Heron Press|1956
## 2012                                                                                                                                     New York|Random House|1973.
## 2013                                                                                                                                    New York|Random House|c1981.
## 2014                                                                                                                                    London|Chatto & Windus|1958.
## 2015                                                                                                                                    London|Chatto & Windus|1957.
## 2016                                                                                                                               Garden City, N.Y.|Doubleday|1975.
## 2017                                                                                                                                        New York|Dodd, Mead|1952
## 2018                                                                                                                                         New York|Scribner|1950.
## 2019                                                                                                                                          New York|Scribner|1968
## 2020                                                                                                                                         New York|Macmillan|1971
## 2021                                                                                                                                          New York|Scribner|1967
## 2022                                                                                                       St. Lucia [Australia|University of Queensland Press|1980.
## 2023                                                                                                                        Don Mills, Ontario|Longmans Canada|c1968
## 2024                                                                                                                          New York|Harcourt,Brace & World|c1966.
## 2025                                                                                                                               New York|Grove Press|1961, c1956.
## 2026                                                                                                                             Berlin|Seven Seas Publishers|(1965)
## 2027                                                                                                                              London|Hart-Davis, MacGibbon|1976.
## 2028                                                                                                                          New York|Charles Scribner's Sons|1957.
## 2029                                                                                                                                         New York|Macmillan|1953
## 2030                                                                                                                                   London|Allen Lane|1974, c1968
## 2031                                                                                                                                       New York|McGraw-Hill|1970
## 2032                                                                                                                                   New York|Harcourt, Brace|1960
## 2033                                                                                                                                      New York|Knopf|1959 [c1958
## 2034                                                                                                                                         New York|Hawthorn|1963.
## 2035                                                                                                                           London|Oxford University Press|c1966.
## 2036                                                                                                                                 New York|Criterion Books|c1955.
## 2037                                                                                                                                    New York|Pantheon Books|1970
## 2038                                                                                                                                   New York|Alfred A. Knopf|1965
## 2039                                                                                                                                             London|Methuen|1961
## 2040                                                                                                                                            New York|Knopf|1970.
## 2041                                                                                                                                    London|Cambridge U. P.|1967.
## 2042                                                                                                                                     New York|Knopf|1952, c1930.
## 2043                                                                                                                                    London|Secker & Warburg|1970
## 2044                                                                                                                                          London|Macmillan|1963.
## 2045                                                                                                                                          London|Constable|1968.
## 2046                                                                                                                       New York|Delacorte Press/S. Lawrence|1974
## 2047                                                                                                                                          New York|Pantheon|1958
## 2048                                                                                                                                   New York|Heritage Press|c1963
## 2049                                                                                                                              New York|Simon and Schuster|c1967.
## 2050                                                                                                                       New York|Harcourt Brace Jovanovich|c1979.
## 2051                                                                                                                             Bombay|Jaico Pub. House|1950, c1949
## 2052                                                                                                                                      London|Folio Society|1955.
## 2053                                                                                                                                 London|Lawrence & Wishart|1956.
## 2054                                                                                                                                New York|Avon Publications|195-?
## 2055                                                                                                                                        New York|Macmillan|1950.
## 2056                                                                                                                                    London|Chatto & Windus|1954.
## 2057                                                                                                              London|Macmillan|New York|St. Martin's Press|1956.
## 2058                                                                                                    London|New York|Oxford University Press|1965-1980[v.1,1968].
## 2059                                                                                                                          London|J. M. Dent|New York|Dutton|1962
## 2060                                                                                                                     Harmondsworth, Middlesex|Penguin Books|1951
## 2061                                                                                                                      Bloomington|Indiana University Press|1958.
## 2062                                                                                                                                     London|Faber and Faber|1957
## 2063                                                                                                                          Clifton [N.J.|A. M. Kelley|1973 [c1928
## 2064                                                                                                                                       New York|W.W. Norton|1958
## 2065                                                                                                                               Boston|Little, Brown and Co.|1971
## 2066                                                                                                                                     New York|Viking Press|1958.
## 2067                                                                                                                                            New York|Putnam|1965
## 2068                                                                                                                            Nairobi|East African Pub. House|1968
## 2069                                                                                                              New York|Knopf; [distributed by Random House|1972.
## 2070                                                                                                                University, Miss.|Romance Monographs, inc.|1979.
## 2071                                                                                                                       New York|Harcourt Brace Jovanovich|c1981.
## 2072                                                                                                                           London|G. Weidenfeld & Nicolson|1953.
## 2073                                                                                                                                   Boston|Houghton Mifflin|1971.
## 2074                                                                                                                                        New York|Macmillan|1963.
## 2075                                                                                                                                     New York|Trident Press|1970
## 2076                                                                                                                                 New York|Ballantine Books|1976.
## 2077                                                                                                                                            London|Granada|1981.
## 2078                                                                                                                                    New York|Vanguard Press|1963
## 2079                                                                                                                                        London|Bodley Head|1962-
## 2080                                                                                                                                      New York|Dodd, Mead|c1980.
## 2081                                                                                                                                            New York|Knopf|1967.
## 2082                                                                                                                                         New York|Scribner|1951.
## 2083                                                                                                                                    Philadelphia|Lippincott|1951
## 2084                                                                                                                                           London|Hamilton|1978.
## 2085                                                                                                                                           London|Hamilton|1977.
## 2086                                                                                                                               Garden City, N.Y.|Doubleday|1980.
## 2087                                                                                                                                     New York|G. Braziller|1960.
## 2088                                                                                                                                      New York|G. Braziller|1963
## 2089                                                                                                                                      New York|G. Braziller|1963
## 2090                                                                                                                                    New York|Morrow|1979, c1978.
## 2091                                                                                                                                      New York|Viking Press|1971
## 2092                                                                                                                                    New York|Harper & Row|c1977.
## 2093                                                                                                                                      New York|Random House|1963
## 2094                                                                                                                                           London|Macmillan|1972
## 2095                                                                                                                                            New York|Knopf|1962.
## 2096                                                                                                                                     New York|Stein and Day|1973
## 2097                                                                                                              New York|Knopf : distributed by Random House|1981.
## 2098                                                                                                                   St. Clair Shores, Mich.|Scholarly Press|1972.
## 2099                                                                                                                               Garden City, N.Y.|Doubleday|1979.
## 2100                                                                                                                                      New York|Harper & Row|1970
## 2101                                                                                                                                 London|Hodder & Stoughton|1968.
## 2102                                                                                                                                     New York|Viking Press|1982.
## 2103                                                                                                                             Philadelphia|Lippincott|c1952, 1951
## 2104                                                                                                                                         New York|AMS Press|1970
## 2105                                                                                                                    New York, Random House|1964-1967, c1963-1967
## 2106                                                                                                                         Garden City, N.Y.|Doubleday|1961 [c1960
## 2107                                                                                                                             Toronto|McClelland and Stewart|1976
## 2108                                                                                                                                            New York|Knopf|1981.
## 2109                                                                                                                                  New York|Greenwood Press|1969-
## 2110                                                                                                                                        London|V. Gollancz|1964.
## 2111                                                                                                                               New York|Simon and Schuster|1964.
## 2112                                                                                                                                New York|Simon and Schuster|1966
## 2113                                                                                                                                        New York|J. Messner|1956
## 2114                                                                                                                                       New York|McGraw-Hill|1965
## 2115                                                                                                                                  Brighton|Harvester Press|1980.
## 2116                                                                                                                                      New York|C. Scribner|1963.
## 2117                                                                                                                                            New York|Putnam|1975
## 2118                                                                                                                                   Boston|Houghton Mifflin|1960.
## 2119                                                                                                                                      New York|Viking Press|1965
## 2120                                                                                                                                New York|Simon and Schuster|1952
## 2121                                                                                                                               Garden City, N.Y.|Doubleday|1957.
## 2122                                                                                                                                           New York|Dutton|1953.
## 2123                                                                                                                                            New York|Knopf|1951.
## 2124                                                                                                                                            London|Longmans|1966
## 2125                                                                                                                                          New York|Scribner|1959
## 2126                                                                                                                                                London|Cape|1972
## 2127                                                                                                                                               London|Cape|1973.
## 2128                                                                                                                                            London|Longmans|1959
## 2129                                                                                                                    Toronto ; New York|McGraw-Hill Ryerson|1975.
## 2130                                                                                                                                     Toronto|Ryerson Press|c1968
## 2131                                                                                                                            Toronto|McClelland and Stewart|c1962
## 2132                                                                                                                         New York|Farrar, Straus and Giroux|1969
## 2133                                                                                                                                            New York|Knopf|1968.
## 2134                                                                                                                         New York|Farrar, Straus and Giroux|1969
## 2135                                                                                                                                   Boston|Houghton Mifflin|1980.
## 2136                                                                                                                                 New York|Scribner|1961?- c1935-
## 2137                                                                                                                       Cambridge, Mass.|Winthrop Publishers|1975
## 2138                                                                                                                                   Boston|Houghton Mifflin|1983.
## 2139                                                                                                                                   New York|Atheneum|1972 [c1971
## 2140                                                                                                              New York|Knopf : distributed by Random House|1977.
## 2141                                                                                                                                      London|Chapman & Hall|1965
## 2142                                                                                                                                          London|Heinemann|1970.
## 2143                                                                                                                       Moscow|Foreign Languages Pub. House|1955?
## 2144                                                                                                                                    New York|Modern Library|1957
## 2145                                                                                                                               New York|Theatre Arts|1956, c1948
## 2146                                                                                                                                New York|Grove Press|1963, c1962
## 2147                                                                                                                             New York|McGraw-Hill Book Co.|c1971
## 2148                                                                                                                                    New York|New Directions|1958
## 2149                                                                                                                                           New York|Knopf|c1970.
## 2150                                                                                                                    London|New York|Oxford University Press|1954
## 2151                                                                                                                          New York, N.Y.|Ballantine Books|c1964.
## 2152                                                                                                                        New York|Garland Publishing|1975, c1953.
## 2153                                                                                                                                        New York|Continuum|1981.
## 2154                                                                                                                                     New York|Grove Press|c1967.
## 2155                                                                                                                                                London|Owen|1967
## 2156                                                                                                                       Moscow|Foreign Languages Pub. House|1954.
## 2157                                                                                                                                      New York|E.P. Dutton|1960.
## 2158                                                                                                                                       New York|Grove Press|1959
## 2159                                                                                                                                    New York|Crowell|1974, c1973
## 2160                                                                                                                                New York, N.Y.|Avon|1978] c1976.
## 2161                                                                                                                                           London|Gollancz|1970.
## 2162                                                                                                                                  New York|Alfred A. Knopf|1977.
## 2163                                                                                                                                       New York|Macmillan|c1978.
## 2164                                                                                                                                    New York|Pantheon Books|1965
## 2165                                                                                                                                     New York|Bantam Books|1979.
## 2166                                                                                                                                           Moscow|Progress|1976.
## 2167                                                                                                                              New York|Bantam Books|1977, c1976.
## 2168                                                                                                                                  London|Collins|1955 [i.e. 1954
## 2169                                                                                                                                       New York|Dial Press|1978.
## 2170                                                                                                                                            Detroit|Gemant|1979.
## 2171                                                                                                                             London, Macdonald,1970- [v. 1, 1971
## 2172                                                                                                                             London, Macdonald,1970- [v. 1, 1971
## 2173                                                                                                                          London|Melbourne [etc.|Macmillan|1967.
## 2174                                                                                                                                         London|Hutchinson|1976.
## 2175                                                                                                                                            New York|Knopf|1974.
## 2176                                                                                                                                 Toronto|Chicago|New Press|c1970
## 2177                                                                                                                                           London|P. Davies|1956
## 2178                                                                                                                                       Boston|Little, Brown|1959
## 2179                                                                                                                           Caldwell, Idaho|Caxton Printers|1963.
## 2180                                                                                                                                     London|Faber and Faber|1956
## 2181                                                                                                                                      New York|Random House|1974
## 2182                                                                                                                                            Toronto|Anansi|1979.
## 2183                                                                                                                                            New York|Putnam|1965
## 2184                                                                                                                                 New York|J. Day Co.|1956, c1955
## 2185                                                                                                                                    London|Secker & Warburg|1963
## 2186                                                                                                                                    London|Secker & Warburg|1963
## 2187                                                                                                                                   London|Secker & Warburg|1974.
## 2188                                                                                                                                   London|Secker & Warburg|1961.
## 2189                                                                                                                                           New Delhi|Vikas|1978.
## 2190                                                                                                                                              London|Joseph|1974
## 2191                                                                                                                                  Greenwich, Conn.|Faecett|1964.
## 2192                                                                                                                               London|New York|Oxford U.P.|1970.
## 2193                                                                                                                            Peking|Foreign Languages Press|1958.
## 2194                                                                                                                            Peking|Foreign Languages Press|1958.
## 2195                                                                                                                                         London|Zed Press|c1980.
## 2196                                                                                                                      Urbana|University of Illinois Press|c1982.
## 2197                                                                                                                                    London|Calder & Boyars|1968.
## 2198                                                                                                                                    London|Secker & Warburg|1962
## 2199                                                                                                                                 Boston|Gregg Press|1978, c1955.
## 2200                                                                                                                                        Boston|Gregg Press|1978.
## 2201                                                                                                                                 Boston|Gregg Press|1978, c1961.
## 2202                                                                                                                                    Boston|Nonpareil Books|1979.
## 2203                                                                                                                                            New York|Putnam|1969
## 2204                                                                                                                           London|Weidenfeld and Nicolson|1959].
## 2205                                                                                                                                 London|Sphere Books|1967, c1945
## 2206                                                                                                                             Boston|Houghton Mifflin|1970 [c1969
## 2207                                                                                                                                      London|Cresset Press|1950.
## 2208                                                                                                                                  New York|Pantheon Books|c1980.
## 2209                                                                                                                                    New York|Vintage Books|1954.
## 2210                                                                                                                              New York|Fina Editions Press|c1956
## 2211                                                                                                                                       New York|Grove Press|1953
## 2212                                                                                                                              New York|Vintage Books|1973, c1972
## 2213                                                                                                                                      New York|Grove Press|c1955
## 2214                                                                                                                                      New York|A. A. Knopf|1956.
## 2215                                                                                                                               London|New York|W. H. Allen|1972.
## 2216                                                                                                                           New York|Pantheon Books|1975], c1974.
## 2217                                                                                                                      London|Boston|Routledge & Kegan Paul|1979.
## 2218                                                                                                                                 New York|F. Ungar Pub. Co.|1975
## 2219                                                                                                                            Garden City, N.Y.|Anchor Books|1967.
## 2220                                                                                                                                      New York|Viking Press|1968
## 2221                                                                                                                       San Antonio|Trinity University Press|1979
## 2222                                                                                                                         Ann Arbor, Mich.|Ardis Publishers|1982.
## 2223                                                                                                                                          London|Hutchinson|1954
## 2224                                                                                                                                     New York|Viking Press|1963.
## 2225                                                                                                                                         New York|Atheneum|1968.
## 2226                                                                                                                               Garden City, N.Y.|Doubleday|1976.
## 2227                                                                                                                                 New York|Knopf|1963, t.p. 1974.
## 2228                                                                                                                                 Boston|Gregg Press|1980, c1950.
## 2229                                                                                                                       Moscow|Foreign Languages Pub. House|1957?
## 2230                                                                                                                                      New York|Bantam Books|1974
## 2231                                                                                                                                           New York|Walker|1963.
## 2232                                                                                                                                         London|Peter Owen|1975.
## 2233                                                                                                                                 New York|Scribner|1961?- c1935-
## 2234                                                                                                                                            New York|Knopf|1976.
## 2235                                                                                                                       Englewood Cliffs, N.J.|Prentice-Hall|1975
## 2236                                                                                                                                    New York|Pantheon Books|1962
## 2237                                                                                                                                New York|Simon and Schuster|1971
## 2238                                                                                                                                          London|Macmillan|1958.
## 2239                                                                                                                                           New York|Morrow|1972.
## 2240                                                                                                                                       New York|A.A. Knopf|1952.
## 2241                                                                                                                                         London|Bodley Head|1972
## 2242                                                                                                                                               London|Owen|1971.
## 2243                                                                                                                                  New York|Crown Publishers|1960
## 2244                                                                                                                                           New York|Morrow|1968.
## 2245                                                                                                                               New York|Harper & Row|1971, c1966
## 2246                                                                                                                         London|Dent|New York|Dutton|1963, c1958
## 2247                                                                                                                                            New York|Knopf|1981.
## 2248                                                                                                                           Bucharest|"The Book" Pub. House|1954?
## 2249                                                                                                              Delmar, N.Y.|Scholars' Facsimiles & Reprints|1974.
## 2250                                                                                                                              New York|Simon and Schuster|c1978.
## 2251                                                                                                                               New York|Cameron Associates|1959?
## 2252                                                                                                                   Freeport, N.Y.|Books for Libraries Press|1970
## 2253                                                                                                                                            New York|Knopf|1978.
## 2254                                                                                                                          New York|Farrar, Straus & Cudahy|1957.
## 2255                                                                                                                                       London|Allen & Unwin|1965
## 2256                                                                                                                                      New York|Random House|1964
## 2257                                                                                                                     Westport, Conn.|Greenwood Press|1973, c1958
## 2258                                                                                                                                    New York|Hill and Wang|1965.
## 2259                                                                                                                          New York|Appleton-Century-Crofts|1956.
## 2260                                                                                                               Lincoln|University of Nebraska Press|1980, c1958.
## 2261                                                                                                                    Beijing, China|Foreign Languages Press|1981.
## 2262                                                                                                                              New York|Simon and Schuster|c1982.
## 2263                                                                                                                                            New York|Putnam|1967
## 2264                                                                                                                                 New York|Scribner|1961?- c1935-
## 2265                                                                                                                                 New York|Scribner|1961?- c1935-
## 2266                                                                                                                                        London|Bodley Head|1980.
## 2267                                                                                                                                        London|Bodley Head|1966.
## 2268                                                                                                                                         New York|Scribner|1955.
## 2269                                                                                                                               Garden City, N.Y.|Doubleday|1976.
## 2270                                                                                                                   London|New York|Oxford University Press|1964.
## 2271                                                                                                                                         London|Joseph|1980-1982
## 2272                                                                                                                                        New York|H. Fertig|1976.
## 2273                                                                                                                                   New York|Harper and Row|1979.
## 2274                                                                                                                                           New York|F. Fell|1958
## 2275                                                                                                                                 London|Secker and Warburg|1971.
## 2276                                                                                                                                    London|Socker & Warburg|1961
## 2277                                                                                                                             Bombay|Jaico Pub. House|1968, c1962
## 2278                                                                                                               New York|Holt, Rinehart and Winston|1967, c1966].
## 2279                                                                                                                                    London|Chatto & Windus|1958.
## 2280                                                                                                                                     New York|Random House|1962.
## 2281                                                                                                                                London|Turnstone Press Ltd|1972.
## 2282                                                                      London ; New York|Allison & Busby|New York|Distributed in the USA by Schocken Books|c1982.
## 2283                                                                                                                                          London|Heinemann|1966.
## 2284                                                                                                                             New York|Las Americas Pub. Co.|1962
## 2285                                                                                                                                    London|Sinclair Browne|1983.
## 2286                                                                                                                                 New York|Ballantine Books|1983.
## 2287                                                                                                        Fort Worth|Texas Christian University Press|c1979-c1983.
## 2288                                                                                                                                          London|Heinemann|1969.
## 2289                                                                                                                                  New York|Atheneum|1979, c1978.
## 2290                                                                                                                                         London|Heinemann|c1965.
## 2291                                                                                                                            Tokyo|University of Tokyo Press|1974
## 2292                                                                                                                                           New York|Dutton|1952.
## 2293                                                                                                                                         London|Hart-Davis|1967.
## 2294                                                                                                                    London|Deutsch|Weidenfeld and Nicolson|1982.
## 2295                                                                                                                            Peking|Foreign Languages Press|1960.
## 2296                                                                                                                                  London|ARCO Publications|1963.
## 2297                                                                                                                                             London|Methuen|1963
## 2298                                                                                                                                     Teheran|Vahid Pub. Co.|1971
## 2299                                                                                            Honolulu|Southeast Asian Studies Program, University of Hawaii|1975.
## 2300                                                                                                                                      Boston|Little, Brown|1950.
## 2301                                                                                                                                              Prague|Orbis|1967.
## 2302                                                                                                                                    New York|Harper & Row|c1984.
## 2303                                                                                                                                     Chicago|Swallow Press|1974.
## 2304                                                                                                                         New York|Harcourt Brace Jovanovich|1971
## 2305                                                                                                                                   New York|Delacorte Press|1973
## 2306                                                                                                                                    New York|Random House|c1982.
## 2307                                                                                                                                            New York|Putnam|1956
## 2308                                                                                                                                     New York|Noonday Press|1967
## 2309                                                                                                                       Garden City, N.Y.|Image Books|1959, c1946
## 2310                                                                                                                                    Baltimore|Penguin Books|1955
## 2311                                                                                                                                  Chicago|H. Regnery|1966, c1950
## 2312                                                                                                                                       St Albans|Mayflower|1973.
## 2313                                                                                                                                     London|J. Calder|1959,c1958
## 2314                                                                                                                                     New York|Viking Press|1974.
## 2315                                                                                                                                   New York|Pantheon Books|1976.
## 2316                                                                                                                              Garden City, N. Y.|Doubleday|1954.
## 2317                                                                                                                                       New York|Grove Press|1973
## 2318                                                                                                              New York|Knopf : distributed by Random House|1979.
## 2319                                                                                                                                            New York|Norton|1968
## 2320                                                                                                                               Garden City, N.Y.|Doubleday|1971.
## 2321                                                                                                                                London|Dent|New York|Dutton|1961
## 2322                                                                                                                                         New York|Macmillan|1969
## 2323                                                                                     Bloomington|Indiana University Press|Beijing|Foreign Languages Press|c1981.
## 2324                                                                                                                            New York|Greenwood Press|1968, c1944
## 2325                                                                                                                    Westport, Conn.|Greenwood Press|1975, c1947.
## 2326                                                                                                                     Westport, Conn.|Greenwood Press|1974, c1942
## 2327                                                                                                                                   London|Secker & Warburg|1958.
## 2328                                                                                                                                London|Ballentine, Mitchell|1954
## 2329                                                                                                                                       New York|Grove Press|1965
## 2330                                                                                                                                      New York|Avon|1970, c1968.
## 2331                                                                                                                                      New York|G. Braziller|1965
## 2332                                                                                                                                London|Dent|New York|Dutton|1955
## 2333                                                                                                                                    New York|Modern Library|1955
## 2334                                                                                                                 New York|Harcourt Brace Jovanovich|1977, c1963.
## 2335                                                                                                                           New York|Harcourt, Brace & World|1968
## 2336                                                                                                                         New York|Harcourt Brace Jovanovich|1975
## 2337                                                                                                                                          London|Heinemann|1971.
## 2338                                                                                                                                 London|Jonathan Cape, ...|1982.
## 2339                                                                                                                                         New York|Methuen|c1983.
## 2340                                                                                                                     Westport, Conn.|Associated Booksellers|1960
## 2341                                                                                                                       Larchmont, N.Y.|Queens House|1978, c1940.
## 2342                                                                                                                                      New York|Viking Press|1983
## 2343                                                                                                                       Varanasi|Sarva Seva Sangh Prakashan|1966.
## 2344                                                                                                                                       Boston|Little, Brown|1970
## 2345                                                                                                                                        London|V. Gollanez|1963.
## 2346                                                                                                                         Cambridge [Mass.|Apple-wood Books|1981.
## 2347                                                                                                                                    London|Chatto & Windus|1963.
## 2348                                                                                                                                       London|Harvill Press|1965
## 2349                                                                                                                                    London|Faber and Faber|1961.
## 2350                                                                                                                                      New York|Bantam Books|1962
## 2351                                                                                                                                            New York|Knopf|1970.
## 2352                                                                                                                                   Boston|Houghton Mifflin|1966.
## 2353                                                                                                                            Toronto|McClelland and Stewart|c1957
## 2354                                                                                                                                   New York|D. Obst Books|c1978.
## 2355                                                                                                                                            New York|Knopf|1978.
## 2356                                                                                                                                      Vancouver|Intermedia|1977.
## 2357                                                                                                                                             London|Cassell|1953
## 2358                                                                                                                       Moscow|Foreign Languages Pub. House|1959?
## 2359                                                                                                                                           London|Hamilton|1968.
## 2360                                                                                                                                     New York|G. Braziller|1960.
## 2361                                                                                                                New York|Knopf|Distributed by Random House|1982.
## 2362                                                                                                                            Garden City, N.Y.|Anchor Press|1976.
## 2363                                                                                                                   Freeport, N.Y.|Books for Libraries Press|1970
## 2364                                                                                                                                      New York|McGraw-Hill|1975.
## 2365                                                                                                                    New York|Linden Press/Simon & Schuster|1982.
## 2366                                                                                                               Columbia|University of South Carolina Press|1963.
## 2367                                                                                                                        Providence|Brown University Press|c1977.
## 2368                                                                                                                                     Harmondsworth|Penguin|1973.
## 2369                                                                                                                             New York|New American Library|1971.
## 2370                                                                                                                             Peking|Foreign Languages Press|1966
## 2371                                                                                                                                 New York|Scribner|1961?- c1935-
## 2372                                                                                                                                    New York, N.Y.|Pantheon|1958
## 2373                                                                                                                                      New York|Harper & Row|1968
## 2374                                                                                                                                            New York|Ungar|1955.
## 2375                                                                                                                                    New York|Summit Books|c1981.
## 2376                                                                                                                                       London|Harvill Press|1952
## 2377                                                                                                                                    New York|Pantheon Books|1963
## 2378                                                                                                                        Moscow|Foreign Languages Pub. House|1957
## 2379                                                                                                                           Boston|Houghton Mifflin Company|1978.
## 2380                                                                                                                                 New York|R. R. Bowker Co.|1970.
## 2381                                                                                                                                     New York|Pyramid Books|1971
## 2382                                                                                                                      Westport, Conn.|L. Hill & Co.|1976, c1974.
## 2383                                                                                                                                  New York|H. Fertig|1973 [c1928
## 2384                                                                                                                                  New York|Delacorte Press|c1965
## 2385                                                                                                                                            New York|Knopf|1967.
## 2386                                                                                                                           Austin|University of Texas Press|1972
## 2387                                                                                                                                     New York|Garland Pub.|1979.
## 2388                                                                                                                          London|Calder & Boyars|1974, i.e. 1973
## 2389                                                                                                                   New York|Distributed by the Dial Press|c1965.
## 2390                                                                                                                                       New York|Dial Press|1968.
## 2391                                                                                                               Madison|University of Wisconsin Press|1968 [c1930
## 2392                                                                                                                                       Boston|Little, Brown|1957
## 2393                                                                                                                   London|New York|Oxford University Press|1960.
## 2394                                                                                                                               Cheadle, Eng.|Carcanet Press|1974
## 2395                                                                                                                     Westport, Conn.|Hyperion Press|1977, [c1957
## 2396                                                                                                                         New York|Rawson, Wade Publishers|c1980.
## 2397                                                                                                                                             London|Cassell|1956
## 2398                                                                                                                                                London|Owen|1963
## 2399                                                                                                                                  London|Chatto and Windus|1971.
## 2400                                                                                                                              New York|Vintage Books|1956 [c1924
## 2401                                                                                                            Freeport, N.Y.|Books for Libraries Press|1970, c1948
## 2402                                                                                                                         New York|Farrar, Straus and Giroux|1969
## 2403                                                                                                                                    London|Chatto & Windus|1950.
## 2404                                                                                                                   Huntington Woods, Mich.|Phantasia Press|1982.
## 2405                                                                                                                                     Harmondsworth|Penguin|1967.
## 2406                                                                                                                               New York|McDowell, Obolensky|1957
## 2407                                                                                                                                       New York|Grove Press|1959
## 2408                                                                                             New Delhi|Orient Paperbacks : distributed by Hind Pocket Books|1975
## 2409                                                                                 Trichur|Kerala Sahitya Akademi|New Delhi|sole distributors, Orient Longman|1980
## 2410                                                                                                                                   New York|New Directions|1977.
## 2411                                                                                                                                    Delhi|Vikas Pub. House|1975.
## 2412                                                                                                                                     New York|Winter House|c1972
## 2413                                                                                                                                          New York|Rinehart|1951
## 2414                                                                                                                       New York|Delacorte Press/E. Friede|c1979.
## 2415                                                                                                                               Garden City, N.Y.|Doubleday|1981.
## 2416                                                                                                                                       Bombay|Kutub-Popular|1960
## 2417                                                                                                                                 Boston|Gregg Press|1976, c1974.
## 2418                                                                                                                        New Delhi|Arnold-Heinemann (India)|1976.
## 2419                                                                                                             New Delhi|Arnold-Heinemann Publishers (India)|1974.
## 2420                                                                                                                             New Delhi|Sterling Publishers|1974.
## 2421                                                                                                                               New Delhi|Vikas Pub. House|c1978.
## 2422                                                                                                                                         London|Hart-Davis|1970.
## 2423                                                                                                                                        Oxford|B. Cassirer|1975.
## 2424                                                                                                                                  New York|Pantheon Books|c1982.
## 2425                                                                                                                                        New York|Continuum|1982.
## 2426                                                                                                                                    New York|Pantheon Books|1973
## 2427                                                                                                                                    New York|Pantheon Books|1972
## 2428                                                                                                                              Berlin|Seven Seas Publishers|1977.
## 2429                                                                                                                                           London|J. Calder|1965
## 2430                                                                                                                               Harmondsworth|Penguin Books|1973.
## 2431                                                                                                                              London|Dent|New York|Dutton|1956].
## 2432                                                                                                                                   New York|Vintage Books|c1958.
## 2433                                                                                                                                     New York|Random House|1964.
## 2434                                                                                                                           New York|Saturday Review Press|c1972.
## 2435                                                                                                                                     New York|Dutton|1961, c1951
## 2436                                                                                                             Chapel Hill|University of North Carolina Press|1962
## 2437                                                                                                                                             London|P. Owen|1956
## 2438                                                                                                                                          London|Heinemann|1980.
## 2439                                                                                                                                           New York|Dutton|1968.
## 2440                                                                                                                                               London|Owen|1971.
## 2441                                                                                                                                   Ann Arbor, Mich.|Ardis|c1982.
## 2442                                                                                                              New York|Knopf : distributed by Random House|1977.
## 2443                                                                                                                     Westport, Conn.|Associated Booksellers|1961
## 2444                                                                                                                                        London|W. Heinemann|1950
## 2445                                                                                                                       Moscow|Foreign Languages Pub. House|1958?
## 2446                                                                                                                                             New York|Ungar|1974
## 2447                                                                                                                                            New York|Walker|1967
## 2448                                                                                                                                       Boston|Little, Brown|1968
## 2449                                                                                                                          Gloucester, Mass.|P. Smith|1968 [c1947
## 2450                                                                                                                            Garden City, N.Y.|Anchor Books|1967.
## 2451                                                                                                               Tokyo|Palo Alto [etc.|Kodansha International|1969
## 2452                                                                                                                                         New York|Atheneum|1963.
## 2453                                                                                                                                       New York|Grove Press|1966
## 2454                                                                                                                                      Boston|Little, Brown|c1957
## 2455                                                                                                                           New York|Harcourt, Brace & World|1964
## 2456                                                                                                                                  London|Secker & Warburg|c1981.
## 2457                                                                                                                     Westport, Conn.|Associated Booksellers|1960
## 2458                                                                                                                     Westport, Conn.|Associated Booksellers|1960
## 2459                                                                                                                                          London|Macmillan|1982.
## 2460                                                                                                                         New York|Taplinger Pub. Co.|1973, c1972
## 2461                                                                                                                                         New York|Atheneum|1965.
## 2462                                                                                                                                        New York|J. Day Co.|1958
## 2463                                                                                                                               Garden City, N.Y.|Doubleday|1956.
## 2464                                                                                                                                     New York|Coward-McCann|1963
## 2465                                                                                                                                          New York|L. Hill|1975.
## 2466                                                                                                                                       New York|Grove Press|1970
## 2467                                                                                                                                        New York|Continuum|1982.
## 2468                                                                                                                     Lincoln|Univ. of Nebraska Press|1971, c1949
## 2469                                                                                                                                         New York|Macmillan|1968
## 2470                                                                                                                                   London|Secker & Warburg|1983.
## 2471                                                                                                                                            New York|Knopf|1966.
## 2472                                                                                           Baghdad|Ministry of Information, Directorate General of Culture|1971.
## 2473                                                                                                                                         New York|Atheneum|1960.
## 2474                                                                                                                                         New York|Atheneum|1978.
## 2475                                                                                                                               New York|Simon and Schuster|1951.
## 2476                                                                                                                               Garden City, N.Y.|Doubleday|1964.
## 2477                                                                                                                                    Middlesex|Penguin Books|1965
## 2478                                                                                                                            New York|New American Library|c1982.
## 2479                                                                                                             Bloomington|Indiana University Press|1959, [c1958].
## 2480                                                                                                                            New York|Simon and Schuster|1959. --
## 2481                                                                                                                                    Baltimore|Penguin Books|1960
## 2482                                                                                                                                New York|Simon and Schuster|1954
## 2483                                                                                                                                     New York|Viking Press|1974.
## 2484                                                                                                                                 New York|Twayne Publishers|1972
## 2485                                                                                                                                          London|Heinemann|1975.
## 2486                                                                                                                                  Cleveland|World Pub. Co.|c1956
## 2487                                                                                                                                           New York|Putnam|1951.
## 2488                                                                                                                                          New York|Putnam|c1953.
## 2489                                                                                                                                    New York|Pantheon Books|1967
## 2490                                                                                                                                           New York|Dutton|1958.
## 2491                                                                                                                                           New York|Dutton|1960.
## 2492                                                                                                                                            New York|Putnam|1971
## 2493                                                                                                                               Toronto|Macmillan of Canada|1978.
## 2494                                                                                                                                    London|Hammond, Hammond|1968
## 2495                                                                                                                                          London|J. Calder|1975.
## 2496                                                                                                                                   New York|Harcourt, Brace|1955
## 2497                                                                                                                                           London|Heinemann|1955
## 2498                                                                                                                           New York|Harcourt, Brace & World|1969
## 2499                                                                                                                                          London|Hutchinson|1955
## 2500                                                                                                                       Athens, Ohio|Ohio University Press|c1967.
## 2501                                                                                                                                  London|MacGibbon and Kee|1972.
## 2502                                                                                                                                          Ramat-Gan|Massada|1969
## 2503                                                                                                                             New York|Coward, McCann|1963, c1935
## 2504                                                                                                                                           New York|Harper|c1917
## 2505                                                                                                                                            London|Methuen|1960.
## 2506                                                                                                                                        Boston|Gregg Press|1977.
## 2507                                                                                                                                      New York|McGraw-Hill|c1970
## 2508                                                                                                                                      New York|Dial Press|c1980.
## 2509                                                                                                                                        New York|Continuum|1982.
## 2510                                                                                                                  London|J. Calder|New York|Riverrun Press|1980.
## 2511                                                                                                                               New York|Taplinger Pub. Co.|1982.
## 2512                                                                                                                                    Baltimore|Penguin Books|1955
## 2513                                                                                                                         Harmondsworth, Mddx.|Penguin Books|1967
## 2514                                                                                                                                   London|Secker & Warburg|1983.
## 2515                                                                                                                                         New York|AMS Press|1971
## 2516                                                                                                                                           New York|Harper [1950
## 2517                                                                                                                                    New York|Modern library|1950
## 2518                                                                                                      Toronto|Doubleday Canada|Garden City, N.Y.|Doubleday|1974.
## 2519                                                                                                                        Lawrence|University Press of Kansas|1974
## 2520                                                                                                                                        Stockholm|Bonniers|1960?
## 2521                                                                                                                               Philadelphia|J.B. Lippincott|1951
## 2522                                                                                                                                       New York|Day|1968, c1937.
## 2523                                                                                                                New York|Coward, McCann & Geoghegan|1982, c1961.
## 2524                                                                                                                                    New York|Harper & Row|c1981.
## 2525                                                                                                                                  New York|Orion Press|c1959. --
## 2526                                                                                                      Oxford [Oxfordshire|New York|Oxford University Press|1982.
## 2527                                                                                                                                           Ann Arbor|Ardis|1979.
## 2528                                                                                                                                            London|J. Cape|1958.
## 2529                                                                                                                         New York|Harcourt Brace Jovanovich|1972
## 2530                                                                                                                                           London|Hamilton|1968.
## 2531                                                                                                                           New York|Harcourt, Brace & World|1964
## 2532                                                                                                                   New York|Harcourt, Brace & World|1964, c1959.
## 2533                                                                                                                         New York|Harcourt Brace Jovanovich|1975
## 2534                                                                                                                               Garden City, N.Y.|Doubleday|1952.
## 2535                                                                                                                               New York|F. Ungar Pub. Co.|c1976.
## 2536                                                                                                                                             London|P. Owen|1961
## 2537                                                                                                                                            New York|Knopf|1979.
## 2538                                                                                                                                         New York|Grossman|1975.
## 2539                                                                                                                          Tokyo|University of Tokyo Press|c1976.
## 2540                                                                                                                                   New York|Coward-McCann|c1953-
## 2541                                                                                                                                             London|J. Cape|1956
## 2542                                                                                                                                      New Delhi|Varma Bros.|1963
## 2543                                                                                                                                    Bombay|Jaico Pub. House|1969
## 2544                                                                                                                              London|Heinemann Educational|1978.
## 2545                                                                                                                                       Boston|Little, Brown|1962
## 2546                                                                                                                           Miami, Fla.|Mnemosyne Pub. Inc.|1969.
## 2547                                                                                                                                    New York|Schocken Books|1954
## 2548                                                                                                                                            New York|Knopf|1964.
## 2549                                                                                                                                          New York|Putnam|c1978.
## 2550                                                                                                                                     New York|Harper & Row|c1970
## 2551                                                                                                                               Garden City, N.Y.|Doubleday|1954.
## 2552                                                                                                                                                                
## 2553                                                                                                                                    Baltimore|Penguin Books|1967
## 2554                                                                                                                                 Boston|Twayne Publishers|c1979.
## 2555                                                                                                                               New York|Pellegrini & Cudahy|1952
## 2556                                                                                                                                      New York|Random House|1961
## 2557                                                                                                                                     New York|Viking Press|1957.
## 2558                                                                                                            New York, N.Y.|Fromm International Pub. Corp.|c1983.
## 2559                                                                                                                                 Boston|Gregg Press|1976, c1966.
## 2560                                                                                              New York|Kodansha International; [distributed by Harper & Row|1974
## 2561                                                                                                                                   New York|Henry Z. Walck|1954.
## 2562                                                                                                                             New York|New Directions|1973? c1939
## 2563                                                                                                                                           London|Hamilton|1968.
## 2564                                                                                                                                  New York|Schocken Books|1958].
## 2565                                                                                                                                     New York|Garland Pub.|1975.
## 2566                                                                                                                                New York|Simon and Schuster|1959
## 2567                                                                                                                      Urbana|University of Illinois Press|c1977.
## 2568                                                                                                                                     New York|Noonday Press|1954
## 2569                                                                        New York, N.Y.|Literary Classics of the United States|Distributed by Viking Press|c1983.
## 2570                                                                                                                                             London|Cassell|1965
## 2571                                                                                                                                     London|Elm Tree Books|1975.
## 2572                                                                                                                                    New York|Harper|1961, c1959.
## 2573                                                                                                                           Budapest, Hungary|Corvina Press|1964.
## 2574                                                                                                  London|Heinemann|Washington, D.C.|Three Continents Press|1980.
## 2575                                                                                                                                 Boston|Gregg Press|1979, c1970.
## 2576                                                                                                                                                London|Dent|1954
## 2577                                                                                                                               New York|F. Ungar Pub. Co.|c1979.
## 2578                                                                                                                                         New York|Liveright|1952
## 2579                                                                                                                                       New York|A.A. Knopf|1983.
## 2580                                                                                                                                     London|Hamish Hamilton|1954
## 2581                                                                                                                          Tokyo|University of Tokyo Press|c1981.
## 2582                                                                                                                                            New York|Walker|1961
## 2583                                                                                                                                  New York|MacMillan|1950 [c1949
## 2584                                                                                                                 Amherst|University of Massachusetts Press|1983.
## 2585                                                                                                                           New York|Harcourt, Brace & World|1962
## 2586                                                                                                                             New York|Vintage Books|1972, c1930.
## 2587                                                                                                                             London|Calder and Boyars|1968,c1958
## 2588                                                                                                                                   New York|Scribner|1964, c1963
## 2589                                                                                                                               London|Dent|New York|Dutton|1966.
## 2590                                                                                                    London|New York|Oxford University Press|1965-1980[v.1,1968].
## 2591                                                                                                    London|New York|Oxford University Press|1965-1980[v.1,1968].
## 2592                                                                                                                                      New York|Random House|1975
## 2593                                                                                                                                         New York|Atheneum|1962.
## 2594                                                                                                                               Delhi|Chanakya Publications|1981.
## 2595                                                                                            Harmondsworth, Middlesex, England|New York, N.Y.|Penguin Books|1982.
## 2596                                                                                                                                             London|P. Owen|1965
## 2597                                                                                                                                       New York|Grove Press|1959
## 2598                                                                                                               New York|Knopf : distributed by Random House|1975
## 2599                                                                                                                                        London|V. Gollancz|1962.
## 2600                                                                                                                                 New York|Twayne Publishers|1974
## 2601                                                                                                                                       Boston|Little, Brown|l956
## 2602                                                                                                                                             Plaistow? Eng.|1958
## 2603                                                                                                                                  New York|New Directions|c1983.
## 2604                                                                                                                                            New York|Knopf|1960.
## 2605                                                                                                                                    Middlesex|Penguin Books|1965
## 2606                                                                                                                                          New York|Putnam|c1983.
## 2607                                                                                                                                     New York|Bantam Books|1974.
## 2608                                                                                                                               London|George Allen & Unwin|1967.
## 2609                                                                                                                           Garden City, N.Y.|N. Doubleday|c1971.
## 2610                                                                                                                                            New York|Knopf|1971.
## 2611                                                                                                                                             London|Barker|1967.
## 2612                                                                                                                  Freeport, N. Y.|Books for Libraries Press|1971
## 2613                                                                                                                      Columbia|University of Missouri Press|1971
## 2614                                                                                                              New York|Knopf : distributed by Random House|1982.
## 2615                                                                           Toronto|Published for the Stefanyk Centennial Committee, by McClelland & Stewart|1971
## 2616                                                                                                              Evanston [Ill.|Northwestern University Press|1973.
## 2617                                                                      Hanover, N.H.|Published for Dartmouth College by the University Press of New England|1977.
## 2618                                                                                                                                       New York|Dial Press|1969.
## 2619                                                                                                                                         London|N. Spearman|1953
## 2620                                                                                                                                 Moscow|Progress Publishers|1973
## 2621                                                                                                                                           Moscow|Progress|1978.
## 2622                                                                                                                                          Nairobi|Heinemann|1971
## 2623                                                                                                                      New York|Holt, Rinehart and Winston|c1976.
## 2624                                                                                                                                      Ottawa|Oberon Press|c1975.
## 2625                                                                                                                        Athens, Ohio|Ohio University Press|1982.
## 2626                                                                                                                                 New York|Delacorte Press|c1978.
## 2627                                                                                                                                    New York|Random House|c1978.
## 2628                                                                                                                                      New York|Random House|1973
## 2629                                                                                                                                   Cleveland|World Pub. Co.|1963
## 2630                                                                                                                                            New York|Knopf|1965.
## 2631                                                                                                                            London|Seeker & Warburg|1983, c1982.
## 2632                                                                                                                                 Boston|Gregg Press|1979, c1976.
## 2633                                                                                                                               Garden City, N.Y.|Doubleday|1966.
## 2634                                                                                                                         New York|Harcourt Brace Jovanovich|1971
## 2635                                                                                                              New York|Knopf : distributed by Random House|1979.
## 2636                                                                                                                                      New York|Random House|1969
## 2637                                                                                                                                      New York|Random House|1951
## 2638                                                                                                                                       New York|Dial Press|1972.
## 2639                                                                                                                                 London|Lawrence & Wishart|1957.
## 2640                                                                                                                                      New York|Grove Press|1959.
## 2641                                                                                                                          New York|Farrar, Straus, Giroux|c1982.
## 2642                                                                                                                                 London|New York|M. Boyars|1983.
## 2643                                                                                                                                          New York|Praeger|1963.
## 2644                                                                                                                              London|Heinemann Educational|1978.
## 2645                                                                                                                             New York|P. S. Eriksson|1973, c1971
## 2646                                                                                                                             New-York|Fremont Publications|1983.
## 2647                                                                                                                            Singapore|Federal Publications|1983.
## 2648                                                                                                                                     New York|Arbor House|c1984.
## 2649                                                                                                                             London|Mayflower Books|1963, c1956.
## 2650                                                                                                       St. Lucia, Australia|University of Queensland Press|1980.
## 2651                                                                                                                       New Haven|College & University Press|1965
## 2652                                                                                                                                     London|Mashtots Press|1972.
## 2653                                                                                                                                    New York|Harper & Row|c1989.
## 2654                                                                                                               Garden City, N.Y.|Doubleday & Company, Inc.|1951.
## 2655                                                                                                                                       New York|Ace Books|c1972.
## 2656                                                                                                                                           New York|Dutton|1974.
## 2657                                                                                                                                Wheaton, Ill.|Tyndale House|1974
## 2658                                                                                                                                   New York|Schocken Books|1985.
## 2659                                                                                                                                      London|Folio Society|1963.
## 2660                                                                                                                                     Chicago|H. Regnery Co.|1964
## 2661                                                                                                                                        New York|Doubleday|1989.
## 2662                                                                                                                         New York|New Directions Pub. Corp.|1973
## 2663                                                                                                                            New York|Dodd, Mead & Company|c1987.
## 2664                                                                                                                                     London|Serpent's Tail|1988.
## 2665                                                                                                                         New York|Harcourt Brace Jovanovich|1973
## 2666                                                                                                                           Bat-Yam, Israel|E. Lewin-Epstein|1968
## 2667                                                                                                                                             London|Methuen|1958
## 2668                                                                                                                                New York|Taplinger Pub. Co.|1979
## 2669                                                                                                                                        London|G. Duckworth|1965
## 2670                                                                                                                               New York|Simon and Schuster|1960.
## 2671                                                                                                                            Toronto|McClelland and Stewart|1979.
## 2672                                                                                                                                          London|Elek Books|1956
## 2673                                                                                                                                    London|Chatto & Windus|1953.
## 2674                                                                                                                                           Ann Arbor|Ardis|c1972
## 2675                                                                                                              New York|Knopf; [distributed by Random House|1973.
## 2676                                                                                                                                     London|The Bodley Head|1957
## 2677                                                                                                                          Minneapolis|Bibliotheca Islamica|1973.
## 2678                                                                                                                                    Baltimore|Penguin Books|1969
## 2679                                                                                                                                          New York|Scribner|1964
## 2680                                                                                                                     Lincoln|University of Nebraska Press|c1983.
## 2681                                                                                                                                    New York|Modern Library|1951
## 2682                                                                                                                   St. Clair Shores, Mich.|Scholarly Press|1970.
## 2683                                                                                                                                       New York :Taplinger|1980.
## 2684                                                                                                                                 Boston|Gregg Press|1978, c1956.
## 2685                                                                          New York|Literary Classics of the United States|distributed by the Viking Press|c1982.
## 2686                                                                                                                                            London|Collins|1968.
## 2687                                                                                                                                       New York|Grove Press|1962
## 2688                                                                                                                                          New York|Putnam|c1964.
## 2689                                                                                                                               Toronto|McClelland & Stewart|1957
## 2690                                                                                                                                    New York|Mason/Charter|1975.
## 2691                                                                                                                              New York, N.Y.|Bluejay Books|1984.
## 2692                                                                                                                               Garden City, N.Y.|Doubleday|1974.
## 2693                                                                                                                     New York|Holt, Rinehart, and Winston|c1978.
## 2694                                                                                                                                 Boston|Gregg Press|1977, c1953.
## 2695                                                                                                                                      New York|Third Press|c1973
## 2696                                                                                                                                 London|Secker and Warburg|1956.
## 2697                                                                                                                                Moscow|Progress Publishers|1969.
## 2698                                                                                                                                   New York|Berkley Books|c1983.
## 2699                                                                                                                                           New York|Morrow|1976.
## 2700                                                                                                                                 Beijing,China|Panda Books|1981.
## 2701                                                                                                                           Toronto|McClelland and Stewart|c1981.
## 2702                                                                                                      Toronto|Doubleday Canada|Garden City, N.Y.|Doubleday|1978.
## 2703                                                                                                               Kuala Lumpur|London|Oxford University Press|1972.
## 2704                                                                                                                             Westport, Conn.|Hyperion Press|1973
## 2705                                                                                                                                            New York|Knopf|1979.
## 2706                                                                                                                                    New York|Harper & Row|c1978.
## 2707                                                                                                                                        Denver|A. Swallow|c1964.
## 2708                                                                                                                                                London|Elek|1954
## 2709                                                                                                                           New York|Harcourt, Brace & World|1967
## 2710                                                                                                                     London|New York|White Lion Publishers|1975.
## 2711                                                                                                                                           London|Hamilton|1975.
## 2712                                                                                                                                     London|Hamish Hamilton|1975
## 2713                                                                                                                San Diego|Harcourt Brace Jovanovich|1983, c1950.
## 2714                                                                                                                                           London|Constable|1955
## 2715                                                                                                                                    New York|Dutton|1978, c1977.
## 2716                                                                                                                                      New York|Random House|1957
## 2717                                                                                                                                          New York|Scribner|1970
## 2718                                                                                                                                            New York|Putnam|1952
## 2719                                                                                                                                            London|P. Owen|1982.
## 2720                                                                                                                                            New York|Knopf|1979.
## 2721                                                                                                                                 New York|YKUF Publishers|c1974.
## 2722                                                                                                                                       New York|T. Yoseloff|1956
## 2723                                                                                                                               Garden City, N.Y.|Doubleday|1972.
## 2724                                                                                                                                     New York|Prentice-Hall|1950
## 2725                                                                                                                                           London|Gollancz|1971.
## 2726                                                                                                                                            New York|Knopf|1954.
## 2727                                                                                                                                            New York|Knopf|1957.
## 2728                                                                                                                                 London|Lawrence & Wishart|1956.
## 2729                                                                                                                              New York|New American Library|1970
## 2730                                                                                                                                           New York|Dutton|1956.
## 2731                                                                                                                                  New York|Vanguard Press|c1983.
## 2732                                                                                                                                            New York|Knopf|1950.
## 2733                                                                                                                              New York|Random House|1975] c1960.
## 2734                                                                                                                                           London|Heinemann|1962
## 2735                                                                                                                                             London|Cassell|1952
## 2736                                                Toronto|Exile Editions|Thornhill, Ont.|Distributed in Canada and the United States by Firefly Books|1981, c1980.
## 2737                                                                                                                                      New York|Random House|1973
## 2738                                                                                                                                   Boston|Houghton Mifflin|1983.
## 2739                                                                                                                                           Toronto|Anansi|c1980.
## 2740                                                                                                              Los Angeles, Calif.|Holloway House Pub. Co.|c1980.
## 2741                                                                                                                             New York|Berkley Books|1983, c1978.
## 2742                                                                                                                                 Manchester|Carcanet Press|1983.
## 2743                                                                                                                                     New York|Knopf|1984, c1983.
## 2744                                                                                                                New York|Knopf|Distributed by Random House|1983.
## 2745                                                                                                                                   New York|Vintage Books|c1983.
## 2746                                                                                                                                New York|The Modern library|195-
## 2747                                                                                                                                           London|Gollancz|1963.
## 2748                                                                                                                                     New York|Persea Books|c1982
## 2749                                                                                                                               Garden City, N.Y.|Doubleday|1964.
## 2750                                                                                                                  Cambridge, Mass.|Vietnam Resource Center|1974-
## 2751                                                                                                                                New Delhi|India Paperbacks|1977.
## 2752                                                                 Calcutta|Writers Workshop|Thompson, Conn.|sole agents in U. S., Inter Culture Associates|c1978.
## 2753                                                                                                                                            New York|Harper|1960
## 2754                                                                                                                                            New York|Knopf|1984.
## 2755                                                                                                                              New York|Bantam Books|1963, c1962.
## 2756                                                                                                                       Totowa, N.J.|Rowman and Littlefield|1979.
## 2757                                                                                                      Oxford [Oxfordshire|New York|Oxford University Press|1983.
## 2758                                                                                                                   Oxford|New York|Oxford University Press|1982.
## 2759                                                                                                                                      Toronto|Clark, Irwin|1951.
## 2760                                                                                                                                   New York|Schocken Books|1984.
## 2761                                                                                                                                           London|Heinemann|1960
## 2762                                                                                                                   Oxford|New York|Oxford University Press|1983.
## 2763                                                                                                                           London|Sydney [etc.|Bodley Head|1967-
## 2764                                                                                                                                     New York|Garland Pub.|1979.
## 2765                                                                                                                                   New York|Modern Library|1966.
## 2766                                                                                                                             Boston|Houghton Mifflin|1967 [c1966
## 2767                                                                                                                              New York|G.P. Putnam's Sons|c1984.
## 2768                                                                                                                      San Diego|Harcourt Brace Jovanovich|c1984.
## 2769                                                                                                                                  New York|H. Fertig|1974 [c1928
## 2770                                                                                                                             Peking|Foreign Languages Press|1964
## 2771                                                                                                                              New York|St. Martin's Press|c1984.
## 2772                                                                                                                       Garden City, N.Y.|Dial Press|1983, c1936.
## 2773                                                                                                                                   London|Secker & Warburg|1956.
## 2774                                                                                                                   London|New York|Oxford University Press|1957.
## 2775                                                                                                                                New York, N.Y.|Avon|1979, c1976.
## 2776                          Tokyo|New York|Kodansha International|New York, N.Y.|Distributed in the U.S. by Kodansha International/USA, through Harper & Row|1984.
## 2777                                                                                                                                London|Dent|New York|Dutton|1970
## 2778                                                                                                                           New York|Grosset & Dunlap|1958, c1929
## 2779                                                                                                                              New York|Simon and Schuster|c1956.
## 2780                                                                                                                           New York|Farrar, Straus & Giroux|1966
## 2781                                                                                                                                            New York|Knopf|1954.
## 2782                                                                                                                                     New York|Noonday Press|1959
## 2783                                                                                                                                   New York|Harcourt, Brace|1957
## 2784                                                                                                                                 Boston|Gregg Press|1979, c1976.
## 2785                                                                                                                         New York|Harcourt Brace Jovanovich|1970
## 2786                                                                                                                                            New York|Knopf|1985.
## 2787                                                                                                                                   Boston|Houghton Mifflin|1984.
## 2788                                                                                                                                           New York|Viking|1985.
## 2789                                                                                                                                   Boston|Houghton Mifflin|1975.
## 2790                                                                                                                                   Boston|Houghton Mifflin|1986.
## 2791                                                                                                                                    New York|Harper & Row|c1987.
## 2792                                                                                                                           Manchester [Lancashire|Carcanet|1984.
## 2793                                                                                                                           Toronto|McClelland and Stewart|c1987.
## 2794                                                                                                                                    New York|Random House|c1988.
## 2795                                                                                                                      Bloomington|Indiana University Press|c1982
## 2796                                                                                                                           San Francisco|North Point Press|1983.
## 2797                                                                                                                 New York|Coward, McCann & Geoghegan|1974, c1973
## 2798                                                                                                                       Moscow|Foreign Languages Pub. House|1954.
## 2799                                                                                                                                  Nairobi|Longman Drumbeat|1979.
## 2800                                                                                                                                   New York|Ives Washburn|c1962.
## 2801                                                                                                                                          London|Hutchinson|1956
## 2802                                                                                                                                  New York|Delacorte Press|1967.
## 2803                                                                                                                                  London|Calder and Boyars|1971.
## 2804                                                                                                                                         London|Hutchinson|1984.
## 2805                                                                                                                                  New York|Alfred A. Knopf|1984.
## 2806                                                                                                                                            New York|Knopf|1972.
## 2807                                                                                                                                Norfolk, Conn.|J. Laughlin|1954.
## 2808                                                                                                                                           New York|Crowell|1956
## 2809                                                                                                               Lincoln|University of Nebraska Press|1984, c1927.
## 2810                                                                                                                           New York|Modern Library|1964?] c1949.
## 2811                                                                                                                                  New York|Alfred A. Knopf|1978.
## 2812                                                                                                                                   London|Secker & Warburg|c1965
## 2813                                                                                                                                          London|Heinemann|1966.
## 2814                                                                                                                              Garden City, N. Y.|Doubleday|1953.
## 2815                                                                                                                                        London|W. Heinemann|1952
## 2816                                                                                                                                    New York|Coward-McCann|1963.
## 2817                                                                                                                                    New York|Summit Books|c1985.
## 2818                                                                                                                                           New York|Morrow|1976.
## 2819                                                                                                                               New York|McGraw-Hill|1981, c1968.
## 2820                                                                                                                            Peking|Foreign Languages Press|1956-
## 2821                                                                                                                                  New York|Pantheon Books|c1985.
## 2822                                                                                                                New York|Knopf|Distributed by Random House|1984.
## 2823                                                                                                                                          London|Constable|1983.
## 2824                                                                                                                                               London|Cape|1979.
## 2825                                                                                                                              New York|New American Library|1963
## 2826                                                                                                                                        London|Bodley Head|1971.
## 2827                                                                                                                 Minneapolis|University of Minnesota Press|1957.
## 2828                                                                                                                             New York|Vintage Books|1985, c1984.
## 2829                                                                                                                          London|Collins and Harvill Press|1960.
## 2830                                                                                                                                          London|Hutchinson|1972
## 2831                                                                                                                              New York|Arbor House|1985], c1954.
## 2832                                                                                                             New York|Linden Press/Simon & Schuster|1986, c1985.
## 2833                                                                                                                   London|J. Calder|New York|Riverrun Press|1985
## 2834                                                                                                              Minneapolis, Minn.|Bethany House Publishers|c1985.
## 2835                                                                                                                                New York|Renaissance Press|1951.
## 2836                                                                                                                               Garden City, N.Y.|Doubleday|1983.
## 2837                                                                                                                             Hongkong|Joint Publishing Co.|1982.
## 2838                                                                                                                                 New York|Scribner|1961?- c1935-
## 2839                                                                                                                                               London|Owen|1971.
## 2840                                                                                                                           Garden City, New York|Doubleday|1975.
## 2841                                                                                                                                          London|Macmillan|1970.
## 2842                                                                                                                                      New York|Grove Press|1959.
## 2843                                                                                                      Carbondale [Ill.|Southern Illinois University Press|c1983.
## 2844                                                                                                                                               London|Owen|1969.
## 2845                                                                                                                     Seattle|University of Washington Press|1973
## 2846                                                                                                                                    New York|Pantheon Books|1960
## 2847                                                                                                                               Garden City, N.Y.|Doubleday|1968.
## 2848                                                                                                                                 New York|Delacorte Press|c1983.
## 2849                                                                                                                         Ann Arbor, Mich.|Ardis|c1979 [i.e. 1978
## 2850                                                                                                                 Moscow|Foreign Languages Publishing House|1956?
## 2851                                                                                                                                 New York|Scribner|1961?- c1935-
## 2852                                                                                                                     Westport, Conn.|Associated Booksellers|1958
## 2853                                                                                                                                               London|Cape|1970.
## 2854                                                                                                                                            London|Collins|1975.
## 2855                                                                                                                                            New York|Knopf|1971.
## 2856                                                                                                                                           New York|Dutton|1957.
## 2857                                                                                                                                   New York|Harmony Books|c1982.
## 2858                                                                                                                     Harmondsworth, Middlesex|Penguin Books|1954
## 2859                                                                                                                                    New York|Vintage Books|1955.
## 2860                                                                                                                                 Göppingen|Kümmerle Verlag|1983.
## 2861                                                                                                                                Ann Arbor, Mich.|Hermitage|1983.
## 2862                                                                                                                                 London|New English Library|1962
## 2863                                                                                                                              New York|Pocket Books|1976, c1974.
## 2864                                                                                                                                    New York|Harper & Row|c1978.
## 2865                                                                                                                                    London|Secker & Warburg|1962
## 2866                                                                                                                                           New York|Ungar|c1977.
## 2867                                                                                                                                         New York|AMS Press|1974
## 2868                                                                                                                                          London|Heinemann|1974.
## 2869                                                                                                                               Garden City, N.Y.|Doubleday|1983.
## 2870                                                                                                                      Edinburgh|Edinburgh University Press|1980.
## 2871                                                                                                                                     London|Lincolns-Prager|1958
## 2872                                                                                                                                         New York|Red Dust|1982.
## 2873                                                                                                                                     New York|Viking Press|1955.
## 2874                                                                                                                                        New York|Ace Books|c1958
## 2875                                                                                                                                     Bombay|Orient Longman|1976.
## 2876                                                                                                                                      New York|Random House|1970
## 2877                                                                                                                                         Leiden|E.J. Brill|1965.
## 2878                                                                                                              New York|Knopf; [distributed by Random House|1972.
## 2879                                                                                                                                      New York|Random House|1974
## 2880                                                                                                                               Garden City, N.Y.|Doubleday|1982.
## 2881                                                                                                                           Wainscott, N.Y.|Pushcart Press|c1983.
## 2882                                                                                                                                    London|Calder & Boyars|1974.
## 2883                                                                                                                                           New York|Putnam|1981.
## 2884                                                                                                                 London|Ibadan [etc.|Heinemann Educational|1969.
## 2885                                                                                                                                        London|W. Heinemann|1951
## 2886                                                                                                                                            New York|Knopf|1972.
## 2887                                                                                                                           New York|Harcourt, Brace & World|1968
## 2888                                                                                                                                  Cleveland|World Pub. Co.|c1961
## 2889                                                                                                                               Garden City, N.Y.|Doubleday|1969.
## 2890                                                                                                                                         New York|Red Dust|1978.
## 2891                                                                                                                                 Eau Claire, Wis.|E.M. Hale|1958
## 2892                                                                                                                                    Baltimore|Penguin Books|1967
## 2893                                                                                                                        New York|Holt, Rinehart and Winston|1969
## 2894                                                                                                                                   London|Secker & Warburg|1958.
## 2895                                                                                                                                          New York|Dutton|c1983.
## 2896                                                                                                                         New York|Farrar, Straus and Giroux|1974
## 2897                                                                                                                                   Ann Arbor, Mich.|Ardis|c1982.
## 2898                                                                                                                                      New York|Knopf|1955 [c1954
## 2899                                                                                                                                        New York|H. Fertig|1976.
## 2900                                                                                                              New York|Knopf; [distributed by Random House|1973.
## 2901                                                                                                                                    New York|P. S. Eriksson|1965
## 2902                                                                                                    New York|B. Geis Associates|Distributed by Random House|1963
## 2903                                                                                                                                     New York|Putnam|1971, c1970
## 2904                                                                                                                           New York|Duell, Sloan and Pearce|1951
## 2905                                                                                                                                      New York|Random House|1960
## 2906                                                                                                                                          London|Hutchinson|1962
## 2907                                                                                                                                   New York|Vanguard Press|1963.
## 2908                                                                                                                                  New York|Vanguard Press|c1960.
## 2909                                                                                                                         Harmondsworth, Eng.|Penguin Books|1962.
## 2910                                                                                                                                           New York|Harper|1964.
## 2911                                                                                                                                     New York|Random house|1960.
## 2912                                                                                                                             New York|New American Library|1965.
## 2913                                                                                                                                London|Sidgwick and Jackson|1956
## 2914                                                                                                                                  New York|Crown Publishers|1966
## 2915                                                                                                                                    London|Secker & Warburg|1962
## 2916                                                                                                                    New York|Berkley Books|1983 printing, c1977.
## 2917                                                                                                                                    New York|Coward-McCann|c1955
## 2918                                                                                                         Philadelphia|Jewish Publication Society of America|1968
## 2919                                                                                                                                         New York|Atheneum|1969.
## 2920                                                                                                                               Garden City, N.Y.|Doubleday|1977.
## 2921                                                                                                                                            Toronto|Anansi|c1970
## 2922                                                                                                                       Mamaroneck, N.Y.|P. P. Appel|1977, c1952.
## 2923                                                                                                                                Moscow|Progress Publishers|1978.
## 2924                                                                                                                       Moscow|Foreign Languages Pub. House|1953.
## 2925                                                                                                                                 New York|F. Ungar Pub. Co.|1960
## 2926                                                                                                                              New York|Simon and Schuster|c1976.
## 2927                                                                                                                             New York|Vintage Books|1984, c1978.
## 2928                                                                                                                                        New York|AMS Press|1976.
## 2929                                                                                                                      London|Dent|New York|Dutton|reprinted 1955
## 2930                                                                                                                 New York|Holt, Rinehart and Winston|1970, c1971
## 2931                                                                                                                             New York|Vintage Books|1966, c1965.
## 2932                                                                                                    London|New York|Oxford University Press|1965-1980[v.1,1968].
## 2933                                                                                                                           Brighton [Eng.|Harvester Press|c1980.
## 2934                                                                                                                                    New York|Vintage Books|1983.
## 2935                                                                                                                                  Boston|Houghton, Mifflin|1956.
## 2936                                                                                                                                    Boston|Houghton Mifflin|1950
## 2937                                                                                            Harmondsworth, Middlesex, England|New York, N.Y.|Penguin Books|1982.
## 2938                                                                                                                            Toronto|McClelland and Stewart|c1967
## 2939                                                                                                                                       New York|Ace Books|c1979.
## 2940                                                                                                                                 London|Secker and Warburg|1971.
## 2941                                                                                                                                               London|Cape|1982.
## 2942                                                                                                                       Athens, Ohio|Ohio University Press|c1980.
## 2943                                                                                                                                         London|Hutchinson|1980.
## 2944                                                                                                                                 London|New Authors Limited|1964
## 2945                                                                                                                                   London|Secker & Warburg|1982.
## 2946                                                                                                            New York, N.Y.|Fromm International Pub. Corp.|c1982.
## 2947                                                                                                                              New York|Collier Books|1970, c1966
## 2948                                                                                                                                        Boston|Gregg Press|1977.
## 2949                                                                                                                         New York|Taplinger Pub. Co.|1971, c1970
## 2950                                                                                                                              New York|Simon and Schuster|c1983.
## 2951                                                                                                                                            New York|Knopf|1966.
## 2952                                                                                                                                      New York|Harper & Row|1973
## 2953                                                                                                                                            New York|Knopf|1984.
## 2954                                                                                                                                         New York|L. Hill|c1975.
## 2955                                                                                                                      Toronto|New York|Bantam Books|1975, c1968.
## 2956                                                                                                                               Garden City, N.Y.|Doubleday|1982.
## 2957                                                                                                                                          London|Macmillam|1967.
## 2958                                                                                                                                             New York|Ace|c1980.
## 2959                                                           New York, N.Y.|Literary Classics of the United States|Distributed to the trade by Viking Press|c1982.
## 2960                                                                                                                        Garden City, N. Y.|Doubleday|1953 [c1928
## 2961                                                                                                                               Garden City, N.Y.|Doubleday|1950.
## 2962                                                                                                                                            New York|Knopf|1968.
## 2963                                                                                                                                     London|Tom Stacey Ltd|1973.
## 2964                                                                                                                                    New York|Morrow|1977, c1973.
## 2965                                                                                                                                     Budapest|Corvina Press|1962
## 2966                                                                                                                                          New York|Scribner|1975
## 2967                                                                                                                      Ithaca [N.Y.|Cornell University Press|1971
## 2968                                                                  Peking|Foreign Languages Press [distributed by Guozi Shudian (China Publications Centre)|1964.
## 2969                                                                                                                         New York|Farrar, Straus and Giroux|1965
## 2970                                                                                                                                    London|Calder & Boyars|1967.
## 2971                                                                                                                                       London|W. Heinemann|1951.
## 2972                                                                                                                      San Diego|Harcourt Brace Jovanovich|c1983-
## 2973                                                                                                                      San Diego|Harcourt Brace Jovanovich|c1983-
## 2974                                                                                                                        New York|Berkley Pub. Corp.|1973, c1971.
## 2975                                                                                                                                       New York|Macmillan|c1978.
## 2976                                                                                                                                    London|Gollancz|1978, c1977.
## 2977                                                                                                                            Boston|Houghton Mifflin|1982, c1981.
## 2978                                                                                                                       Englewood Cliffs, N.J.|Prentice-Hall|1969
## 2979                                                                                                                New York|Delacorte Press/Seymour Lawrence|c1984.
## 2980                                                                                                                                           New York|Messner|1971
## 2981                                                                                                                                      New York|Grove Press|1979.
## 2982                                                                                                                                     New York|Grove Press|1970].
## 2983                                                                                                                                           London|Heinemann|1950
## 2984                                                                                                                                London|Collins and Harvill|1981.
## 2985                                                                                                                        Moscow|Foreign Languages Pub. House|1956
## 2986                                                                                                                         Austin|University of Texas Press|c1963.
## 2987                                                                                                                              New York|Atheneum Publishers|1960.
## 2988                                                                                                                       New York|Harcourt Brace Jovanovich|c1963.
## 2989                                                                                                                           New York|Larchwood Publications|1980.
## 2990                                                                                                                                       London|Zodiac Press|1958.
## 2991                                                                                                                                       New York|Macmillan|c1979.
## 2992                                                                                                                                         London|Hutchinson|1977.
## 2993                                                                                                                   St. Clair Shores, Mich.|Scholarly Press|1970.
## 2994                                                                                                                      San Diego|Harcourt Brace Jovanovich|c1983-
## 2995                                                                                                                      London|J. Baker for the Unicorn Press|1963
## 2996                                                                                                                                  Bangkok|D. K. Book House|1977.
## 2997                                                                                                                       New York|Harcourt Brace Jovanovich|c1981.
## 2998                                                                                                                         New York|Harcourt Brace Jovanovich|1972
## 2999                                                                                                                               London|Sidgwick and Jackson|1963.
## 3000                                                                                                                                    London|Chatto & Windus|1971.
## 3001                                                                                                                                    New York|Pantheon Books|1974
## 3002                                                                                                        New York|Grove Press : distributed by Random House|1978.
## 3003                                                                                                                                     New York|Viking Press|1951.
## 3004                                                                                                                                               London|Bles|1967.
## 3005                                                                                                                                       London|Harvill Press|1955
## 3006                                                                                                         San Antonio|Principia Press of Trinity University|1963.
## 3007                                                                                                                    New York|Linden Press/Simon & Schuster|1980.
## 3008                                                                                                                               Garden City, N.Y.|Doubleday|1984.
## 3009                                                                                                                                                London|Owen|1966
## 3010                                                                                                                               Garden City, N.Y.|Doubleday|1978.
## 3011                                                                                                                                             London|P. Owen|1958
## 3012                                                                                                                                            London|P. Owen|c1966
## 3013                                                                                                                                    New York|Pantheon Books|1960
## 3014                                                                                                                             Boston|Houghton Mifllin|1964 [c1963
## 3015                                                                                                                                New York, N.Y.|Grove Press|1955.
## 3016                                                                                                                       Port Washington, N.Y.|Kennikat Press|1963
## 3017                                                                                                                         New York|Simon and Schuster|1959 [c1958
## 3018                                                                                           New York|Pocket Books|1974|(1st Pocket Books printing, October, 1974)
## 3019                                                                                                                                     Fontwell|Centaur Press|1963
## 3020                                                                                                                                      New York|Urizen Books|1976
## 3021                                                                                                                                    New York|Putnam|1979, c1963.
## 3022                                                                                                                          New York|Oxford University Press|1982.
## 3023                                                                                                                              New York|New American Library|1982
## 3024                                                                                                                                            New York|Knopf|1956.
## 3025                                                                                                                                New York|Dial Press|1964, [c1955
## 3026                                                                                                                           Bucharest|"The Book" Pub. House|1955.
## 3027                                                                                                                                  New York|Ballantine Books|1972
## 3028                                                                                                                     Madison|University of Wisconsin Press|1969.
## 3029                                                                                                                                             London|Cassell|1963
## 3030                                                                                                                       Port Washington, N.Y.|Kennikat Press|1963
## 3031                                                                                                                             Toronto|McClelland and Stewart|1961
## 3032                                                                                                                                         T. Yoseloff|1963, c1962
## 3033                                                                       Dobbs Ferry, N.Y.|Transnational Publishers|New York, N.Y.|Horizon/New Horizon Press|1984.
## 3034                                                                                                                                   Cleveland|World Pub. Co.|1959
## 3035                                                                                                                                    New York|Harper & Row|c1979.
## 3036                                                                                                                                   New York|Harcourt, Brace|1958
## 3037                                                                                                                                            London|Methuen|1971.
## 3038                                                                                 Hong Kong|Chinese University Press|Seattle|University of Washington Press|1978.
## 3039                                                                                                                                       New York|Ace Books|c1976.
## 3040                                                                                                                                        London|H. Hamilton|c1960
## 3041                                                                                                                      San Diego|Harcourt Brace Jovanovich|c1983.
## 3042                                                                                                                                New York|Dover Publications|1969
## 3043                                                                                                                  New York|Farrar, Straus and Giroux|1966, c1960
## 3044                                                                                                                          New York|Farrar, Straus & Giroux|1968.
## 3045                                                                                                                                           London|Gollancz|1975.
## 3046                                                                                                                                           New York|Morrow|1976.
## 3047                                                                                                                                               London|Arco|1967.
## 3048                                                                                                                   Freeport, N.Y.|Books for Libraries Press|1970
## 3049                                                                                                                                      Taipei|Heritage Press|1963
## 3050                                                                                                                                          London|Heinemann|1974.
## 3051                                                                                                                                London|Eyre & Spottiswoode|1957.
## 3052                                                                                                                                 New York|Ace Books|1980, c1967.
## 3053                                                                                                                                           New York|Messner|1955
## 3054                                                                                                                                           London|J. Calder|1964
## 3055                                                                                                                                 Liverpool|University Press|1954
## 3056                                                                                                                                       New York|Ace Books|c1971.
## 3057                                                                                                                                            New York|Knopf|1953.
## 3058                                                                                                                              Garden City, N.Y.|Dial Press|1984.
## 3059                                                                                                                                London|Dent|New York|Dutton|1954
## 3060                                                                                                                                            New York|Knopf|1973.
## 3061                                                                                                                                New York|Library Publishers|1955
## 3062                                                                                                                                London|Dent|New York|Dutton|1956
## 3063                                                                                                        New York|Vintage Books, a division of Random House|c1953
## 3064                                                                                                                                     Harmondsworth|Penguin|1972.
## 3065                                                                                                                                Kiev|Mistetstvo Publishers|1972.
## 3066                                                                                                                                           Moscow|Progress|1976.
## 3067                                                                                                                                  London|Allison and Busby|1976.
## 3068                                                                                                                                            New York|Knopf|1977.
## 3069                                                                                                                                New York|Simon and Schuster|1967
## 3070                                                                                                                                          New York|Scribner|1971
## 3071                                                                                                                                    New York|Harper & Row|c1977.
## 3072                                                                                                                                       New York|Weatherhill|1971
## 3073                                                                                                                                     New York|Trident Press|1973
## 3074                                                                                                                         New York|Haskell House Publishers|1972.
## 3075                                                                                                                            Tel-Aviv|Massadah--P.E.C. Press|1965
## 3076                                                                                                                                 New York|Twayne Publishers|1969
## 3077                                                                                                                                   New York|Vintage Books|c1984.
## 3078                                                                                                                                   Boston|Houghton Mifflin|1971.
## 3079                                                                                                                               Harmondsworth|Penguin Books|1978.
## 3080                                                                                                                       Moscow|Foreign Languages Pub. House|1957?
## 3081                                                                                                                                        New York, NY|Knopf|1984.
## 3082                                                                                                                        London|Washington, D.C.|Peter Owen|1984.
## 3083                                                                                                                                   London|Secker & Warburg|1978.
## 3084                                                                                                                                    New York|Pantheon Books|1964
## 3085                                                                                                                         New York|Simon and Schuster|1954 [c1953
## 3086                                                                                                                                         New York|Atheneum|1973.
## 3087                                                                                                                                     New York|Geis|c1959, c1962.
## 3088                                                                                    Harmondsworth, Middlesex, England|New York, N.Y., U.S.A.|Penguin Books|1984.
## 3089                                                                                                                    London|Boston : Routledge & Kegan Paul|1978.
## 3090                                                                                                                                            New York|Knopf|1961.
## 3091                                                                                                                           Philadelphia|Westminster Press|c1981.
## 3092                                                                                                                                            London|Methuen|1966.
## 3093                                                                                                                                 London|Secker and Warburg|1951.
## 3094                                                                                                                                      New York|A. A. Knopf|1959.
## 3095                                                                                                                                             London|P. Owen|1964
## 3096                                                                                                                                     New York|Coward-McCann|1967
## 3097                                                                                                                                  New York|J. Messner|1955,c1954
## 3098                                                                                                                                       New York|Braziller|c1962.
## 3099                                                                                                                             Tel-Aviv|Hakibbutz Hameuchad|1981].
## 3100                                                                                                                          Harmondsworth, Eng.|Penguin Books|1972
## 3101                                                                                                                                            New York|Harper|1950
## 3102                                                                                                                                      New York|Harper & Row|1971
## 3103                                                                                                           Rutherford|Fairleigh Dickinson University Press|c1972
## 3104                                                                                                                      Bloomington|Indiana University Press|1979-
## 3105                                                                                                                                New York, NY|Bluejay Books|1984.
## 3106                                                                                               Tel Aviv|Institute for the Translation of Hebrew Literature|1968.
## 3107                                                                                                                                   Boston|Houghton Mifflin|1974.
## 3108                                                                                                                                           London|J. Calder|1964
## 3109                                                                                                                         New York|Farrar, Straus and Giroux|1971
## 3110                                                                                                                   London|New York|Oxford University Press|1957.
## 3111                                                                                                                              Kathmandu?|Sondra Zeidenstein|1972
## 3112                                                                                                                               Essex, Conn.|Gallery Press|c1976.
## 3113                                                                                                                                     New York|E.P. Dutton|c1984.
## 3114                                                                                                                               Garden City, N.Y.|Doubleday|1984.
## 3115                                                                                                                                      Boston|Little, Brown|1959.
## 3116                                                                                                                                      London|Andre Deutsch|1982.
## 3117                                                                                                                                        New York|Vanguard|c1964.
## 3118                                                                                                                                      London|Jonathan Cape|1965.
## 3119                                                                                                                  Garden City, N.Y.|Published by Doubleday|1950.
## 3120                                                                                                                           London|London Magazine Editions|1981.
## 3121                                                                                                                             Rutland, Vt.|C.E. Tuttle Co.|c1983.
## 3122                                                                                                                       Moscow|Foreign Languages Pub. House|1961?
## 3123                                                                                                                               Garden City, N.Y.|Doubleday|1971.
## 3124                                                                                                                        Taipei, Taiwan|Mei Ya Publications|c1970
## 3125                                                                                                                                         New York|Liveright|1964
## 3126                                                                                                                                        New York|Antheneum|1962.
## 3127                                                                                                                             Tallahassee, Fla.|Naiad Press|1984.
## 3128                                                                                                                         Maplewood, N.J.|Waterfront Press|c1982.
## 3129                                                                                                                                     New York|Viking Press|1984.
## 3130                                                                                                                       New York|Harcourt, Brace, Jovanovich|1971
## 3131                                                                                                                                    New York|Modern Library|1952
## 3132                                                                                                                                      London|J. Cape|1964, c1962
## 3133                                                                                                                                           Moscow|Progress|1977.
## 3134                                                                                                                                 Boston|Gregg Press|1976, c1962.
## 3135                                                                                                                       Lincoln|University of Nebraska Press|1973
## 3136                                                                                                                         New York|Senda Nueva de Ediciones|1983.
## 3137                                                                                                                                             London|J. Cape|1954
## 3138                                                                                                                                             London|Collins|1953
## 3139                                                                                                                                     New York|Dutton|1969, c1968
## 3140                                                                                                                     Westport, Conn.|Associated Booksellers|1962
## 3141                                                                                                                                    New York|Harper & Row|c1984.
## 3142                                                                                                                           New York|Harcourt, Brace & World|1965
## 3143                                                                                                                                            New York|Knopf|1971.
## 3144                                                                                                              New York|Knopf : distributed by Random House|1975.
## 3145                                                                                                                                 Indianapolis|Bobbs-Merrill|1973
## 3146                                                                                                                           Beijing|Foreign Languages Press|1981-
## 3147                                                                                                                                            New York|Knopf|1950.
## 3148                                                                                                                              Garden City, N. Y.|Double-day|1971
## 3149                                                                                                                               Garden City, N.Y.|Doubleday|1972.
## 3150                                                                                                                                             London|P. Owen|1965
## 3151                                                                                                                                             London|P. Owen|1963
## 3152                                                                                                                                         London|Adam Books|1970.
## 3153                                                                                                                                             London|P. Owen|1962
## 3154                                                                                                                                               London|Owen|1968.
## 3155                                                                                                                     Madison|University of Wisconsin Press|1966.
## 3156                                                                                                                             New York|Paragon Books|1979, c1966.
## 3157                                                                                                                       New York|New Directions Pub. Corp.|c1982.
## 3158                                                                                                                       Moscow|Foreign Languages Pub. House|195-?
## 3159                                                                                                                            Peking|Foreign Languages Press|1955.
## 3160                                                                                                                           Beijing|Foreign Languages Press|1984.
## 3161                                                                                                                                    London|Calder & Boyars|1966.
## 3162                                                                                                                                      New York|Grove Press|1962.
## 3163                                                                                                                                      New York|Viking Press|1971
## 3164                                                                                                                                             London|P. Owen|1960
## 3165                                                                                                                                        New York|Dodd, Mead|1960
## 3166                                                                                                                                       Singapore|Heinemann|1978.
## 3167                                                                                                                             Garden City, N.Y.|N. Doubleday|1962
## 3168                                                                                                               Bloomington|Indiana University Press|1976, c1933.
## 3169                                                                                                                                      New York|Knopf|1971 [c1970
## 3170                                                                                                                     Harmondsworth, Middlesex|Penguin Books|1955
## 3171                                                                                                                                             London|J. Cape|1952
## 3172                                                                                                                                          London|Macmillan|1974.
## 3173                                                                                                                                     New York|Viking Press|1958.
## 3174                                                                                                                             London|Weidenfeld and Nicolson|1960
## 3175                                                                                                              Fort Worth|Texas Christian University Press|c1981.
## 3176                                             New York, N.Y.|Literary Classics of the U.S.|Distributed to the trade in the U.S. and Canada by Viking Press|c1985.
## 3177                                                                                                                                    New York|Random House|c1979.
## 3178                                                                                                                             New York|McGraw-Hill Book Co.|c1972
## 3179                                                                                                                                            New York|Harper|1962
## 3180                                                                                                                           London|Sydney [etc.|Bodley Head|1967-
## 3181                                                                                                                                   Ann Arbor, Mich.|Ardis|c1985.
## 3182                                                                                                                      Toronto, Canada|Macmillan of Canada|c1984.
## 3183                                                                                                                         New York|Harcourt Brace Jovanovich|1975
## 3184                                                                                                                                   Boston|Houghton Mifflin|1981.
## 3185                                                                                                                             Manchester|Carcanet New Press|1983.
## 3186                                                                                                                       New York|Harcourt Brace Jovanovich|c1978.
## 3187                                                                                                                         New York|Harcourt Brace Jovanovich|1975
## 3188                                                                                                                            London|Oxford University Press|1966.
## 3189                                                                                                                                     New York|Harper & Row|c1979
## 3190                                                                                                                                   New York|New Directions|1984.
## 3191                                                                                                                            New York|Harcourt, Brace|1960, c1959
## 3192                                                                                                              London|Macmillan|New York|St. Martin's Press|1956.
## 3193                                                                                                                                          New York|Dutton|c1978.
## 3194                                                                                                                               New York|G.P. Putnam's Sons|1963.
## 3195                                                                                                                                     London|Reprint Society|1952
## 3196                                                                                                     New York|Ace Books|c1979|(1st Ace printing, September 1979)
## 3197                                                                                                                                       New York|McGraw-Hill|1951
## 3198                                                                                                              Carbondale|Southern Illinois University Press|1967
## 3199                                                                                                                                       Boston|Little, Brown|1958
## 3200                                                                                                                                            New York|Knopf|1965.
## 3201                                                                                                                                     New York|Coward-McCann|1958
## 3202                                                                                                                             Bombay|Jaico Pub. House|1966, c1956
## 3203                                                                                                                               Cambridge [Eng.|Rivers Press|1973
## 3204                                                                                                                                    London|D. Dobson|1975, c1974
## 3205                                                                                                                               Garden City, N.Y.|Doubleday|1984.
## 3206                                                                                                                 Moscow|Foreign Languages Publishing House|1952.
## 3207                                                                                                                                            Tokyo|Kenkyusha|1958
## 3208                                                                                                                                  Toronto|Macmillan|1977, c1962.
## 3209                                                                                                                                     New York|Vantage Press|1952
## 3210                                                                                                                New York|Knopf|distributed by Random House|1981.
## 3211                                                                                                                         New York|McGraw-Hill Book Company|1975.
## 3212                                                                                                                                    Baltimore|Penguin Books|1970
## 3213                                                                                                                                            New York|Putnam|1966
## 3214                                                                                                                                     New York|Viking Press|1954.
## 3215                                                                                                                                       Boston|D.R. Godine|c1984.
## 3216                                                                                                                                        Wash.|Square press|1967.
## 3217                                                                                                                                       London|Brown, Watson|1961
## 3218                                                                            Princeton, N.J.|Ontario Review Press|New York, NY|Distributed by Persea Books|c1983.
## 3219                                                                                                                                     New York|Arbor House|c1983.
## 3220                                                                                                               Moscow|Foreign Languages Publishing House|1960?].
## 3221                                                                                                                     Toronto : New York [etc.|Bantam Books|1984.
## 3222                                                                                                                                    London|Chatto & Windus|1969.
## 3223                                                                                                                            Peking|Foreign Languages Press|1953.
## 3224                                                                                                                                  London|Calder and Boyars|1971.
## 3225                                                                                                                         New York|Harcourt Brace Jovanovich|1974
## 3226                                                                                                                             Don Mills, Ont.|Longman Canada|1970
## 3227                                                                                                                                          London|Heinemann|1984.
## 3228                                                                                                                               New York|Bantam Books|1964, c1950
## 3229                                                                                                                             Kuala Lumpur|Heinemann|1979, c1973.
## 3230                                                                                                           Kuala Lumpur|Heinemann Educational Books (Asia)|1980.
## 3231                                                                                                                                      New York|Harper & Row|1971
## 3232                                                                                                          Cairo, Egypt|American University in Cairo Press|c1992.
## 3233                                                                                                                                 New York, N.Y.|A.A. Knopf|1994.
## 3234                                                             New York|Scribner's|Toronto|Maxwell Macmillan Canada|New York|Maxwell Macmillan International|1993.
## 3235                                                                                                              Hanover, NH|University Press of New England|c1994.
## 3236                                                                                                                       Toronto|University of Toronto Press|1994.
## 3237                                                                                                               Stroud, Gloucestershire|Dover, NH|A. Sutton|1993.
## 3238                                                                                                                                    New York|Random House|c1993.
## 3239                                                                                                                                      New York|Knopf|1985,c1984.
## 3240                                                                                                                                    New York|Berkley Books|1980.
## 3241                                                                                                                                    London|MacGibbon & Kee|1961.
## 3242                                                                                                                                         London|Macdonald|c1981.
## 3243                                                                                                                                          London|A. Deutsch|1973
## 3244                                                                                                                                        New York|Macmillan|1960.
## 3245                                                                                                                                           New York|Dutton|1957.
## 3246                                                                                                                                          New York|Pantheon|1958
## 3247                                                                                                                      New York|Holt, Rinehart and Winston|c1979.
## 3248                                                                                                                                             London|Cassell|1961
## 3249                                                                                                                                             London|Cassell|1959
## 3250                                                                                                                       New York|Harcourt Brace Jovanovich|c1979.
## 3251                                                                                                                            London|Collins & Harvill Press|1965.
## 3252                                                                                                                                      London|Harvill Press|1973.
## 3253                                                                                                                                           New York|Morrow|1979.
## 3254                                                                                                                                        New York|W. Morrow|1966.
## 3255                                                                                                                Tenterden, Kent, England|P. Norbury|1983, c1982.
## 3256                                                                                                                                 London|New York|White Lion|1974
## 3257                                                                                                                  New York|Harcourt Brace Jovanovich|1974, c1965
## 3258                                                                                                                                            New York|Knopf|1959.
## 3259                                                                                                                                    New York|Harper & Row|c1982.
## 3260                                                                                                                                           London|Heinemann|1962
## 3261                                                                                                                                          London|Macmillan|1984.
## 3262                                                                                                                                           New York|Crowell|1958
## 3263                                                                                                                                           London|Heinemann|1957
## 3264                                                                                                                                   Delhi|Hind Pocket Books|c1967
## 3265                                                                                                                                     New York|Garland Pub.|1972.
## 3266                                                                                                                                New York|Avon Books|1982, c1954.
## 3267                                                                                                                     Westport, Conn.|Greenwood Press|1970, c1953
## 3268                                                                                                                                  New York|Pantheon Books|c1985.
## 3269                                                                                                                                 New York|H.Z. Walck|1963 [c1962
## 3270                                                                                                                                     Harmondsworth|Penguin|1984.
## 3271                                                                                                                                     London|J. Cape|1962, c1961.
## 3272                                                                                                                                            New York|Walker|1967
## 3273                                                                                                                                           London|Collancz|1972.
## 3274                                                                                                                                         New York|AMS Press|1971
## 3275                                                                                                                                         London|Hutchinson|1976.
## 3276                                                                                                                                    New York|Noonday Press|1952.
## 3277                                                                                                                             New York|Fromm International|c1985.
## 3278                                                                          Princeton, N.J.|Ontario Review Press|New York, N.Y.|Distributed by Persea Books|c1982.
## 3279                                                                                                                                          Ramat Gan|Massada|1969
## 3280                                                                                                                                               London|Owen|1966.
## 3281                                                                                                             Carbondale|Southern Illinois University Press|1965.
## 3282                                                                                                                                      Delhi|Clarion Books|c1978.
## 3283                                                                                                                                    Delhi|Vikas Pub. House|1974.
## 3284                                                                                                                                   Boston|Houghton Mifflin|1981.
## 3285                                                                                                                               Garden City, N.Y.|Doubleday|1967.
## 3286                                                                                                                                         New York|AMS Press|1968
## 3287                                                                                                                  London|J. Calder|New York|Riverrun Press|1984.
## 3288                                                                                                                      Columbus, Ohio|C. E. Merrill Pub. Co.|1969
## 3289                                                                                                                                            London|Collins|1964.
## 3290                                                                                                                                New York, N.Y.|Avon Books|c1983.
## 3291                                                                                                                                          London|Hutchinson|1963
## 3292                                                                                                                                               London|Owen|1978.
## 3293                                                                                                                                    Ann Arbor, Mich.|Ardis|1985.
## 3294                                                                                                                                       New York|McGraw-Hill|1971
## 3295                                                                                                                                       New York|McGraw-Hill|1968
## 3296                                                                                                                                      New York|Random House|1958
## 3297                                                                                                                                          London|Heinemann|1967.
## 3298                                                                                                                                    London|New York|Dutton|1975.
## 3299                                                                                                                                    New York|Pantheon Books|1964
## 3300                                                                                                                                  New York|Pantheon Books|c1960.
## 3301                                                                           Tokyo|New York|Kodansha International|New York|distributed through Harper & Row|1978.
## 3302                                                                                                                                             New York|Ungar|1974
## 3303                                                                                                                                     New York|Orion Press|1962].
## 3304                                                                                                                              New York|G. Braziller|1976, c1975.
## 3305                                                                                                                                    Baltimore|Penguin Books|1961
## 3306                                                                                                                                    Baltimore|Penguin Books|1965
## 3307                                                                                                          Carbondale|Southern Illinois University Press|1964]. -
## 3308                                                                                                                             New York|Berkley Books|1982, c1976.
## 3309                                                                                                                       New York|Harcourt Brace Jovanovich|c1976.
## 3310                                                                                                                         New York|Harcourt Brace Jovanovich|1971
## 3311                                                                                                                                           New York|Morrow|1970.
## 3312                                                                                               Windsor, Vic.|Budget Books in association with Lloyd O'Neil|1979.
## 3313                                                                                                                                               London|Cape|1968.
## 3314                                                                                                                                New York|Simon and Schuster|1966
## 3315                                                                                                                         London|Oxford University Press|1963. --
## 3316                                                                                                                                New York|Hippocrene Books|c1981.
## 3317                                                                                                                                    Kiev|Dnipro Publishers|1980.
## 3318                                                                                                                                      New York|Random House|1960
## 3319                                                                                                                                 London|H. Hamilton|1962, c1952.
## 3320                                                                                                                                    New York|Random House|c1981.
## 3321                                                                                                                     Madison|University of Wisconsin Press|1966.
## 3322                                                                                                                                            New York|Knopf|1954.
## 3323                                                                                                                               New York|John Day Co.|1973, c1972
## 3324                                                                                                                                    New York|Harper & Row|c1976.
## 3325                                                                                                                        Hanover, N.H.|Ediciones del Norte|c1983.
## 3326                                                                                                                           New York|Duell, Sloan and Pearce|1953
## 3327                                                                                                                                    Kiev|Dnipro Publishers|1976.
## 3328                                                                                                                  Cairo|General Egyptian Book Organization|1978.
## 3329                                                                                                     London|Heinemannn|Cairo|American Univ. in Cairo Press|1978.
## 3330                                                                                                                                    New York|Harper & Row|c1980.
## 3331                                                                                                                                          New York|Scribner|1972
## 3332                                                                                                                                    New York|Pocket Books|c1982.
## 3333                                                                                                                                 New York|A.A.Knopf|1981, c1960.
##                       imprintdate                             locnum      oclc
## 1                            1900                                     70581082
## 2                            1840                                     70580854
## 3                            1974                  E99.E7R5413 1974b   1452182
## 4                            1959                       QL737.C2S313   1736670
## 5                            1961                                      2200113
## 6                            1975                                      1322104
## 7                            1976                 PZ3.V594Of15PQ2469   2346796
## 8                            1976                                      2236732
## 9                            1976                                       969732
## 10                           1976                  PZ3.E43Sd15PR4669   3224548
## 11                           1970              PZ3.C8849Mo6PR6005.R7    134172
## 12                           1979      PZ3.B69795Bo 1979PS3503.O9354   4638455
## 13                           1954                                      8510469
## 14                           1955                          HQ770.P55   1244044
## 15                           1959                                      9276825
## 16                           1957                           SF758.B7    983275
## 17                           1970                 PZ3.J234Wi15PS2114     69610
## 18                           1873                                     58963365
## 19                           1963                 PS2919.S62L5 1880a   7634512
## 20                           1961                                      1675351
## 21                           1897          PZ3.T844AG3 vol. 10PG3421     61409
## 22                           1990                  PR6037.A2C35 1990  22451577
## 23                           1992                                     25375572
## 24                           1896         PZ3.T844AG3 vol. 6-7PG3421     59564
## 25                           1896         PZ3.T844AG3 vol. 6-7PG3421     59564
## 26                           1991                  PS3507.R55J4 1991  22664137
## 27                           1993                 PR6003.U13G68 1993  27035244
## 28                           1996                    PR1833.A64 1996  35556402
## 29                           1995                   PS24272.M37 1995  31900065
## 30                           1992                                     63876253
## 31                           1998                   PR6005.O4V5 1998  39322923
## 32                           1979                   QL696.S8R65 1980   5264853
## 33                           1990                  PR6035.U8A38 1990  27975362
## 34                           2000                                     45188055
## 35                           2005                  SF613.K56K56 2005  58545646
## 36                           2007                PR4878.L175M97 2007  76961261
## 37                           2007               PR6037.T617L339 2007  78893200
## 38                           1833                                    612778199
## 39                           1966                     HX811 1890.M62   2571401
## 40                           1968                     PR4531.M3 1968   1950356
## 41                           1952                     DS568.L56 1952    181228
## 42                           1897                                     29903661
## 43                           1991                                     24825501
## 44                           1965                        PZ4.L339Ye2   1377764
## 45                           1888                         PZ3.S7465S  23366110
## 46                           1976                PZ3.S545Tal12PR5397   3002968
## 47                           1974             PZ3.W547Ge20PR6045.E95   1340026
## 48            <estimate="[190-]">                   PQ2168.A48 1900a 148109180
## 49                           1920                 PG3453.A8U23 1920a  29381768
## 50                           1910                   PR5130.F10 1910a  83297888
## 51                           1908               PL2722.U2L5213 1908a 137284128
## 52                           1971                    PS1307.A1 1897a  83215747
## 53                           1970                    PK1722.A2 1916a   1744404
## 54                           1858                        DC103.M6313  36446467
## 55                           1885                   LB624.5.E5 1885a  79139233
## 56                           1994                 PT2631.E5M413 1994  30109893
## 57                           2008                   PT8904.G3E5 2008 268999544
## 58                           1920              PZ3.R272Pi7PR6035.E43    211710
## 59                           1991                                     27490060
## 60                           1989                                     19457396
## 61                           1989                  PG3476.N3K63 1989  19130784
## 62            <unparsed="[n.d.]">                        PZ3.A9175Ab    467352
## 63            <unparsed="[n.d.]">                        PZ3.A9175Ab    467352
## 64                           1990                  PR6013.A66A9 1990  20525562
## 65                           1990              PJ5054.A755A7813 1990  20758750
## 66                           1989                  PS3523.O46A6 1989  21473567
## 67                           1990                  PR6035.U8L68 1990  20491542
## 68                           1990                     E99.N45P4 1990  20168251
## 69                           1990                                     20418212
## 70                           1989                                     23747169
## 71                           1990                 PS1449.C85R3 1990b  21673048
## 72                           1989                                     18815973
## 73                           1988                                     19066003
## 74                           1987                          PQ4835.I7  16093250
## 75                           1989                                     20130206
## 76                           1988                  MLCS 89/15693 (P)  20390884
## 77                           1988                  MLCS 89/15687 (P)  20390927
## 78                           1990                PT2503.S55C313 1990  20723525
## 79                           1990                  PR6005.H66F8 1990  21375520
## 80                           1989                  MLCS 90/05175 (P)  21297576
## 81                           1990                   PT1873.S613 1990  16714387
## 82                           1977             PZ3.B8835Gr17PG3453.B9   2597933
## 83                           1989                PQ2637.I53P613 1989  20219620
## 84                           1989                                     20805707
## 85                           1973                                      4544741
## 86                           1990               PQ2637.A783P613 1990  22209181
## 87                           1972                PZ3.M445FiPQ2349.A2    277629
## 88                           1989                                     19064964
## 89                           1988                   PG1918.Z78M41813  21549265
## 90                           1990                                     26175068
## 91                           1989                                     19389556
## 92                           1972                   PZ3.F844T6PQ2254    320690
## 93                           1960                                       331012
## 94                           1974          PZ4.B9198Uac3PT2662.U3134   2931222
## 95                           1973           PZ3.B4513Man4PR6003.E733    754817
## 96                           1964                                      2691247
## 97                           1989                PR9639.3H994w, 1989  20731003
## 98                           1985                                     20136256
## 99                           1989            PQ8498.32.A65H3413 1989  19553843
## 100                          1989                 PG3476.N3K313 1989  20055811
## 101                          1990                 PT8950.H3A913 1990  16355144
## 102                          1988                                     21078589
## 103                          1989               PQ2637.I53F3813 1989  18815985
## 104                          1989                  MLCS 90/14997 (P)  22766099
## 105                          1986                                     16682358
## 106                          1989                PR9619.3.H3F53 1989  21157162
## 107                          1990                PG3476.N3Z2413 1990  21231988
## 108                          1989               PR6003.O6757A15 1989  18714898
## 109                          1989                              GR150  20991929
## 110                          1989                                     20936207
## 111                          1988              PR9619.3.H369C55 1988  18072324
## 112                          1961                                      1966905
## 113                          1963                                     27405222
## 114                          1957                        PZ3.K11Tr13    295221
## 115                          1960                                     44045044
## 116                          1963                                PZ3    280874
## 117                          1965                   PS1868.A2G7 1965   5268264
## 118                          1961                                      1117451
## 119                          1958                                      1740517
## 120                          1958                                      4306344
## 121                          1975                                      1453662
## 122                          1950                                       175123
## 123                          1953                                      1996578
## 124                          1949                                     12462064
## 125                          1986                                     12523502
## 126                          1985                                     15204480
## 127                          1979                       PL2658.E8C48   5102128
## 128                          1970                                      2190230
## 129                          1962                        PZ3.K383S15    991375
## 130                          1961                       PZ4.W7465Ad2   6174385
## 131                          1964                                       316974
## 132                          1961                                       268335
## 133                          1972              PZ4.H319SuPS3558.A667    539013
## 134                          1970                   PQ2349.A4E5 1970    117347
## 135                          1970                   PQ2349.A4E5 1970    117347
## 136                          1974                 PZ3.J234Po53PS2116   3242071
## 137                          1968                                      3825902
## 138                          1965                        PZ3.B790J70   1950359
## 139                          1961                                      1117451
## 140                          1964                                     21142244
## 141                          1966                                      3452334
## 142                          1971                  PZ3.P752T28PS2612    481795
## 143                          1966                     PJ7828.K52U813  12975987
## 144                          1971               PZ3.C764L55PR6005.O4    293059
## 145                          1954                     PR3714.S4 1954   5190349
## 146                          1956                        PZ3.L846C35   1384065
## 147                          1969             PZ4.B988Pas4PQ2603.U73     14747
## 148                          1975                                      4583253
## 149                          1971           PZ3.M45408CanPT2625.A848    240460
## 150                          1984                                     11680094
## 151                          1983                                     12386857
## 152                          1967                                      2514521
## 153                          1992                                     27744303
## 154                          1951                                      4650691
## 155                          1987                                     16091315
## 156                          1989                PJ7838.D7A7913 1989  20392890
## 157                          1988                         PQ2637.I53  17224780
## 158                          1991                                     22766831
## 159                          1991                                     26258302
## 160                          1988                 PJ5129.S5M513 1988  17201055
## 161                          1987                  GR268.A73A73 1987  19650533
## 162                          1990               PR9619.3.M267M5 1990  21483782
## 163                          1991                                     22764520
## 164                          1989                                     19065787
## 165                          1990                                     22630310
## 166                          1990               PS3556.I8142I57 1990  21461304
## 167                          1990                                     22987091
## 168                          1990                PQ6635.E65S513 1990  20827683
## 169                          1990                                     21519602
## 170                          1983                                     15311434
## 171                          1971              PZ3.C8616Op5PQ1971.C6    588845
## 172                          1977                                     16511068
## 173                          1967                  PZ3.E23Tal8PR4640    913475
## 174                          1969                   PZ3.M144L9PR4967     31187
## 175                          1960                 PR6007.I39Z52 1960   1593579
## 176                          1971                                      3093450
## 177                          1971                                      4357958
## 178                          1982                                     12035588
## 179                          1954 PL2698.H73C513 1954 (Rare Bk Coll)   5059835
## 180                          1960                                      6028057
## 181                          1954                                       362600
## 182                          1957                      PZ3.B62026Las    776717
## 183                          1961                         PZ3.N617Se   1187578
## 184                          1970                   PZ3.B22Se7PQ2172    112955
## 185                          1968                      PZ3.D5617Nu 3    442860
## 186                          1971             PZ3.A1576Wr6PR6001.B62    206071
## 187                          1971             PZ3.B479Can 1971PS1097    121287
## 188                          1962                         PZ4.S735Mu    366919
## 189                          1962                   PT1579.A3A6 1962    531359
## 190                          1987                                     26734243
## 191                          1989                  MLCS 91/03937 (P)  23384936
## 192                          1989                 PR6023.E833A6 1989  19669853
## 193                     1956-1961                                     18612179
## 194                     1956-1961                                     18612179
## 195                          1990                                     24713263
## 196                          1991                                     22308333
## 197                          1989                                     20327698
## 198                          1990               PQ2637.I53V5713 1990  20724619
## 199                          1990                 PQ2679.E4G713 1990  20758835
## 200                          1991                 BF1472.U6R636 1991  23462085
## 201                          1990               PQ2662.E686M613 1990  22276673
## 202                          1990                                     24628475
## 203                          1990                                     22242835
## 204                          1977                                     21176928
## 205                          1991                                     24756408
## 206                          1992                                     24796038
## 207                          1989                                     21973338
## 208                          1991                                     24739168
## 209                          1972                     PR4532.H6 1972   1910952
## 210                          1987                 PG3948.F7Z313 1987  17655982
## 211                          1979                                     23162396
## 212                          1992                                     26313597
## 213                          1992                PT2625.A44B313 1992  25200982
## 214                          1991               PT2635.E98M4513 1991  21976342
## 215                          1992                PS3569.C324L37 1992  25412098
## 216                          1990                                     24721163
## 217                          1992                  PR6054.O23L3 1992  25966720
## 218                          1992                                     24848315
## 219                          1991                                     24846078
## 220                          1986                                     17831217
## 221                          1992              PQ2637.I53M25313 1992  24173986
## 222                          1992                                     26721982
## 223                          1995                                     33279452
## 224                          1969                    BL860.H913 1969     55010
## 225                          1992                                     26635438
## 226                          1992                PQ2637.I53V413 1992  24173675
## 227                          1992                PQ4835.A48V513 1992  22862736
## 228                          1991                                     24725491
## 229                          1990                                     22707882
## 230                          1990                                     22624154
## 231                          1991                                     25353092
## 232                          1991                                     24752537
## 233                          1991                   PG3421.O813 1991  24065293
## 234                          1990                 PR6058.I448B6 1990  20753856
## 235                          1992                                     26357169
## 236                          1991              PQ7798.21.O3U413 1991  22592920
## 237                          1987                                     24733693
## 238                          1991                                     24734053
## 239                          1991                                     22629782
## 240                          1987                  PS3552.U75Q8 1987  13792562
## 241                          1990                                     22764344
## 242                          1992                                     28118506
## 243                          1979                                      6286496
## 244                          1970                                     30284982
## 245                          1952                                      1944264
## 246                          1993                                     28756470
## 247                          1986                                     19777913
## 248                          1991                                     24749628
## 249                          1986                                     15656122
## 250                          1991                                     22767672
## 251                          1991                                     25691528
## 252                          1991                                     28326700
## 253                          1965                      PZ3.T257Bat 5    434355
## 254                          1991                PR6063.A237S77 1991  24908059
## 255                          1991                    PS2132.C64 1991  24617242
## 256                          1992                                     25857741
## 257                          1990                                     24751173
## 258                          1991                                     24694434
## 259                          1989                 PR9369.3.T6F6 1989  24954890
## 260                          1966                          HV6499.S3   2224622
## 261                          1971                                      2010898
## 262                          1961                                      1204536
## 263                          1965                PG3476.B42B613 1965   5671849
## 264                          1967                                      1059961
## 265                          1994                 PS3568.O855P7 1994  29387369
## 266                          1994                   PT8140.M6E5 1994  29877240
## 267                          1993                                     29182455
## 268                          1993               PR9619.3.C54B58 1994  28148302
## 269                          1951                        PZ3.C4637TE    365249
## 270                          1993                                     30584825
## 271                          1993                   PS3554.I3E9 1993  26503355
## 272                          1993                                     29472061
## 273                          1993                                     29234185
## 274                          1993                PR6062.O785S57 1993  26218351
## 275                          1992              PG3478.L448D9713 1993  30705473
## 276                          1992                                     30158206
## 277                          1992                PT2625.A44Z32 1992b  26210870
## 278                          1992                                     27403575
## 279                          1990                                     22869931
## 280                          1991                                     24440262
## 281                          1992                                     28849404
## 282                          1992                                     27386603
## 283                          1992                                     26807750
## 284                          1993                                     27379777
## 285                          1988                                     17777059
## 286                          1988                                     21294136
## 287                          1993                                     29838138
## 288                          1989                                     28708905
## 289                          1993                                     28928400
## 290                          1990                PR6053.O525G55 1990  26502355
## 291                          1992                PG3337.G6O1213 1992  25675889
## 292                          1993                                     27975113
## 293                          1992                                     28186210
## 294                          1986                                     17181425
## 295                          1994                                     31077345
## 296                          1992                                     27431373
## 297                          1994                                     31851262
## 298                          1993                                     28849484
## 299                          1993                    E99.C92L92 1993  27895944
## 300                          1993                                     28888904
## 301                          1993                                     28149662
## 302                          1993                                     28962954
## 303                          1988            PG3483.3.E282K6513 1988  19536246
## 304                          1993                                     29223451
## 305                          1991                                     27380190
## 306                          1992                                     27815196
## 307                          1993                                     30834556
## 308                          1993                                     30158751
## 309                          1993                 PG3489.O476A6 1993  30557452
## 310                          1992                                     26893683
## 311                          1993                                     28502088
## 312                          1989                PS3561.E445S25 1989  18558951
## 313                          1993                     GR225.S87 1993  27768887
## 314                          1992                                     26310182
## 315                          1992                  PS3554.I3S65 1992  20522461
## 316                          1993                                     29404535
## 317                          1992                                     27739415
## 318                          1991                                     27975774
## 319                          1993                                     29410015
## 320                          1991                                     28166460
## 321                          1988                                     18962584
## 322                          1987                          PT8950.F2  16709792
## 323                          1990               PQ7389.C263R413 1990  26765567
## 324                          1980                     PR9619.3.D24M6   8431793
## 325                          1987                                     18642865
## 326                          1992                                     26006405
## 327                          1994                PS3563.A255S48 1994  29357436
## 328                          1989                                     24673832
## 329                          1969           PZ3.D9327Se4PQ2607.U8245    197906
## 330                          1962                                     14018296
## 331                          1952                                      1402808
## 332                          1959                                     42915764
## 333                          1971                                       237759
## 334                          1994                                     32060040
## 335                          1994                                     30917877
## 336                          1993                 PS3537.T479M9 1993  30023216
## 337                          1992            PQ9698.18.O35E7713 1992  25200544
## 338                          1993                   GR313.N4813 1993  28257327
## 339                          1995                                     32924646
## 340                          1995                PT8950.U5O6313 1995  31519828
## 341                          1995                   GR336.F8I43 1995  31328557
## 342                          1992               PQ2680.O38M3813 1992  30439078
## 343                          1964                PS3525.I5454N4 1964   1429342
## 344                          1971                                       479327
## 345                          1971               PZ4.D346AmPS3554.E19    137561
## 346                          1977                                      2823808
## 347                          1957                         PZ4.M237As    734832
## 348                          1961                                      7620046
## 349                          1984               PR9619.3.K46S87 1984  12807118
## 350                          1994               PR9619.3.B778T6 1994  32745802
## 351                          1994              PR9619.3.B693J8 1994g  31335383
## 352                          1990              PR9199.3.N564K57 1990  21078639
## 353                          1994                                     32881232
## 354                          1995                                     32272124
## 355                          1986                                     30697045
## 356                          1992                 PR6005.H66A87 1992  24467605
## 357                          1995                                     32773295
## 358                          1994                                     31959751
## 359                          1994                                     31959751
## 360                          1994                                     30330221
## 361                          1991                                     22956937
## 362                          1992                                     30154500
## 363                          1991                   PR6013.O2C6 1991  26855936
## 364                          1994                                     31375575
## 365                          1994                                     31374619
## 366                          1990                                     20131079
## 367                          1992                                     27367988
## 368                          1991                                     24717465
## 369                          1982               PS3562.O75Z23x 1982b  18190883
## 370                          1963                         GR340.S383    497275
## 371                          1994                                     31355218
## 372                          1993                                     29472267
## 373                          1993                                     34794992
## 374                          1992                GR154.2.B64K48 1992  31013562
## 375                          1992                                     30513223
## 376                          1994                                     32345231
## 377                          1994              PR9387.9.A344E28 1994  32513737
## 378                          1994                                     30914302
## 379                          1977                                      4052974
## 380                          1977                                      3916260
## 381                          1969                                      5468602
## 382                          1959                                      8479723
## 383                          1962                         PZ3.C58Co2   1435396
## 384                          1966                                     30296660
## 385                          1973                                     16236123
## 386                          1957                                PZ3    681606
## 387                          1989                                     18743744
## 388                          1995                                     32200051
## 389                          1992                                     29792746
## 390                          1995                 PR6061.I39H68 1995  35835892
## 391                          1994                  PH355.A42A27 1994  31858417
## 392                          1995                                     36455602
## 393                          1971               PZ3.R644I6PR5236.R27    151152
## 394                          1970               PZ3.L136Fr8PT9767.D7     73852
## 395                          1965                                      6833376
## 396                          1971              PZ3.L9392Co5PQ2623.O8    154072
## 397                          1997                PQ2678.O72P513 1997  36900763
## 398                          1995                                     33049008
## 399                          1996                                     35241670
## 400                          1992                                     26912008
## 401                          1994                  PS3554.I3G33 1994  32049351
## 402                          1995                PS3552.U723H34 1995  31969718
## 403                          1995                                     34774679
## 404                          1994                                     33441377
## 405                          1996                                     38227554
## 406                          1970                      GR205.C7 1970    117125
## 407                          1994                 PA5627.H95B76 1994  33245574
## 408                          1962                      PZ3.L449Par 2   9025820
## 409                          1997                     GR335.P35 1997  37309253
## 410                          1997               PR9619.3.N64R43 1997  37623991
## 411                          1997               PR9369.3.M38P37 1997  38552030
## 412                          1953                                      1575132
## 413                          1980                                      8737333
## 414                          1975                  PA4025.A2R53 1975   1266946
## 415                          1953                                      3323220
## 416                          1997               PQ2623.E3657B33 1997  36121553
## 417                          1977                 PZ3.M976Co12PQ2369   2865294
## 418                          1956               PJ5054.K343B413 1956  28528962
## 419                          1996                PR9199.3.M8A6 1996b  36480599
## 420                          1995              PQ2678.E285M6313 1995  34439081
## 421                          1992                                     26551445
## 422                          1974                                      6811409
## 423                          1995            PQ3919.2.B496E5413 1995  35391272
## 424                          1995               PR6060.O5163S48 1995  34320712
## 425                          1986                                     15195303
## 426                          1996               PR9369.3.B35D66 1996  36647699
## 427                          1997               PR9619.3.G27K46 1997  38026454
## 428                          1997                PQ2678.O72D313 1997  35978669
## 429                          1997                                     42407156
## 430                          1996                                     35624765
## 431                          1996                 GR202.A674213 1996  38105390
## 432                          1997                 PL8014.S62R35 1997  39339478
## 433                          1997               F2319.2.Y4C5813 1997  36876179
## 434                          1995                 PQ2678.E2R413 1995  32700356
## 435                          1971             PZ4.C6155Sp5PQ2605.L32    127297
## 436                          1992                   PL2804.C5A2 1992  30668963
## 437                          1995               PS3563.O5234N67 1995  32473052
## 438                          1964                          GR375.A55   4888303
## 439                          1997                PQ2673.E672513 1997  37580496
## 440                          1998                 PS3572.E27C48 1998  38966215
## 441                          1988                         PQ2605.O28  17322165
## 442                          1959                                      1063225
## 443                          1997             PQ3919.2.B75B3713 1997  36691467
## 444                          1998                   PQ2165.C5E5 1998  39293815
## 445                          1999                                     41601865
## 446                          1974           PZ4.M1337Gat4PT6063.A167    827744
## 447                          1987                                     21367890
## 448                          1999                                     40684483
## 449                          1970             PZ3.L5223Ve5PT2623.E26    132653
## 450                          1973            PZ3.M8345Su14PR5079.S77   3073046
## 451                          1999                 PS3552.E13T36 1999  41256401
## 452                          1985                                     31435119
## 453                          1998                PR9570.S53L484 1998  38747820
## 454                          1999                                     41258599
## 455                          1999                                     40882183
## 456                          2000                                     41834156
## 457                          1958                                      1232690
## 458                          1998               PR9369.3.C59L67 1998  40980016
## 459                          1997                     PS1305.A1 1997  36702314
## 460                          1998             PL8771.9.M23A2313 1998  42921516
## 461                          1999                                     44483064
## 462                          2000                                     45080497
## 463                          1999                                     43970661
## 464                          1998                 PG9621.K3U713 1998  38144494
## 465                          2000                                     43378024
## 466                          1999                                     44517270
## 467                          1951                                     42805447
## 468                          1951                                     42805447
## 469                          1951                                     42805447
## 470                          1999                                     47980494
## 471                          1998             PH3281.K8866E3413 1998  42366907
## 472                          1998                                     40883900
## 473                          2000                PR9619.3.P43T9 2000  46456018
## 474                          1960                         PZ3.T844Vg   1172057
## 475                          2002                     E98.R3C92 2002  50023350
## 476                          2000                PS3568.U2968G7 2000  47521066
## 477                          2001                                     49951036
## 478                          1999                                     44893919
## 479                          1999                                     47770406
## 480                          1998                PL248.P34Y4613 1998  37631174
## 481                          2000                                     43031104
## 482                          1999             PQ3919.2.C25P7613 1999  43706828
## 483                          2000                                     44604295
## 484                          1995                                     32810592
## 485                          2001                   GR154.4.T73 2001  45304549
## 486                          1997               PR6069.M4213L54 1997  37533953
## 487                          1999               PS3569.T3726W48 1999  39354362
## 488                          1996                                     37682086
## 489                          1999              PC840.22.O92M213 1999  53889769
## 490                          1998            PC840.23.A724R4413 1998  40484311
## 491                          1998                                     43528534
## 492                          2001            PT5881.32.E79W5613 2001  45603910
## 493                          2000                                     44786478
## 494                          1999                                     44492689
## 495                          1957                      PZ3.S56255Al6    820683
## 496                          1969               PZ3.M674GarPQ2364.M7     97096
## 497                          2000                PT2667.O464L69 2000  45489000
## 498                          2002             PQ7298.1.C76C3913 2002  49375221
## 499                          2000                                     43978301
## 500                          2001                                     50448346
## 501                          1993                                     29240497
## 502                          1970                  PZ3.P979Qe5PG3347    201345
## 503                          1957                                     10797966
## 504                          2002                 PS3563.A258S9 2002  50065106
## 505                          1999                                     42876268
## 506                          2002               PS3537.C7114W45 2002  49874901
## 507                          1987                PG3476.B78B513 1987  15108387
## 508                          1960                                      1304884
## 509                          2000               PJ7824.A62M3613 2000  40891036
## 510                          1987                  PA5630.K5K46 1987  54847693
## 511                          2000               PJ7824.A62T7413 2000  40891034
## 512                          2001                  GR337.5.M645 2001  50004564
## 513                          1986             PR9499.3.G536C57 1986c  56520094
## 514                          1952                PT2621.A26A257 1952    259723
## 515                          1973             PZ3.M7962Gh7PQ4829.O62   3090869
## 516                          1973                                      2961400
## 517                          1969                   PZ3.K544T6PT8904     49826
## 518                          2007                 PR6101.R35S43 2007  77541286
## 519                          1971              PZ4.L575GePT2623.E583    298001
## 520                          1957                        D805.R9B313   1618549
## 521                          1951                                     40069360
## 522                          1962                                      8632217
## 523                          1969                                     15434214
## 524                          1971                                     15714535
## 525                          1954                                      1509800
## 526                          1963                                     36544566
## 527                          2001                                     50489918
## 528                          1986                                     13704297
## 529                          2003                 PS3561.E39S47 2003  51098176
## 530                          2000                                     45116458
## 531                          2003                 PS3557.E493N5 2003  51151486
## 532                          2002                  PR6064.O73C3 2002  51059400
## 533                          2003                 PS3619.C77R87 2003  50948507
## 534                          1976                                      4164802
## 535                          2003                 PR9199.S253M9 2003  53620510
## 536                          2006                                     62760988
## 537                          2006                PR9499.4.T97N6 2006  70167619
## 538                          2005                PR6110.O426W68 2005  62073440
## 539                          2006                PS3619.K568T43 2006  70107051
## 540                          2006                PS3570.U76S475 2006  62697178
## 541                          2003               PS3523.A446F76 2003b  52103338
## 542                          2003                 PS3562.U59R43 2003  52312665
## 543                          2003                 PS3570.U76I54 2003  52030530
## 544                          2005               PR6063.I37783N6 2005  57381894
## 545                          2003                    GR353.3.E4 2003  52860060
## 546                          2002                                     48754302
## 547                          2000                                     44485441
## 548                          2001                 PS3619.A87F35 2001  47844603
## 549                          2003                                     51270743
## 550                          2002                                     48486576
## 551                          2002                                     51252123
## 552                          2003                 PR6102.A77B34 2003  51307204
## 553                          2002                PQ2637.I53T713 2002  50674316
## 554                          2002                PT2635.O84S713 2002  46651481
## 555                          1998                                     46378002
## 556                          1998                                     44005364
## 557                          1992                                     47147048
## 558                          1990                                     47147265
## 559                          2002               PC3941.S336I513 2002  52312519
## 560                          2003                                     51481763
## 561                          2003                PS3619.H676R53 2003  51519699
## 562                          2002                                     51482116
## 563                          2003                                     51915784
## 564                          1995                                     40272891
## 565                          2004                   GR110.N6G37 2004  52765990
## 566                          1998          PQ7298.23.A795M3813 1998c  38534211
## 567                          2003                                     52992429
## 568                          2001                                     53444304
## 569                          2003                                     52992418
## 570                          2003                                     53347491
## 571                          2003                                     54015600
## 572                          2004                 PS3625.O75P53 2004  52559174
## 573                          2004                                     56759723
## 574                          2003                                     53815598
## 575                          2001                                     46778423
## 576                          2001                                     52222565
## 577                          2002                    PG3940.D56 2002  50143282
## 578                          2001               PG3949.14.I4A24 2001  46624290
## 579                          2000                                     52635865
## 580                          2004                                     53393883
## 581                          1998                  PQ9261.N3513 1998  44268212
## 582                          2004                PR9199.3.D94W3 2004  53251135
## 583                          2004                                     55804328
## 584                          2003                                     57453957
## 585                          1962                         BL860.H913   1083758
## 586                          2002                                     50841645
## 587                          2000               PG3490.H58L4713 2000  57483534
## 588                          1961                                     12339870
## 589                          1962                         PZ4.L343Cl   4649267
## 590                          1977                     PG3326.A2 1977  61852919
## 591                          2003                                     53895535
## 592                          2004                 PS3607.I48P57 2004  52559172
## 593                          2003             PQ3919.2.H87A6713 2003  52622971
## 594                          2004                                     55950728
## 595                          1964                                      5000539
## 596                          1997                                     37312375
## 597                          2002                                     51302075
## 598                          1998                    PK6457.Y37 1998  35718581
## 599                          2004                     PG3326.Z4 2004  53059249
## 600                          1995                                     56881199
## 601                          2004                                     57791729
## 602                          2004                                     53911986
## 603                          2004                PS3612.E965M47 2004  54501348
## 604                          2007                                    232335306
## 605                          1953                    D784.G7M28 1953   3141849
## 606                          2004                                     56643679
## 607                          2004                   DA880.E2K47 2004  53814163
## 608                          2007               PT2715.P45O4613 2007 144227147
## 609                          2005                 PS3620.I45T87 2005  57285903
## 610                          2005               PS3619.C674B695 2005  56806121
## 611                          2004                  PR6029.B55A6 2004  55124257
## 612                          2005                PS3607.O593M37 2005  55095224
## 613                          2004                    PQ1278.W66 2004  54852976
## 614                          2005                PS3568.A922S26 2005  54461912
## 615                          2004             PR9619.3.C5964B76 2004  60796375
## 616                          1971                                       937312
## 617                          2003                     GR375.T39 2003  52901293
## 618                          2002               PR9369.3.M358T7 2002  55198946
## 619                          1993                                     29478939
## 620                          2004                                     57384401
## 621                          2005                 PS3557.E23G87 2005  58530173
## 622                          2005                                     57166734
## 623                          2004                                     53305570
## 624                          1998                     BL945.L58 1998  50447808
## 625                          2005               PQ2603.E362M313 2005  57526949
## 626                          1993                                     28617593
## 627                          2005              PQ2664.A417M4813 2005  60371590
## 628                          1969              PZ3.P7198Be5PT2631.L6    127084
## 629                          2002                                     49874455
## 630                          2005                                     57381738
## 631                          2005                    DG735.6D67 2005  58554424
## 632                          2005                 PR6105.Y74C58 2005  57381714
## 633                          2005               PS3608.A6956H66 2005  57142682
## 634                          2004                                     59264875
## 635                          2005                                     61175859
## 636                          1987                                     17219470
## 637                          2003           PT8951.18.A569B4713 2003  52210087
## 638                          2003                PK2200.A3542A6 2003  62299862
## 639                          2005                 PS3570.U76B75 2005  61687674
## 640                          2005                                     71045917
## 641                          2000                  PL248.A75713 2000  44693806
## 642                          1968                                      7808174
## 643                          1957                     PJ7715.B8 1957  17198727
## 644                          1988                PS3537.I85J85 1988b  17413612
## 645                          1987                         PE7158.L34  16094819
## 646                          1967                         PZ1.E37Baw   9238755
## 647                          1962                        PZ1.M8334Gr   1282533
## 648                          1974                   PN6222.C5K3 1974   1195279
## 649                          1992                                     38321619
## 650                          1991                                     23874072
## 651                          2006                                     63765582
## 652                          2006            PT5881.1.B36S6513 2006b  62796670
## 653                          2006                 PS3608.A79I13 2006  63186716
## 654                          1951                PZ3.G9313AfPL248.G8   3893611
## 655                          2000                  PL248.N49D63 2000  43309820
## 656                          2003                PL248.M26M3413 2003  51483482
## 657                          2001                                     47066075
## 658                          2002                                     50154037
## 659                          1999                 PR9619.2.D4F5 1999  47140976
## 660                          2005                                     60513982
## 661                          1955                                      4243662
## 662                          2006                                     67765423
## 663                          2006                 PR6119.A48S73 2006  65467642
## 664                          2005                PJ5054.Y42G413 2005  61441373
## 665                          2006              PL2886.O1684T513 2006  62307454
## 666                          2005                     GR311.E67 2005  64581474
## 667                          2004                                     56445263
## 668                          2005               PQ2670.O53M9413 2005  61529268
## 669                          1998                                     40455780
## 670                          2005                     PH351.D43 2005  57381259
## 671                          2004               PR9619.4.W45L48 2004  57134832
## 672                          1996                                     44402812
## 673                          2006               PS3602.E2525L67 2006  62533976
## 674                          2005                 PR6116.R53M66 2005  61694240
## 675                          2006                   GR295.I7F65 2006  61463862
## 676                          2004                  D784.R9K6613 2004  61170189
## 677          <estimate="[200-?]">                PL248.K42C4613 2003  56809929
## 678          <estimate="[200-?]">                                     55496580
## 679                          2006                PR6110.A447T45 2006  63401223
## 680                          2006                PS3601.T784I57 2006  61247201
## 681                          2003                         PZ3.L492Co  70277498
## 682                          2006               PR6054.E3352L68 2006  65203863
## 683                          2006              PQ2668.A434L5513 2006  61309376
## 684                          2006                PS3563.A424R47 2006  65065468
## 685                          2008            PQ9698.29.O196E513 2008 233552493
## 686                          2006                                     71164842
## 687                          2006            PT8951.28.A47F3813 2006  70173993
## 688                          2006                 PR6103.O59L63 2006  70399698
## 689                          2006                PS3608.O494B66 2006  70158436
## 690                          2005                   GR295.I7C35 2005  57682265
## 691                          1996                PQ2605.O28B513 1996  35701337
## 692                          2005              PS3568.I83165R58 2005  60493318
## 693                          1960                         PZ4.M979An   1334203
## 694                          2005                                     59878544
## 695                          2008                  PT8950.F2A73 2008  60611101
## 696                          2008                PR6101.L458M55 2008 181926274
## 697                          2008                 PL2904.T86A23 2008 213382411
## 698                          2008              PT2668.E866W6713 2008 183915932
## 699                          2008                                    182731252
## 700                          2008                PR6058.I526D43 2008 195732588
## 701                          2007                PR6072.I333W54 2007 233986238
## 702                          2008                                    181422508
## 703                          2008              PT5881.23.C55F74 2008 233265453
## 704                          2007            PT9876.25.E68G4613 2007  77520758
## 705                          2006                  PR6052.E5F68 2006  67375490
## 706                          2006              PT8175.H367F5813 2006  69022663
## 707                          2007                                     85691700
## 708                          2007             PT8951.31.R5H6613 2007 153576567
## 709                          2007                PR6108.A775H43 2007  72151401
## 710                          2005                                     71296208
## 711                          2002                                     49833838
## 712                          2001               GR358.2.B83B452 2001  48545542
## 713                          2007                 PR6116.E48D34 2007  85898362
## 714                          2006                                     71298477
## 715                          1996               PK2199.R8U4313 1996b 137295123
## 716                          1970                    PZ3.H84L8PS2025     66084
## 717                          1976                                      3438208
## 718                          1950                       PZ3.B79198Fi   5047766
## 719                          1978        PZ3.F6336Be 1978PS3511.L449   3843835
## 720                          1978        PZ3.F6336We 1978PS3511.L449   3649770
## 721                          1980               PS3513.O5765A79 1980   6280663
## 722                          1971               PZ3.A957Wh3PS3501.X4    389202
## 723                          1958                        QL795.C2B46   1282749
## 724                          1993                                     35813630
## 725                          1962                        PZ3.W5227Co   1389828
## 726                          1968                        PZ3.W6739Un   1164541
## 727                          1976             PZ3.W9768Mu8PS3545.Y46   2150753
## 728                          1980                      PS3557.E415M6   7250780
## 729                          1972              PZ4.A6786TjPS3551.R39    341298
## 730                          1972              PZ4.G1915EnPS3557.A45    363686
## 731                          1976            PZ4.G7956StPS3557.R3725   3002978
## 732                          1981                   PS3554.A934915A8   6943228
## 733                          1992                 PS3551.D64W58 1992  25095628
## 734                          1968             PZ3.W5904Th5PS3545.H75      2828
## 735                          1971             PZ3.W61475LkPS3573.H54    235795
## 736                          1991                                     24753463
## 737                          1983                PS3556.I8138I5 1983   7738025
## 738                          1985                         PS3556.L9/  12018879
## 739                          1987                PS3556.R488B54 1987  18443240
## 740                          1972             PZ3.W71295TanPS3573.I5    707732
## 741                          1975          PZ3.S97192Sh4PS3537.W3743   1959763
## 742                          1974               PZ3.O348ImPS3529.G39    858851
## 743                          1964                        PZ3.H9434Fo   1444631
## 744                          1989                 PS3515.U785L8 1989  20220107
## 745                          1976          PZ3.S4299WalPS3537.C92937   2284119
## 746                          1972             PZ3.S7274Ye7PS3537.O87    333684
## 747                          1978             PZ3.H55St10PS3515.I486   2423524
## 748                          1961                        PZ3.O7495Pl   2939182
## 749                          1990                 PS3555.Y67F55 1990  20853523
## 750                          1978              PZ4.F159GrPS3556.A344   4498739
## 751                          1979                    PS3551.L447T467   5410693
## 752                          1956                      PZ3.M313705Mo   2421272
## 753                          1969                PZ3.B934Thr16PS1218     10923
## 754                          1969                   PZ3.C11By5PS1244     17422
## 755                          1971                                     23222739
## 756                          2005             PR9619.3.C3922G37 2005 122715213
## 757                          1996                PS3558.A726G65 1996  36522890
## 758                          2007                                     78988748
## 759                          2007                                     77797253
## 760                          2006                                     69676504
## 761                          2006           PG3479.4.R9344J8413 2006  76965709
## 762                          2007              PT8951.13.H47M63 2007  85830215
## 763                          2007                PS3611.E449P87 2007 144596584
## 764                          1954                     PZ4.M98Fi 1954   7544042
## 765                          2007              PQ6658.E672M4613 2007  71044774
## 766                          2006                                    122953102
## 767                          2007             BQ9399.I554L55345 2007 137244750
## 768                          2006              PQ2675.S698I5713 2006  71949038
## 769                          1994                 PS3507.O83F67 1994  49284796
## 770                          1994                                     49284801
## 771                          2007               PS3602.E6956W48 2007 148887729
## 772                     2005-2006                                     77011324
## 773                     2005-2006                                     77011324
## 774                          2006           PG1419.21.O889M4313 2006 156874851
## 775                          2007              PR6054.A89156S56 2007  73954583
## 776                          1983                                     34937404
## 777                          1975                                     29230339
## 778                          1993                                     48258910
## 779                          1988                                     23074502
## 780                          1993                                     49284798
## 781                          1987                                     25330316
## 782                          1966                                     23089642
## 783                          1977                                      6748122
## 784                          1986                                     44800185
## 785                          1979                                      5809730
## 786                          1988                                     32604783
## 787                          1976          PZ3.K142An 1976PS3521.A47   3217360
## 788                          1979          PZ4.A265De 1979PS3501.G35   4755871
## 789                          1979                                      6078832
## 790                          1975                       PN35.O5 v.51  24876759
## 791                          1978                                      5514645
## 792                          1976                                     15305044
## 793                          1979                                     23349733
## 794                          1975                                     24876695
## 795                          1979                                     49284831
## 796                          1970             PZ3.J928On10PT2619.U43    133262
## 797                          1955                       DB350.7.V542   1629869
## 798                          1961                                      2336570
## 799                          1965                         GR158.D413    321529
## 800                          1964                       PZ8.1.G946Ch  10893502
## 801                          1950                                     11547781
## 802                          1970                         PE1122.C59      6066
## 803                          1986                  PR6013.R24G7 1987  15652289
## 804                          1977        PZ4.B162In 1977PR6052.A3195   3361418
## 805                          1981                                      8879340
## 806                          2007                 PS3564.E23H45 2007 213400345
## 807                          2007                                    547399343
## 808                          2007            PG1919.36.A24S8513 2007 233000972
## 809                          2006                                     80014035
## 810                          2008                PC839.B56I5513 2008 262718795
## 811                          2008               PJ7864.A3568G39 2008 226281287
## 812                          2008              PS3563.A72215L66 2008 221169273
## 813                          2008                PJ7864.A384B74 2008 259711288
## 814                          2008                    GR340.F826 2008 137325039
## 815                          1978        PZ3.C83983Gu 1978PS3505.O99   3726354
## 816                          1975            PZ3.L5884Ar20PS3523.E94   2930783
## 817                          1976           PZ4.D794Ad 1976PS3554.R8   3217405
## 818                          1973                                    235957082
## 819                          1977                                     22538891
## 820                          1994                                    235952292
## 821                          1992                                     49284803
## 822                          1990                  PS3543.I26L5 1990 231758931
## 823                          1977                                     23360639
## 824                          1992                                    236164777
## 825                          1978         PZ3.F6186Jo 1978PS3511.L36   4245160
## 826                          1976           PZ4.S938Co 1976PS3569.T9   3151584
## 827                          1976                                      3217267
## 828                          1977                                     22538891
## 829                          2008                PS3612.E558F43 2008 276332840
## 830                          2008                PR6104.A858G73 2008 299036272
## 831                          2007                  PT9746.F6K93 2007 134993017
## 832  <unparsed="printed by OTC)">                                    220962561
## 833                          1986                                     44800185
## 834                          2008           PT6592.32.A545A6513 2008 318364482
## 835                          2006                                    153307780
## 836                          2006                 PS3554.E43S56 2006 212836900
## 837                          2008            PT6592.23.A88P5413 2008 300395491
## 838                          1968                       PZ3.K614Hy38   1439728
## 839                          2007                 PK6445.L9F655 2007 213304739
## 840                          2009            PT6466.12.R53E6513 2009 258087106
## 841                          1972                                     31799858
## 842                          1961                        PZ4.H6994Bu   3079010
## 843                          1971              PZ1.L32 No 3PT8722.E5   1004943
## 844                          1964                                     21740581
## 845                          1962                        PZ7.G74Rac4   4254611
## 846                          1955                         PZ8.H913He   1813828
## 847                          1972                    SH441.G615 1972    221951
## 848                          1967                                      7326828
## 849                          1967                  PZ3.E23Tal8PR4640    913475
## 850                          1962                                       280956
## 851                          1968         PZ4.K818Sh 1968PR9379.9.K6   2133024
## 852                     1963-1966                                      7709720
## 853                          1957                                     10245255
## 854                          1956                                     10260467
## 855                          1959                                      1692926
## 856                          1950                                      6767565
## 857                          1974               PZ3.S848K80PR5484.K5   1366631
## 858                          1957                                      8608182
## 859                          1989                                     20130226
## 860                          1968                            GR25.T5    448520
## 861                          1971              PZ3.D361Or6PR6007.E25    258370
## 862                          1956                      PZ3.B74454Th2   1200152
## 863                          1967                                     10971017
## 864                          1969                                     17637204
## 865                          1987                    PR4854.D33 1987  13861266
## 866                          1962                          PR2065.G3     43569
## 867                          1957                           PT2434.M   1027769
## 868                          1953                      PZ3.M3184Ma17    223495
## 869                          1951                                       294202
## 870                          1975            PZ3.P6953Fr8PG3476.P543   2964267
## 871                          1958                        PZ3.L1354Si   1016865
## 872                          1984                          PQ4734.V5  11297749
## 873                          1950                                     15805905
## 874                          1972                 PZ3.D5617Nu4PQ1979   1254181
## 875                          1958                         PZ4.G37Fo2   1802437
## 876                          1964                                      3855717
## 877                          1965                                      7293535
## 878                          2002               PQ2235.D93C6513 2002  53278146
## 879                          1962                          PS1302.B5    706325
## 880                          1965                                     12347780
## 881                          1963                                      7402455
## 882                          1954                      PZ3.S85166Mar   2832559
## 883                          1960                                      2064134
## 884                          1963                                      2064372
## 885                          1950                                      1927995
## 886                          1963                                      2277026
## 887                          1967                                      5280243
## 888                          1971                   PZ3.M445CjPQ2349    354435
## 889                          1954                                       321838
## 890                          1972                    GR203.G4W3 1972    415322
## 891                          1971              PZ3.Z92Pas5PT2653.W42    147640
## 892                          1989                  PQ2621.L6A27 1989  18015813
## 893                          1984                                     11577215
## 894                          1961                                       322212
## 895                          1966                       PZ3.C852Maf3    954209
## 896                          1962                                      1950310
## 897                          1970                                     11919967
## 898                          1964                                      6988115
## 899                          1966                         PZ4.G247Ci   6628403
## 900                          1950                                      8127191
## 901                          1959                                      2690218
## 902                          1966                                       492577
## 903                          1984                                     11886174
## 904                          1971                                      4122235
## 905                          1972             PZ3.H83303OdPR6058.O88    226553
## 906                          1959                                      3921283
## 907                          1958                         PZ4.C269Bl   3142841
## 908                          1972                                     39372917
## 909                          1972                                      4016524
## 910          <estimate="[200-?]">                                     55496600
## 911                          1974                                      5107981
## 912                          1971                                     16189569
## 913                          1960                         DD247.N3P4   1927329
## 914                          1961                                     18660140
## 915                          1959                                      6189968
## 916                          1972                 PZ3.F618Se15PQ2246    389933
## 917                          1968                                      7450602
## 918                          1970                                      6502715
## 919                          1955                                      1290262
## 920                          1961                                      9471773
## 921                          1973              PZ4.R328Hi3PR6068.E35    657567
## 922                          1968                         D802.N4G33    463427
## 923                          1965                                      1313837
## 924                          1966                        PZ4.R328Pat  12881500
## 925                          1971                PZ1.L32Sw5PT9630.E5    277181
## 926                          1961                           E99.E7F7   1033451
## 927                          1973                  PZ3.C812R22PR4504   2656186
## 928                          1986                  GR268.A73A73 1986  12104473
## 929                          1952                                      2085838
## 930                          1954                       PZ3.N166Sw 4    360179
## 931                          1961                 PZ1.W96NePL2658.E8      8716
## 932                          1955                       DD261.4.H513   5128164
## 933                          1971                                     16216130
## 934                          1963                                      6484778
## 935                          1969                                      1036477
## 936                          1951                      PT2625.A44E75    295404
## 937                          1961                  PZ4.E22PR6055.D35   1380473
## 938                          1968                                     12186878
## 939                          1973            PZ3.R4175Th5PT2635.I273   1229800
## 940                          1959                        PZ3.R2913Ch   1683199
## 941                          1960                                     11305493
## 942                          1956                PR6045.I577A5 1956g  30968428
## 943                          1966                       PZ3.S5892Aan    954591
## 944                          1967                                     42916370
## 945                          1971                                      6183771
## 946                          1959                        PZ3.L9896Ot   2411900
## 947                          1967                                      2830500
## 948                          1968                      PZ3.S5892Pau3    464583
## 949                          1961                         PZ3.J234He    549689
## 950                          1970                 PZ3.M349Mg15PR4977    141670
## 951                          1956                                     15279689
## 952                          1960                                      9329841
## 953                          1955                                      7244535
## 954                          1953                                     10397568
## 955                          1973           PZ3.S64657Ey6PR6037.M425   3046609
## 956                          1972            PZ4.B7125Do3PR6052.O574    694567
## 957                          2002                PS3513.U797H86 2002  49712233
## 958                          1967                                     20587021
## 959                          1966            PZ4.O3515PrPR9381.9.O35   3516228
## 960                          1961                      PZ3.A3655Las2   4283700
## 961                          1957                                     17222042
## 962                          1973                 PZ4.J36KiPR6060.A7    725798
## 963                          1963                         PZ4.O357Wo   3722629
## 964                          1975            PZ4.B9573StPR9369.3.B77   2559213
## 965                          1963                                      1925185
## 966                          1970             PZ4.H6635SiPR9381.9.H5    663075
## 967                          1969            PZ4.V898SePG1038.35.O55    123043
## 968                          1962                        PR6019.H3G4   2128296
## 969                          1958                                      1265932
## 970                          1972                                     19760981
## 971                          1972                                     19760981
## 972                          1969                         PR1307.P3x  32318549
## 973                     1963-1966                                      7709720
## 974                          1970             PZ3.B4495Si6PS3503.E63    129893
## 975                          1958                                      3245828
## 976                          1967                                      1267001
## 977                          1952                                      8569383
## 978                          1952                                      5222849
## 979                          1962                                      2720412
## 980                          1950                                      6638158
## 981                          1971               PZ3.S3598B6PT2638.N5    267099
## 982                          1974                                      1346185
## 983                          1963                                      1403433
## 984                          1987                     GR340.J33 1987  13823115
## 985                          1987                PT2640.Z3K3813 1987  19325556
## 986                          1988               PT2645.I445K713 1988  16276098
## 987                          1971                                     19519087
## 988                          1989                PJ5129.S49K413 1989  19815294
## 989                          1986                 PR6063.A248L6 1986  13007456
## 990                          1959                                       295013
## 991                          1989                  PG3476.N3M33 1989  19920697
## 992                          1989                PR9619.3.C48H6 1989  21011194
## 993                          1989                                     20262038
## 994                          1980                                     16481839
## 995                          1989               PT2668.O376A913 1989  19390747
## 996                          1988                                     18741615
## 997                          1960                                      1375582
## 998                          1989                     PR3454.H5 1989  20218120
## 999                     1987-1988                PT2639.P47W513 1988  16869241
## 1000                         1984                PA5610.R52P313 1984  10710796
## 1001                         1956                                      2563152
## 1002                         1983                                     10787952
## 1003                         1984                 PR6069.T464F3 1984  10914580
## 1004                         1984                                     10961130
## 1005                         1984                PR9619.3.W54L5 1984  10924230
## 1006                         1984                 PR6031.O867W5 1984  10948613
## 1007                         1984                PR6023.E833M35 1984  11044639
## 1008                         1985              PG3456.A15G3 1984 v.6  10997333
## 1009                         1983                  PR6025.A23R3 1982  10113121
## 1010                         1983                                     10384975
## 1011                         1983                                     10499102
## 1012                         1981                                     10549524
## 1013                         1976                                     10561266
## 1014                         1984              PQ3919.2.C45P713 1984  11743640
## 1015                         1984               PR9369.3.S23U36 1984  11814399
## 1016                         1983                                     11928789
## 1017                         1979                PQ2607.A86G713 1985  11971373
## 1018                         1984                                     11059104
## 1019                         1984                PQ2633.U74O713 1984  11063196
## 1020                         1985                   PQ2349.A4E5 1985  11133624
## 1021                         1959                       PS3566.A46L5   2114948
## 1022                         1950                                     11244229
## 1023                         1984                PT2625.A43J813 1984  11186531
## 1024                         1984                                     11190939
## 1025                         1985                PQ2680.O83V413 1985  11289110
## 1026                         1980                                     11292916
## 1027                         1985                PG5038.L85M613 1985  11442180
## 1028                         1984                                     11543893
## 1029                         1984                  PS3505.A87T7 1984  11632561
## 1030                         1986                        PT6592.12A/  12944158
## 1031                         1986                         PQ2635.E48  12946904
## 1032                         1986                                     12909553
## 1033                         1984                                     13105312
## 1034                         1985               PQ2637.I53V5713 1985  12162042
## 1035                         1984                  PS3565.A8W52 1984  12135068
## 1036                         1984                                     12227011
## 1037                         1985                                     12176738
## 1038                         1983                                     12266598
## 1039                         1985                          PQ2476.V4  12316154
## 1040                         1983               PS3557.O398M56 1983b 503045286
## 1041                         1982                                     12479563
## 1042                         1982                                     12479569
## 1043                         1985                        PR6051.L54/  12479466
## 1044                         1983                                     12479498
## 1045                         1984                                     12451062
## 1046                         1984                PK6978.82.E5A8 1984  12553357
## 1047                         1985                         PQ4817.A33  12503700
## 1048                         1984                                     12508443
## 1049                         1985                                     12514087
## 1050                         1985                          PG3420.D9  12512388
## 1051                         1985                          PR6073.A9  12515829
## 1052                         1985                                     12517086
## 1053                         1986                                     12520870
## 1054                         1985                         PG3456.A13  12524054
## 1055                         1985                                     12581295
## 1056                         1984                    PQ2625.A33 1984  12586240
## 1057                         1982               PG3476.S628M413 1982  12665459
## 1058                         1975               PZ3.P663Sh5PQ4835.I7    979252
## 1059                         1984                  PG3478.N8A25 1984  12668408
## 1060                         1984                                     12629987
## 1061                         1976                                     12631544
## 1062                         1973             PZ4.V318Tar3PR6072.A83   2668272
## 1063                         1986               PG7158.L39S4513 1986  12693990
## 1064                         1985                                     12694304
## 1065                         1986                PG7158.L39P313 1986  12722996
## 1066                         1980                                     13802732
## 1067                         1986                                     13821122
## 1068                         1984                     E99.P9B15 1984  13902492
## 1069                         1987                PR9619.3.S52W5 1987  13903420
## 1070                         1986                         PQ2637.I53  14128959
## 1071                         1987                          PQ4835.I7  14129344
## 1072                         1986                                     14166583
## 1073                         1986          PG3456.A15G3 1984 vol. 11  13270649
## 1074                         1986               PQ2637.I547V413 1986  13214956
## 1075                         1984                                     13333594
## 1076                         1985                                     13334630
## 1077                         1963                                     13277460
## 1078                         1985                                     13397313
## 1079                         1985                                     13413982
## 1080                         1986                   PR6056.R4C5 1986  13526476
## 1081                         1986                     PR4967.L3 1986  13488054
## 1082                         1986                    PQ2172.A31 1986  13582975
## 1083                         1986                PC839.E38N6513 1986  13670885
## 1084                         1985              PQ7797.O6718U413 1985  13699929
## 1085                         1984                                     14912260
## 1086                         1984                                     15204159
## 1087                         1983                                     14374429
## 1088                         1979                                     14336701
## 1089                         1986                                     14765013
## 1090                         1987                                     16090830
## 1091                         1987                PS3531.O7345H3 1987  15518997
## 1092                         1978               PZ3.P663Sh8PQ4835.I7   2983223
## 1093                         1987                         PG3476.P27  15590019
## 1094                         1983                                     15639527
## 1095                         1986                                     15666753
## 1096                         1988                       PG3489.4.Z59  17201833
## 1097                         1976                             PL2694  16690812
## 1098                         1985                                     16706383
## 1099                         1967                                     18034975
## 1100                         1962                                      8015047
## 1101                         1980                   D802.S752B941513   8082878
## 1102                         1981                                      8205640
## 1103                         1982              PQ2637.I53C59413 1982   8221321
## 1104                         1982                     BV5080.C3 1982   8221422
## 1105                         1982                                      8253157
## 1106                         1982                                      8273477
## 1107                         1982                 PS3552.O874S6 1982   8283660
## 1108                         1982                PR9619.3.A75I8 1982   8553096
## 1109                         1983                     PG3366.V6 1983   8728023
## 1110                         1980                                      8737333
## 1111                         1980                                      8737333
## 1112                         1981               PT8175.H367T313 1981   8751338
## 1113                         1980                                      8947165
## 1114                         1977                                      8974054
## 1115                         1957                         PZ4.S892By   7028674
## 1116                         1989                 PT8175.N4P413 1989  19626282
## 1117                         1980                     PG3948.A63Z213   7171274
## 1118                         1979                                      7185013
## 1119                         1980                                      7238652
## 1120                         1980               PR9619.3.A75A65 1980   7273565
## 1121                         1980                                      7431534
## 1122                         1984                                      7515235
## 1123                         1952                       PZ3.B6738.Dj  29085928
## 1124                         1981                                      7579668
## 1125                         1970                                      7649402
## 1126                         1980                                      7809484
## 1127                         1981                   PG3948.T4A2 1981   7848694
## 1128                         1965                                      7877878
## 1129                         1972                                      1193925
## 1130                         1979                                      7996091
## 1131                         1959                        PZ3.P2866No   6294587
## 1132                         1980                                      6326985
## 1133                         1978                                      6407057
## 1134                         1979                                      6593618
## 1135                         1978                                      6690688
## 1136                         1965                                      6691140
## 1137                         1981                  PR6057.A63G3 1981   6707683
## 1138                         1976                                      6845996
## 1139                         1979                       PQ9637.E5N68   5029606
## 1140                         1979               PZ3.Z74Cl 1979PQ2499   5171412
## 1141                         1959                                      1023250
## 1142                         1980          PZ3.G3613Sd 1980PQ2613.I2   5676245
## 1143                         1980          PZ3.G3613St 1980PQ2613.I2   5676275
## 1144                         1979                                      5897022
## 1145                         1978                  PQ1447.E5C58 1978   4037617
## 1146                         1978                                      4039942
## 1147                         1978                                      4140921
## 1148                         1977                                      4266258
## 1149                         1978     PZ3.L56684Cp vol. 2PR6023.E833   4376886
## 1150                         1978                                      4379700
## 1151                         1963                                      1744396
## 1152                         1958                                      4864151
## 1153                         1958                                      4878955
## 1154                         1986              PG3476.P553S4913 1986  16804541
## 1155                         1977             PZ3.G5875Pr10PG3337.G6   3003720
## 1156                         1977              PZ3.G5875Co8PG3337.G6   3003722
## 1157                         1976            PZ4.C5972DePR6053.L3248   3032953
## 1158                         1974            PZ3.S378Tr7PR9369.2.S37   3053574
## 1159                         1976             PZ4.R4132FamPR6068.E63   3069125
## 1160                         1976            PZ3.S5892Ted3PQ2637.I53   3070374
## 1161                         1976                                      3081554
## 1162                         1975                                      3179687
## 1163                         1977                 PG3453.B7O313 1977   3329000
## 1164                         1954                       PZ3.W58222Be   3359136
## 1165                         1976            PZ4.W72664IkPR9320.9.W5   3379001
## 1166                         1978         PZ3.D1373Be 1978PR6054.A35   3415170
## 1167                         1976             PZ4.A6474DiPR9379.9.A6   3431935
## 1168                         1976           PZ3.M445Dk 1976PQ2349.A4   3514812
## 1169                         1974                                      3640075
## 1170                         1977       PZ3.M547Vi 1977bPQ2625.E5278   3848707
## 1171                         1976                  E99.A86P4713 1976   3868586
## 1172                         1978         PZ4.T9866Ag 1978PR6070.Y57   3966178
## 1173                         1956                        PZ4.S892Hau   3999150
## 1174                         1975                                      2042798
## 1175                         1974                                      2061922
## 1176                         1976             PZ4.G2312Cq4PR6057.A63   2090918
## 1177                         1975             PZ4.K126LoPR9381.9.K28   2143749
## 1178                         1976                     BL782.E89 1976   2225013
## 1179                         1975           PZ3.M6972Hi 12PR6025.I88   2284262
## 1180                         1976             PZ4.G4583MyPS3557.I283   2346033
## 1181                         1976                                      2372916
## 1182                         1976              PZ3.A6482On3PQ2601.P6   2374540
## 1183                         1976       PZ4.A6794Hal5 etc.PQ7390.A72   2408500
## 1184                         1957                        PZ4.M1515Ci   2464828
## 1185                         1975            PZ4.B1495CoPR9619.3.B25   2507434
## 1186                         1977              PZ3.R2849Fi9PG3470.R4   2542293
## 1187                         1976                 PZ3.C391Mar8PQ2205   2663666
## 1188                         1957                         PZ3.H514Ap   2736649
## 1189                         1975             PZ4.N58MePR9381.9.N464   2746333
## 1190                         1964                                      2759878
## 1191                         1960                                      2792715
## 1192                         1976             PZ4.B3568So5PS3552.A87   2816989
## 1193                         1975          PZ3.B45593Di8PQ2603.E5875   2913010
## 1194                         1978      PZ3.B41937Po 1978PS3503.E4488   2966918
## 1195                         1978                                      2985511
## 1196                         1978                   PQ4555.A8E5 1978   2985512
## 1197                         1974            PZ3.M32355Al5PR6025.A57   1008265
## 1198                         1961                        PZ3.H114Il3   1064278
## 1199                         1972               PZ4.G66Li4PR6057.O63   1164756
## 1200                         1972                         PL8011.N65   1255484
## 1201                         1966                                      1369238
## 1202                         1974                                      1380611
## 1203                         1960                          PZ4.J6Ho2   1421805
## 1204                         1955                        PZ3.C4637Hi   1427124
## 1205                         1975             PZ4.R6447Ch3PR6068.O15   1431785
## 1206                         1962                         PZ4.M956St   1555279
## 1207                         1975                                      1575566
## 1208                         1961                       PZ4.B2835Ki2   1865537
## 1209                         1987                     PR4854.K4 1987    270727
## 1210                         1963                                       282882
## 1211                         1962                                       310370
## 1212                         1960                                     13598026
## 1213                         1972                                       341266
## 1214                         1963            PZ4.W7492InPR6073.I4678    435147
## 1215                         1967                        PZ4.C4558Ro    458512
## 1216                         1970             PZ3.L4453Pr5PR6023.A94    667402
## 1217                         1973            PZ4.M8269Fu5PR9619.3.M6    797145
## 1218                         1953                                       958249
## 1219                         1974                                       997182
## 1220                         1963                                     13627125
## 1221                         1981                PR9369.3.S45T6 1981   9197785
## 1222                         1983                                      9308108
## 1223                         1980                PR9387.9.E3M34 1980   9323806
## 1224                         1960                                      9379242
## 1225                         1983                                      9412145
## 1226                         1979                                      9451050
## 1227                         1983               PG7158.K6513S43 1984   9783315
## 1228                         1984                                      9783910
## 1229                         1983              PS3553.H3346D87 1983b   9830564
## 1230                         1982                   PH671.E5L68 1982   9830747
## 1231                         1982                                      9837580
## 1232                         1986                PQ2476.V4 A913 1986  12811208
## 1233                         1955                                     13454041
## 1234                         1986                PQ9697.T49C513 1986  13440592
## 1235                         1987              PQ2637.I53M25613 1987  15019013
## 1236                         1983                                     14374154
## 1237                         1987              PR9619.3.M3235R4 1987  15550267
## 1238                         1987                          PQ2469.P3  15593816
## 1239                         1987                                     17250785
## 1240                         1988                      PR9619.3.I674  17233667
## 1241                         1987             PQ8520.32.I36T713 1987  16348458
## 1242                         1987                                     16357471
## 1243                         1988                          PT1970.A1  16465646
## 1244                         1988                 PT2631.L6K313 1988  16580246
## 1245                         1986               PG3488.T46G7613 1986  16619173
## 1246                         1988               PR9619.3.C573R4 1988  16648776
## 1247                         1988                        PG3476.U675  16755587
## 1248                         1988                        PR6063.A384  16922773
## 1249                         1988                   PT2668.A5A2 1988  18048927
## 1250                         1986                                     18178147
## 1251                         1988                  PT2621.A26A2 1988  18165069
## 1252                         1960                                      6516080
## 1253                         1987                                     17733166
## 1254                         1988                                     17839142
## 1255                         1989             PQ2607.U8245Y4813 1989  18813820
## 1256                         1985                                     19466098
## 1257                         1954                          PZ3.C58Cl   5517723
## 1258                         1975           PZ4.S13Day5PR9499.3.S154   1860027
## 1259                         1983                                     10471254
## 1260                         1974             PZ4.F7543PuPR9619.3.F6   1255677
## 1261                         1985                                     14879865
## 1262                         1988                 PR6053.O75R43 1988  16129480
## 1263                         1988                     PS2384.M6 1988  16352428
## 1264                         1987                 PR6066.R325C6 1987  16737140
## 1265                         1987                                     16935176
## 1266                         1988               PR9619.3.H287L5 1988  18069425
## 1267                         1985                                     18308208
## 1268                         1988              PG7158.G699O6413 1988  17619566
## 1269                         1989                                     19270855
## 1270                         1989               PR6015.A4644M55 1989  18558691
## 1271                         1989                                     18743119
## 1272                         1989                                     19985614
## 1273                         1989                                     19517044
## 1274                         1989                      G530.E72 1989  19920351
## 1275                         1983                                     10705720
## 1276                         1958                                     10716762
## 1277                         1964                                     10716550
## 1278                         1983                                     10672939
## 1279                         1970                                     10731824
## 1280                         1982                GR336.P44C4812 1982  10825488
## 1281                         1950                           GR290.G3  10272534
## 1282                         1964                                     10385461
## 1283                         1982                   GR200.P3813 1982  10458588
## 1284                         1983                     GR144.W54 1983  11782995
## 1285                         1983                     GR202.M65 1983  11784128
## 1286                         1981                                     11905059
## 1287                         1985                      GR340.A5 1985  11370682
## 1288                         1985                     GR365.S35 1985  12752270
## 1289                         1987                PQ3989.D28P313 1987  14411955
## 1290                         1987                                     17254364
## 1291                         1987                                     17254364
## 1292                         1952                                      8371412
## 1293                         1983                   GR75.L56Z56 1983   8709301
## 1294                         1965                                      7426566
## 1295                         1961                                      6323261
## 1296                         1980                   GR295.I7C35 1980   6625541
## 1297                         1978                     GR356.72.N47O7   6886829
## 1298                         1980                                      5219510
## 1299                         1950                                      5470873
## 1300                         1977                          GR215.E45   4277414
## 1301                         1977                          GR215.A38   4277506
## 1302                         1964                      PH3241.I55A22   4347077
## 1303                         1958                      GR312.M3 1958   4377971
## 1304                         1967                                      3057233
## 1305                         1968                         GR113.A913   3064495
## 1306                         1978                          BM532.R28   3205806
## 1307                         1974                       GR342.P32213   3630810
## 1308                         1974                       GR342.P32213   3630810
## 1309                         1962                                      3879737
## 1310                         1970                   GR320.T5513 1970   2019890
## 1311                         1968                      GR259.M4 1968   2616355
## 1312                         1970                                      2842859
## 1313                         1955                           GR342.K5   1160173
## 1314                         1967                        PZ4.T482Pe3   1386734
## 1315                         1959                  GR385.N55H8  1959   1406535
## 1316                         1971                                      1454746
## 1317                         1857                                      1614429
## 1318                         1965                                      1718856
## 1319                         1963                       PZ3.A7654Mo3   1834657
## 1320                         1975                       BF1472.U6J43   1912158
## 1321                         1969                E51.C7 vol. 21 1969     17438
## 1322                         1968                                       178242
## 1323                         1971                   PZ3.H677ThPT2360    211702
## 1324                         1971                F3429.3.M3K313 1971    219438
## 1325                         1971                   GR290.P4713 1971    226453
## 1326                         1967                        PZ8.1.L25Ki    250089
## 1327                         1965                                       296495
## 1328                         1954                          GR275.C32    313412
## 1329                         1956                        PZ3.E244Jap    324829
## 1330                         1969                     GR350.C42 1969    340993
## 1331                         1968                         PZ3.V233Ou    348663
## 1332                         1966                          PZ8.A54Iv    414193
## 1333                         1968                      GR139.T4 1968    451689
## 1334                         1966                          GR90.H813    470296
## 1335                         1973                   PQ1308.E6B7 1973    583923
## 1336                         1972                        GR280.D6813    637098
## 1337                         1974                       GR360.B3P613    730775
## 1338                         1952                     GR342.C45 1952    827058
## 1339                         1974                          GR335.L45    940394
## 1340                         1966                           GR350.M8    954642
## 1341                         1967                           GR215.B6    955447
## 1342                         1962                       PG3366.A13D8    978645
## 1343                         1972                                       985459
## 1344                         1960                                     13836922
## 1345                         1982                     GR176.S28 1982   9946009
## 1346                         1987                                     18361672
## 1347                         1980                  GR176.C3413 1980b   7273561
## 1348                         1974             PZ1.D2673Tw9PN6071.F15    754422
## 1349                         1989                    PQ1278.B39 1989  19723731
## 1350                         1988                                     20932549
## 1351                         1988                                     20932549
## 1352                         1985                                     12865469
## 1353                         1965                         PZ4.R627So    429507
## 1354                         1975              PZ3.G588El 4PQ2263.F4    866465
## 1355                         1985                    PS3037.A45 1985  12237893
## 1356                         1982                                      8854245
## 1357                         1970              PZ3.A3632Ro6PR6001.L4    102710
## 1358                         1962                     PD25.N6 no. 36    317939
## 1359                         1964                      PQ7499.A78S42   2416821
## 1360                         1966                                     29751483
## 1361                         1979                                      8386650
## 1362                         1968                         PZ3.Z74G19   2581626
## 1363                         1954                                      3833291
## 1364                         1957                                       273928
## 1365                         1977             PZ4.S57195CePS3569.I44   2525235
## 1366                         1975                PZ3.Y5Br7PS3547.E95   1508158
## 1367                         1954                     PS3545.I5365O5    291447
## 1368                         1974                   PT8116.E5H3 1974    894423
## 1369                         1958                                      2154714
## 1370                         1953                                      1497408
## 1371                         1953                                      1497408
## 1372                         1958                          PZ3.T58To   1067289
## 1373                         1968                        PZ3.S8554Li    443421
## 1374                         1968                                        15141
## 1375                         1974           PZ4.K96475LiPG5039.21.U6    841348
## 1376                         1974              PT9875.B533S313 1974b   1355864
## 1377                         1976                 PZ4.J6He3PR6060.H3   1857862
## 1378                         1964                                     58902670
## 1379                         1955                                     11249732
## 1380                         1971         PZ4.C177Rad 1971PQ3989.C27    149374
## 1381                         1971            PZ4.B564Ki6PQ3989.2.B45    137514
## 1382                         1962                       PZ3.A478Gab2    327853
## 1383                         1965                                      2362492
## 1384                         1953                                      1497408
## 1385                         1962                                      1447861
## 1386                         1963                         PZ4.S737Go   3038033
## 1387                         1955                                       317259
## 1388                         1975              PZ4.Z456Th7PS3576.E43   1737542
## 1389                         1974                                      2007440
## 1390                         1982                PT2635.O84H513 1982   7999017
## 1391                         1976         PZ3.S5892Maegik3PQ2637.I53   2911330
## 1392                         1980             PZ4.F8726BlPS3556.R42;   5677333
## 1393                         1978                                      4056237
## 1394                         1977                                      2818498
## 1395                         1976              PZ4.G576DrPS3557.O315   1584134
## 1396                         1981                        PL984.E8M58   7601016
## 1397                         1957                      PZ3C13956 Pat  11673576
## 1398                         1981               PQ7797.S214S613 1981   7279567
## 1399                         1981                                      7538572
## 1400                         1959                       PZ3.K925Re 2  66129266
## 1401                         1967                                       906279
## 1402                         1968                        PZ4.P158Li5   1450535
## 1403                         1982                PS3503.E4488D4 1981   7484545
## 1404                         1966                        PZ3.M9737Fi   1337983
## 1405                         1956                        PZ3.K11Tr14   2459431
## 1406                         1966               PT8175.B743T613 1966    638245
## 1407                         1950                                      2302453
## 1408                         1971                   PZ3.S618ThPS3569    217053
## 1409                         1962                                      1447887
## 1410                         1956                                       837841
## 1411                         1977                                      3169240
## 1412                         1957                                      6369666
## 1413                         1967                        PZ4.O973Th2    934208
## 1414                         1964                                      1321424
## 1415                         1959                       PZ3.P18727Bi   7027647
## 1416                         1979              PZ4.P193DanPS3566.A57   4883357
## 1417                         1967                                       776703
## 1418                         1958                        PZ3.P2206Fr   1449801
## 1419                         1955                        PZ3.P2206Pi  11183486
## 1420                         1975             PZ4.P117CarPS3566.A316   1324418
## 1421                         1978           PZ3.P148Mi 1978PR5115.P2   3651349
## 1422                         1974               PZ4.P154TrPS3566.A45    754434
## 1423                         1976             PZ4.P36247Be3PR6066.E2   2192595
## 1424                         1963                                      1378889
## 1425                         1966                        PZ4.P3935Id    900637
## 1426                         1956                                      1378837
## 1427                         1970            PZ3.P3132Tg6PR6031.E183    104792
## 1428                         1970           PZ3.P4168Maj5PR6031.E535    156654
## 1429                         1979              PZ4.P55ManPS3566.H475   4638215
## 1430                         1963                                      2362538
## 1431                         1973                PZ4.P539OlPR6066.H4    960735
## 1432                         1975                PZ4.P539LoPR6066.H4   1602769
## 1433                         1965                                      1030614
## 1434                         1979                PZ4.P618ViPS3566.I4   5285890
## 1435                         1965                                     67410705
## 1436                         1968                  PZ3.P752Pr2PS2617    451470
## 1437                         1973                                       859241
## 1438                         1982                       PS3566.O36S7   7925183
## 1439                         1969               PZ4.P748AgPS3566.O36    218558
## 1440                         1956                         PZ4.P748Al   7304546
## 1441                         1968                                        28689
## 1442                         1952                                      3921256
## 1443                         1967                        PZ3.O3677In    290320
## 1444                         1969                        PZ3.O3677Lt     28354
## 1445                         1951                         PZ3.O555Gr    880749
## 1446                         1973                                      2527727
## 1447                         1956                       PZ3.H83303Lo   1825094
## 1448                         1966                       PR9599.W5S65    367857
## 1449                         1966                                     67893991
## 1450                         1959                         PZ3.G678Sc    586380
## 1451                         1979              PZ3.E334RcPS3509.H663   4076713
## 1452                         1979        PZ4.P3194Day 1979PR6066.A87   4114527
## 1453                         1956                      PZ3.B38868Mal   3325656
## 1454                         1951                       PZ3.C13035Lo    997150
## 1455                         1968                        PZ3.Z74Mas9   1689582
## 1456                         1974               PZ4.F268ToPS3556.A98   3255638
## 1457                         1960                                     68172328
## 1458                         1961                          QL62.D865   2406759
## 1459                         1957                       PS3563.E65S4    289298
## 1460                         1972            PZ4.K9695Su3PT2621.U896    715010
## 1461                         1973                                       806004
## 1462                         1970                 PS3527.A26D47 1970   2063505
## 1463                         1970              PZ4.R297Th3PS3568.E28     78555
## 1464                         1978                      PZ3.S5892Mair   3729420
## 1465                         1960                         PZ4.W195Hu   1389876
## 1466                         1958                        PZ3.C1574Ex    343197
## 1467                         1980                      PL5089.K36A22   8031995
## 1468                         1980          PZ4.R829On 1980PQ2678.O72   5892023
## 1469                         1954                                       780588
## 1470                         1968                       PZ3.C13956Co    443414
## 1471                         1955                        PZ3.O3677Te    290360
## 1472                         1962                        PZ3.H7845Mo    285363
## 1473                         1970                                        79393
## 1474                         1964           PZ4.R253Ri 1964PR6068.A9   4435295
## 1475                         1969                PZ4.P994GoPS3566.U9    193005
## 1476                         1955                        PZ4.P994Dar   2114850
## 1477                         1958                           DR312.D5    396355
## 1478                         1957                         PZ4.G512Pr   1662489
## 1479                         1974                  PZ3.G45Th12PR4716   1119417
## 1480                         1969                   PZ3.G45Is6PR4716    126559
## 1481                         1957                      PZ3.P9413Mi 2   3691154
## 1482                         1979         PZ4.P9465Ac 1979PS3566.R49   4195038
## 1483                         1967                         PZ4.R253Fi   2094726
## 1484                         1973            PZ4.S7313Se3PR9387.9.S6   1094379
## 1485                         1968                       PZ3.S74614Sh    442639
## 1486                         1968                        PZ4.S735Pu3    443217
## 1487                         1967                       PZ4.S7446Ty3    336461
## 1488                         1981                                      8059017
## 1489                         1954                        PZ3.M6164Wh   1742575
## 1490                         1960                                      1451434
## 1491                         1960                          PZ4.M65Sl   1809285
## 1492                         1978                                      3966325
## 1493                         1977      PZ3.S64402Bar 1977PR5453.S52;   2875853
## 1494                         1981                      PS3569.M514F6   7263112
## 1495                         1969                                        44151
## 1496                         1976             PZ4.S63126StPR6069.L37   2525882
## 1497                         1956                        PZ4.S636Laz   1052280
## 1498                         1959                                      1451200
## 1499                         1962                                     30258501
## 1500                         1970                                        92451
## 1501                         1978       PZ3.S64635Op 1978PR6037.M424   5009957
## 1502                         1964                          PZ4.M65Lm    292017
## 1503                         1974            PZ4.S653DePS3569.M53766    797783
## 1504                         1967                         PZ4.S653Mi   1169592
## 1505                         1978           PZ4.S6563AnPS3569.M53785   4344730
## 1506                         1970                     PR6013.R441970  61578020
## 1507                         1957                                      4819215
## 1508                         1948                       PZ3.G8319He2   6062091
## 1509                         1962            PZ3.G8319It12PR6013.R44   1232964
## 1510                         1952                                     18998103
## 1511                         1980        PZ3.G8319Do 1980PR6013.R44;   5992512
## 1512                         1970                     PR6013.R441970  61578020
## 1513                         1970                     PR6013.R441970  61578020
## 1514                         1969             PZ3.G8319Tr3PR6013.R44     49944
## 1515                         1975             PZ4.G8156SlPS3557.R399   1443878
## 1516                         1978                                      3915512
## 1517                         1966                         PZ4.G884Sh   1283366
## 1518                         1966                                       732564
## 1519                         1971              PZ3.G919Sd3PR6013.R84    221602
## 1520                         1965            PR 9199.3 .G77 F78 1965   3976007
## 1521                         1978            PZ3.G9121KiPS3513.R8334   4236574
## 1522                         1971              PZ3.G919TalPR6013.R84    161026
## 1523                         1968             PZ4.D182ThPG3479.6.A46     33839
## 1524                         1980                                     10804766
## 1525                         1971              PZ4.K745ParPS3561.N68    111208
## 1526                         1979                PZ4.K676StPS3561.L8   4496369
## 1527                         1968                         PZ4.K678Mi   2045294
## 1528                         1968                         PZ4.K68Van    436145
## 1529                         1967                         PZ4.K694Th    365907
## 1530                         1981                                      7220976
## 1531                         1979                                      5455773
## 1532                         1968                        PZ3.K8357Wj   1332191
## 1533                         1967                PZ4.K83RePS3561.O46    292097
## 1534                         1978             PZ4.K785SavPS3561.O338   3516534
## 1535                         1979              PZ4.K867ManPS3561.O84   5377840
## 1536                         1970               PZ4.K937St3PR6061.R6     68458
## 1537                         1975             PZ4.K937BadPR9199.3.K7   2010374
## 1538                         1964                                      3233994
## 1539                         1977                                      2851964
## 1540                         1982                  PS3561.O85C5 1982   8386476
## 1541                         1954                       PR6021.R45D7   1687072
## 1542                         1968               PZ4.V297GrPQ6641.A77    225063
## 1543                         1958                                      5111551
## 1544                         1953                                       814067
## 1545                         1979           PZ3.L425Hu 1978PR4878.L6   4503282
## 1546                         1970            PZ3.L393Hap3PS3523.A914     67909
## 1547                         1961                        PZ3.L393Gr2    288725
## 1548                         1959                         PZ3.L393Se   1635609
## 1549                         1972              PZ4.L375En5PS3562.A84    678254
## 1550                         1970               PZ4.L375HoPS3562.A84     97362
## 1551                         1964                         PZ4.L377St    365801
## 1552                         1964                       PZ3.L43607St   2104049
## 1553                         1959                       PZ3.L4453Fi5  13434698
## 1554                         1965                                      8507292
## 1555                         1964                                     25436221
## 1556                         1975              PZ3.L56Gt20PR6023.E75   1054180
## 1557                         1960                         PZ4.L637Lo   3795139
## 1558                         1964                       PZ3.L56684Af    368203
## 1559                         1974              PZ4.L4335EvPR6062.E18   1046290
## 1560                         1960                        PZ3.L4645Pr   1306682
## 1561                         1979           PZ3.L518Pu 1978PR4879.L7   4494940
## 1562                         1979                                      5353255
## 1563                         1973                PZ4.P618SmPS3566.I4    688052
## 1564                         1964                        PT1863.U513    987515
## 1565                         1961                          PZ4.E77By    919455
## 1566                         1973                                       854904
## 1567                         1972                                     29902557
## 1568                         1974                PZ4.G66CoPR6057.O63   3103361
## 1569                         1957                      PZ3.L56684Hab   3947555
## 1570                         1967                                      3042022
## 1571                         1976              PZ4.N996Fal3PR6064.Y4   2373077
## 1572                         1979           PZ4.N996Me 1979PR6064.Y4   4492497
## 1573                         1967                        PZ1.E473Dan   2005039
## 1574                         1981                  PS3557.O34F3 1981   7771813
## 1575                         1963                        BL1175.P7A3   1349051
## 1576                         1975         PZ3.R1369 .Se8PR9499.3.R3;   2275247
## 1577                         1979        PZ4.H633Sad 1979PK6561.H43;   5171881
## 1578                         1974                PZ4.G73AgPJ5129.G68   5153828
## 1579                         1962                        PZ3.G558Mi5   3084067
## 1580                         1967                   PJ5129 .G68 B7E4    325397
## 1581                         1977                      PR6023.A914S5   3315039
## 1582                         1958                         PZ3.W555Be   1390819
## 1583                         1978                                      5158325
## 1584                         1954                                      8878461
## 1585                         1967                       PZ4.M7587De3   1743062
## 1586                         1957                        PZ3.P9936Le   1488751
## 1587                         1950                        PZ3.C2317Ng   1400838
## 1588                         1974               PZ4.L537InPG7158.L39   1006092
## 1589                         1973                                      1597268
## 1590                         1959                         PZ3.N121In    292275
## 1591                         1975           PZ3.W64897We7PS3545.I362   1500127
## 1592                         1961                         PZ4D924Gam   2053067
## 1593                         1958                       PZ3.C25884Fi    364850
## 1594                         1965                                       322486
## 1595                         1966                        PZ4.H6713Ei    236575
## 1596                         1965                        PZ4.S735Man    266246
## 1597                         1979                                      5222145
## 1598                         1973             PZ3.T6985De10PT3919.T7    632180
## 1599                         1963                     PL5089.L77S413    660407
## 1600                         1968                       PZ3.B4626An3    437387
## 1601                         1976                       RJ505.M54M31   2189443
## 1602                         1966                          RC463.M35   4803618
## 1603                         1977                                      7087922
## 1604                         1955                       PZ1.H298Mas2    296465
## 1605                         1970              PZ3.D646C16PS3507.I93     69043
## 1606                         1956                                       949858
## 1607                         1979                                     61542905
## 1608                         1956                                      3725961
## 1609                         1973                                     31990764
## 1610                         1954                                     12710401
## 1611                         1957                       PZ3.L846Ir17    710654
## 1612                         1952                                      6309053
## 1613                         1981                                      8298711
## 1614                         1981                                      7413999
## 1615                         1980                    PR9499.3.D353V4   8430450
## 1616                         1981                                      8242512
## 1617                         1981                                     59778516
## 1618                         1981                       MLCS 81/1608  10318096
## 1619                         1980                  PL65.K59K292 1980   7858619
## 1620                         1981                                     10457658
## 1621                         1981                  PR6029.D58A6 1981   8070321
## 1622                    1980-1982                  PR6003.U13A6 1980   7108546
## 1623                         1980                                      6964906
## 1624                         1980                                      6755380
## 1625                         1981                      PR9199.3.E5L8   7601997
## 1626                         1980                PT7287.G6P3413 1980   7296297
## 1627                         1972                                      3885958
## 1628                         1981                                      8414843
## 1629                         1981                  PL2658.E8C68 1981   8654769
## 1630                         1980                       MLCS 82/5132   7345211
## 1631                         1981                                      8322627
## 1632                         1979                                      7544940
## 1633                         1972            PZ4.W1264AiPT9876.33.A3    236021
## 1634                         1960                                      1090336
## 1635                         1978          PZ4.D547Han 1978PS3554.I3   3869423
## 1636                         1969             PZ4.M1732HuPS3563.A325      5691
## 1637                         1984                             PN4781  12469535
## 1638                         1982                                      9081311
## 1639                         1982                  PQ2423.S8A28 1982   9390157
## 1640                         1968                                     16535554
## 1641                         1982                                      8684190
## 1642                         1980                                      6491442
## 1643                         1982                                      9038585
## 1644                         1982               PQ3919.2.F6E613 1982  10276297
## 1645                         1982                                      9801830
## 1646                         1982                                     12482091
## 1647                         1982                                      8596976
## 1648                         1960                       PZ3.W555Et25   1359784
## 1649                         1956                        PZ3.W555Cu4   2395569
## 1650                         1957                                       344577
## 1651                         1961                                       747529
## 1652                         1961                                       630898
## 1653                         1979                         HV8078.G84   4591365
## 1654                         1978                       BQ9365.C4513   4383399
## 1655                         1964                                     10954560
## 1656                         1956                                      4116128
## 1657                         1968                  PG3456.A13Y3 1968    433795
## 1658                         1970            PZ3.B23965IcPQ2603.A435    161630
## 1659                         1955                     PS3525.A1435C5    288916
## 1660                         1966                                      1446584
## 1661                         1980                 PQ4866.A4U513 1980   6423359
## 1662                         1978                                      5096812
## 1663                         1968                         PZ4.O557Sh    437265
## 1664                         1970              PZ4.B9197ThPQ2662.U25     59794
## 1665                         1960                                     16614152
## 1666                         1973                                     66289104
## 1667                         1979          PZ3.C435Fo 1979PL2749.C8;   5220903
## 1668                         1974      PZ4.G515Bo3 vol. 3PQ4817.I814    858878
## 1669                         1955                         PZ4S335Sai    710552
## 1670                         1970                                       205946
## 1671                         1960                                     59001123
## 1672                         1982                  PS3576.E43E9 1982   8626907
## 1673                         1962                      PZ3.C13956No2  64069074
## 1674                         1965                                      1168537
## 1675                         1953                       PZ3.P7198Mo3  54536272
## 1676                         1974                                      2012909
## 1677                         1976          PZ3.A4372Dan10PR6001.L678   2237642
## 1678                         1977         PZ4.D36PL 1977PS3554.E4425   2614651
## 1679                         1955                        PZ3.B468C25   3780708
## 1680                         1968                                       644909
## 1681                         1952                                       269951
## 1682                         1975                PZ1.W6798NePS648.S3   1499735
## 1683                         1979                                      9687329
## 1684                         1980                       PK2098.S7A26   7273752
## 1685                         1963                                      2128300
## 1686                         1962                        PZ3.L9712Fu   2304834
## 1687                         1964                      DT500.B6 1964    421000
## 1688                         1962                                       274508
## 1689                         1981                 PQ2631.R63A72 1980   6915779
## 1690                         1981                 PQ2631.R63A72 1980   6915779
## 1691                         1964                       PZ3.W58469Bu    367855
## 1692                         1971                                      5908013
## 1693                         1958                         PZ4.D625Mi   4204345
## 1694                         1983                                      9513644
## 1695                         1981                    PJ7702.A34 1981   8051351
## 1696                         1963                                       990866
## 1697                         1983                 PQ1276.E75B62 1983  10021331
## 1698                         1983                 PR6015.O28S27 1983  10096881
## 1699                         1983                 PG3476.K67A23 1983  12666495
## 1700                         1983                                     10210616
## 1701                         1983             PT9876.21.I46D813 1983  17904015
## 1702                         1983               PR9199.3.B63P56 1983  10136688
## 1703                         1983                                     10030343
## 1704                         1983                PQ2639.R78P313 1983  10548201
## 1705                         1981                                      8607157
## 1706                         1983                PT6592.1.U3A23 1983  10697089
## 1707                         1983                 PS3569.H383U5 1983   9980965
## 1708                         1983                     PG3286.N5 1983  10470796
## 1709                         1983                PG3483.I44I213 1983  11030244
## 1710                         1972               PQ2625.A74B2913 1972    322693
## 1711                         1972                PZ4.O935MoPQ3989.O8    572500
## 1712                         1974          PZ4.M6954Ri 1974PQ2673.O3   1255550
## 1713                         1974             PZ4.V327Mi3PL4718.9.V3   2188793
## 1714                         1979                 PL4718.9.R249M3713   7101962
## 1715                         1978              PZ4.W444PrPR6073.E374   4135783
## 1716                         1961                                      2791516
## 1717                         1950       PZ3.T588A35PG3366.A6G3 1950a   1280117
## 1718                         1965                                       310185
## 1719                         1962                                      5256649
## 1720                         1979                        PZ4.L537Tal   5311059
## 1721                         1982                                      8475478
## 1722                         1958                PQ2613.I2I4813 1958   3122953
## 1723                         1963                                      6996666
## 1724                         1978        PZ4.S6596Sp 1978PR9405.9.S5   4192480
## 1725                         1975                                      1937343
## 1726                         1975            PZ4.S52667PalPJ5054.S33   1257011
## 1727                         1980                 PR6023.O35W39 1980   6625555
## 1728                         1963                                     15598849
## 1729                         1967                         PZ3.N166Ve    366523
## 1730                         1980        PZ3.B8597Go 1980PS3552.U35;   6278809
## 1731                         1973                                       890857
## 1732                         1960                                     55053611
## 1733                         1964             PZ3.C67984SgPQ2605.O28     18570
## 1734                         1960                      PZ3.C67984Cp2   2956815
## 1735                         1976            PZ3.N166Pai3PR9499.3.N3   1974242
## 1736                         1958                         PZ4.R633Vo   1952053
## 1737                         1953                                       665592
## 1738                         1969              PZ4.B8372InPS3552.R38    437263
## 1739                         1961                                      3360352
## 1740                         1958                        PZ3.C3983Ho    283643
## 1741                         1972              PZ3.S7737Sj3PK2098.S7    754327
## 1742                         1961                                      1117451
## 1743                         1962                                       892383
## 1744                         1979             PZ4.V87FaiPG3489.3.L29   4495342
## 1745                         1969              PZ3.S6166FamPJ5129.S5       516
## 1746                         1951                      PZ3.M22399Eac   3149338
## 1747                         1952                       PZ3.M59943Iv   1911752
## 1748                         1961                                      3139811
## 1749                         1968                  PL 2694S5 E5 1968   1026725
## 1750                         1970                                        97168
## 1751                         1972            PZ4.A549.TfPS3551.N378;    571726
## 1752                         1979         PZ4.A549Me 1979PS3551.N378   4665631
## 1753                         1972                                      2133448
## 1754                         1979         PZ4.W519Pr 1979PR9619.3.W4   4211240
## 1755                         1966              PZ3.M2784MiPJ7846.A46    641712
## 1756                         1959                                      4199220
## 1757                         1967                                       292078
## 1758                         1973                                       750287
## 1759                         1973              PZ3.G678Bo3PG3463.A15    533557
## 1760                         1980         PZ4.D756Mh 1980PR6054.R25;   6280596
## 1761                         1981                                      7158597
## 1762                         1974                                       914894
## 1763                         1960                                      9790194
## 1764                         1974               PZ3.D158Hi6PQ6607.A4    810300
## 1765                         1968                                       243487
## 1766                         1963                                     62306145
## 1767                         1971                                       837432
## 1768                         1955                         PZ4.G63Lo2   2830339
## 1769                         1952                PQ4847.I77G313 1952    345401
## 1770                         1954                        PZ7.S8148Wi    302310
## 1771                         1960                     LA2377 V52A313   1262845
## 1772                         1960                         PZ4.T655Le    312310
## 1773                         1971                                     68184173
## 1774                         1975            PZ1.H8428DePG5039.18.R2    902794
## 1775                         1968                     PG3366.A1 1968    319817
## 1776                         1965                       PQ4835.I7A26   1803632
## 1777                         1961                        PN6110.S4D4   1298124
## 1778                         1965                                      1235935
## 1779                         1975             PZ3.C3985Cj3PG3456.A15   2964305
## 1780                         1950                    D805.G3W55 1950   6290711
## 1781                         1976                                      3088860
## 1782                         1976                PZ4.G73YePJ5129.G68   2317950
## 1783                         1973             PZ4.G238Mag4PS3557.A72    754633
## 1784                         1963                                      1023409
## 1785                         1955                                     11359821
## 1786                         1955                        PZ4.C4558Ri   1464249
## 1787                         1960              PT2617.E825A6 E5 1960    326585
## 1788                         1981                 PS3563.U763R6 1981   7615449
## 1789                         1950                      PZ3.H981Bp 19    908757
## 1790                         1974                                      8037875
## 1791                         1950                        PZ3.N216Ko2   3959172
## 1792                         1962                       PA4231.A5C35   3143586
## 1793                         1982                  PS3523.E79A6 1982   8113731
## 1794                         1972                                       320720
## 1795                         1968                        PZ3.C334To3    441881
## 1796                         1965                                      8080358
## 1797                         1968               PZ3.C334MoPQ2605.E55     17678
## 1798                         1970             PZ3.A1576Mi7PR6001.B62     90757
## 1799                         1979             PZ4.D7615DrPS3554.R196   4775261
## 1800                         1975                                      2164189
## 1801                         1960              PQ 7297 F95R3E5 1960a    336336
## 1802                         1979            PZ4.V8955InPG3489.4.I53   4832065
## 1803                         1954                                      6821182
## 1804                         1962                       PT7287.V7E56   1172042
## 1805                         1951                         PZ3.D55M64    360292
## 1806                         1951             PL 3277 .E8 L73 1951Wi   1161084
## 1807                         1963                      PZ3.C8341Ol10   1334293
## 1808                         1968                         PZ4.W694Li    443248
## 1809                         1966                          PZ3.E34M7   8358671
## 1810                         1956                        PZ3.D814Be3    964544
## 1811                         1968                      PZ3.W67655Kn3    468355
## 1812                         1976                        PZ4.N1537Ad   2540567
## 1813                         1981                                      8196672
## 1814                         1966                        PQ4807.U9C3   5177815
## 1815                         1980         PZ4.L518Be 1980PS3562.E42;   5605039
## 1816                         1960                        PZ3.F5772Wh    168362
## 1817                         1956                                       709205
## 1818                         1972                                      3567529
## 1819                         1961                                      3759553
## 1820                         1966                                     54094652
## 1821                         1971                                      2145756
## 1822                         1965                                      1194110
## 1823          <estimate="[196-]">            PZ3.C3985She6PG3456.A15     75101
## 1824                         1952                      PT2617.O47A24    290939
## 1825                         1958                                      1171242
## 1826                         1977             PZ4.Y387Ear3PJ5054.Y42   2507675
## 1827                         1958                                     67893997
## 1828                         1965                        PZ4.D6849Co    719323
## 1829                         1961                                      3366514
## 1830                         1970                     PR6013.R441970  61578020
## 1831                         1960                 PG3476.L5V613 1960   1927188
## 1832                         1953                                     34045141
## 1833                    1970-1971                                     66268587
## 1834                         1979                                      5350424
## 1835                         1968                          PZ4.S69Fi    179180
## 1836                         1964                                      2978857
## 1837                         1973                     PZ3.M9317Tal12    851856
## 1838                         1972                PZ4.T394SiPS3570.H4    514475
## 1839                         1973                                     13084794
## 1840                         1970               PZ4.W638HuPS3573.I26     57369
## 1841                    1962-1997                         PS1850.F63    274693
## 1842                    1962-1997                         PS1850.F63    274693
## 1843                         1958                                      3358501
## 1844                         1972          PZ4.G2164Le3PQ8180.17.A73   1165018
## 1845                         1973               PZ4.S497PrPS3569.E84    688062
## 1846                         1971              PZ4.R53Sai5PR6068.I25    539126
## 1847                         1969             PZ3.K11Cas12PT2621.A26      7413
## 1848                         1976                       PK6501.H43G4   2681173
## 1849                         1975                                      3779565
## 1850                         1957                       PZ3.Y415 Fai    291487
## 1851                         1973               PZ4.B565BePS3552.E84    658920
## 1852                         1958                                     30242301
## 1853                         1958                                      6640665
## 1854                         1965                                      2055538
## 1855                         1972                      PR6023.E833S8    591115
## 1856                         1982                 PS3562.E866S2 1982   8033553
## 1857                         1972             PZ3.L5883FlPR6062.E948    659186
## 1858                         1962                        PZ3.L5883Te   1428443
## 1859                         1959                         PZ3.L578Ev   1160336
## 1860                         1951                      PZ3.L57715Li5    287958
## 1861                         1962                                     28038141
## 1862                         1974                          RC643.L86    874274
## 1863                         1966                        PZ3.D742G17    648876
## 1864                         1967                                     35311096
## 1865                         1971                       D764.S234513    142764
## 1866                         1955                                      8852563
## 1867                         1956                       PZ3.G6525Mal   1672941
## 1868                         1953                     PQ4835.A846L8x   1370630
## 1869                         1961                                      3138443
## 1870                         1971              PZ3.C4583Ah6PL2754.S5    207837
## 1871                         1980                                      6935916
## 1872                         1971                                     16719717
## 1873                         1973     PZ4.G6983Mad 1973PR9199.3.G654    702803
## 1874                         1978              PZ3.T75Ral 1978PR5684   4834805
## 1875                         1961                          PZ3.I25Tw    322207
## 1876                         1965                       PZ3.S9306Dau    317868
## 1877                         1969           PZ3.S9306CoPS3537.T92516      8260
## 1878                         1963                         PZ3.A898Pq    279750
## 1879                         1967                        PZ4.D6849Th   2648554
## 1880                         1975              PJ 5054.O98 L173 1975   2410526
## 1881                         1975           PZ3.H53985Pr7PS3558.I366   1418745
## 1882                         1963                                      1894665
## 1883                         1975            PZ3.M7962Lad3PQ4829.O62   1584665
## 1884                         1971              PZ4.K165AdPJ5054.K326    142778
## 1885                         1975                     DS777.55.Z4613   2525779
## 1886                         1981               PG7158.M553D613 1981   7273212
## 1887                         1956                   PG3326.P7E3 1956   2003421
## 1888                         1966                PR6003.E282M62 1966   1394618
## 1889                         1974           PZ3.H1884Cq6PS3515.A4347    980206
## 1890                         1974              PZ4.L965War3PS3562.U7    762620
## 1891                         1980             PZ4.D553InPS3554.I328;   6378191
## 1892                         1960                                       424376
## 1893                         1976              PZ4.W678WhPS3573.I434   1529187
## 1894                         1956                                      2669637
## 1895                         1975                                      1506304
## 1896                         1981                     PS3568.O317O37   7175210
## 1897                         1951                      PZ3.G3613Co10   1631731
## 1898                         1964                      PZ3.M3184Bu13    301493
## 1899                         1965                                      2460740
## 1900                         1962                                      5738572
## 1901                         1952                      PZ3.W8314Lo17    477480
## 1902                         1977       PZ4.B79968Sw 1977PS3552.R228   2874479
## 1903                         1979                                      6570642
## 1904                         1964                                       534449
## 1905                         1968                         PZ4.M945Ug    460157
## 1906                         1966                        PZ4.G6493Po    954216
## 1907                         1967                        PZ3.S426So7   2633894
## 1908                         1978                                      4003555
## 1909                         1964                                      2061819
## 1910                         1981                                     10780995
## 1911                         1966                     PZ3.P8758 Mai2    930354
## 1912                         1952                      PR6031.O867I5   2116356
## 1913                         1961                                      1619534
## 1914                         1953                                      2344301
## 1915                         1962                                      1515061
## 1916                         1963                       PZ3.P867Wh10    366546
## 1917                         1957                        PZ3.P8726Th   1495966
## 1918                         1950                                     15666710
## 1919                         1956                                      8563594
## 1920                         1959               PR9619.3.P75N48 1959   7215884
## 1921                         1963                                        36558
## 1922                         1959                                      6577738
## 1923                         1975                                      2662982
## 1924                         1969                PZ4.Q73PasPR6067.U5     18297
## 1925                         1954                                      7934202
## 1926                         1953                                       876400
## 1927                         1968                         PZ3.R116I5    383419
## 1928                         1981                       PR6056.R27R4   6734076
## 1929                         1972                  PZ3.R396Hi3PR3664    631295
## 1930                         1981                                      8338982
## 1931                         1978              PZ4.R4784HoPS3568.H64   3312357
## 1932                         1956                         PZ4.J767Wo   9315431
## 1933                         1956                                      5701535
## 1934                         1966               PZ4.R53So5PR6068.I25     18204
## 1935                         1953                         PZ3.R417Li    286003
## 1936                         1976             PZ4.R583DarPS3568.I59;   2353958
## 1937                         1967                       PZ4.R64448Ri    436958
## 1938                         1975            PZ4.W95167RoPS3573.R539   1137910
## 1939                         1969              PZ4.W9517ThPS3573.R54     13185
## 1940                         1960                        PZ3.E4558Wi    779770
## 1941                         1969             PZ4.E4645EdPS3555.L593     33489
## 1942                         1958                        PZ4.E455Par    744588
## 1943                         1961                         PZ4.E455Am    966898
## 1944                         1968                                      6114282
## 1945                         1971                PZ4.E44DiPS3555.L47    154584
## 1946                         1980          PZ4.E44St 1980PS3555.L47;   6331339
## 1947                         1957                                PZ3   3635301
## 1948                         1976                                      2730866
## 1949                         1975           PZ4.E4645Go3PR9619.3.E44   1055373
## 1950                         1973                                     28993368
## 1951                         1974              PZ4.R649PrPS3568.O248    907813
## 1952                         1958                        PZ3.R644Ni2   2580036
## 1953                         1968                                        43179
## 1954                         1978                                      3380148
## 1955                         1972              PZ4.R728CoPS3568.O456    363835
## 1956                         1969              PZ4.R834NiPS3568.O848   1401258
## 1957                         1973            PZ4.R8744CrPS3568.O8895    667095
## 1958                         1959                      PS3535.O845D4   3138943
## 1959                         1971                                       108405
## 1960                         1961                     PS3535.O765S45   1451869
## 1961                         1965                                       400691
## 1962                         1978              PZ4.R8913FavPR6068.U2   4593405
## 1963                         1955                          PZ3.R82So    271724
## 1964                         1950                                       930085
## 1965                         1969              PZ4.R9918ClPR6068.Y35    115125
## 1966                         1979              PZ4.R9663PrPS3568.U77   5101845
## 1967                         1971                                       800409
## 1968                         1957                         PZ3.S356Sm   1446832
## 1969                         1965                       PS3569.C54N5    286043
## 1970                         1950                       PS3537.C56G4    288014
## 1971                         1960                                      1379764
## 1972                         1969                                        29441
## 1973                         1955                      PS3537.A832F3   1721821
## 1974                         1967                        PZ4.R957War    851537
## 1975                         1959                                      1691736
## 1976                         1982                  PS2774.S2A83 1982   8050632
## 1977                         1953                      PS3537.A826L3   1578789
## 1978                         1969             PZ3.S2278Ve5PR6037.A75     60769
## 1979                         1960                      PS3537A667S65    529395
## 1980                         1968                                      3307836
## 1981                         1971          PZ4.B6658Fr3PT8176.12.O34    123536
## 1982                         1950                                      3343451
## 1983                         1979           PZ4.G23117VlPS3557.A712;   6050841
## 1984                         1971                      PZ3.L56684Br3    128743
## 1985                         1966                                       341850
## 1986                         1969            PZ3.B72453IcPS3503.R167     44828
## 1987                         1966                                       296343
## 1988                         1970               PZ4.L537SoPG7158.L39    105763
## 1989                         1978                        PZ4.B6713Al   3447191
## 1990                         1969                                       971071
## 1991                         1964                      CT275.S4286A3   1397008
## 1992                         1967                                       861301
## 1993                         1978         PZ4.T342Man 1978PS3570.E95   4493206
## 1994                         1954                        PZ3.M498Cp3    276051
## 1995                         1959                       PL832.A9S513    325399
## 1996                         1972                        RJ506.A9R68    663555
## 1997                         1964                        PZ3.C3937Be   8994895
## 1998                         1957                                     10945319
## 1999                         1977                                      3689735
## 2000                         1981                                      8377171
## 2001                         1969               PZ4.F494BuPR6056.I48      5402
## 2002                         1965                         PZ4.F45Bac    284281
## 2003                         1963                          PZ4.F45Se    986367
## 2004                         1982                                      9732747
## 2005                         1973              PZ3.F5772IpPR6011.I88    868615
## 2006                         1974        PZ3.F6153Cu 1974PS3511.L285    902951
## 2007                         1964                                      1871792
## 2008                         1959                        PZ3.F272Man    282966
## 2009                         1954                                      1881673
## 2010                         1968                                     66288598
## 2011                         1956                         PZ3.F265Ss    968237
## 2012                         1973               PZ3.F272FlPS3511.A86    578849
## 2013                         1981                  PS3511.A86S4 1981   6708955
## 2014                         1958                                      5318953
## 2015                         1957                                      2784922
## 2016                         1975              PZ4.F267Sq3PS3556.A97   1111271
## 2017                         1952                        PZ.E4777Pas   1418140
## 2018                         1950                        PZ3.E4775To   5092767
## 2019                         1968                         PZ4.E475Li   1331661
## 2020                         1971              PZ4.E4695AlPS3555.L62    125247
## 2021                         1967                         PZ4.E475Tw    753774
## 2022                         1980            PZ4.E529SuPR9619.3.E47;   6604575
## 2023                         1968                                      3633715
## 2024                         1966                        PS3555.N7D6   1348806
## 2025                         1961                                      3579948
## 2026                         1965                      PT2685.036G43    606881
## 2027                         1976                                      3737924
## 2028                         1957                          PZ4.J77So    285327
## 2029                         1953                                      1358490
## 2030                         1974                                      1255309
## 2031                         1970                 PZ4.B6713ActPT2603     88605
## 2032                         1960                         PZ3.M189De    743021
## 2033                         1959                      PZ4.S5723Sat2   1325273
## 2034                         1963                       PZ3.W61475Se   1280778
## 2035                         1966                    PQ2362.A15 1966   1447936
## 2036                         1955                                      1192220
## 2037                         1970         PZ4.S61953LauPT9876.29.J63     57283
## 2038                         1965                                      5840167
## 2039                         1961                                      9531836
## 2040                         1970              PZ4.B5248GarPT2662.E7     93069
## 2041                         1967                        DA670.F33M3   1490902
## 2042                         1952                       PZ3.U568Mas3    296334
## 2043                         1970                                      6646180
## 2044                         1963                                      1917816
## 2045                         1968                        PZ4.M6815Un    458297
## 2046                         1974             PZ4.W86TuPT5881.33.O38    922684
## 2047                         1958                        PZ3.R2913Kk    228783
## 2048                         1963                                       317119
## 2049                         1967                        D804.G4S713    394953
## 2050                         1979            PZ4.V155StPQ7798.32.A48   4593230
## 2051                         1950                                     67315184
## 2052                         1955                                       899751
## 2053                         1956                        PZ3.G678Fo6    586209
## 2054         <estimate="[195-?]">                                     52296521
## 2055                         1950                                     13707363
## 2056                         1954                                     38149097
## 2057                         1956                                      6535277
## 2058                    1965-1980                     PG3456.A1 1965    185344
## 2059                         1962            PZ3.T844F22PG3421.O8P88   1033611
## 2060                         1951                                     37035688
## 2061                         1958                                     39169712
## 2062                         1957                          RD118.B28    287820
## 2063                         1973            PZ3.F8263Wan8PQ2611.O85    591914
## 2064                         1958                                      1076845
## 2065                         1971                                       604113
## 2066                         1958                         PZ3.N166Gu   2115747
## 2067                         1965                         PZ3.H57Pi4    848262
## 2068                         1968             PZ4.O3515LanPR6065.G45    105450
## 2069                         1972          PZ3.C1574Hap3PQ2605.A3734    241445
## 2070                         1979                  PQ1805.L5A72 1979   4883515
## 2071                         1981                PJ5054.O9A8713 1981   6982264
## 2072                         1953                                      1934256
## 2073                         1971               PZ4.C963TiPS3553.U32    106985
## 2074                         1963                PR 6069 H45H12 1963   1381147
## 2075                         1970                         GV1835.L44     66399
## 2076                         1976                                      2116881
## 2077                         1981         PZ3.B74454ThPT2603.R397749  59778516
## 2078                         1963                        PZ3.F7518Fg    362312
## 2079                         1962                  PR6011.O53A6 1971   1159005
## 2080                         1980             PZ4.F6895OnPS3556.O64;   6356428
## 2081                         1967                         PZ4.F648No   1129712
## 2082                         1951                      PZ3.F62934Si2   1416040
## 2083                         1951                       PZ3.F6272For   5529403
## 2084                         1978              PZ4.F587BePR6056.L38;   4549082
## 2085                         1977                                      4109177
## 2086                         1980       PZ4.F7895No 1980PR6056.O854;   5555649
## 2087                         1960                        PZ4.F812Ow3    498045
## 2088                         1963                         PZ4.F812Re    619090
## 2089                         1963                         PZ4.F812Sn    619099
## 2090                         1979        PZ4.F7335Me 1979PR6056.O695   4926133
## 2091                         1971            PZ4.F7349DayPR6056.O699    156908
## 2092                         1977             PZ4.F7867JiPS3556.O847   2966210
## 2093                         1963                        PZ3.F9544Co    996616
## 2094                         1972               PZ4.F956CasPR9369.F8    641455
## 2095                         1962                         PZ4.F977Tr   1105598
## 2096                         1973           PZ3.G1336Je3PS3557.A4116    636491
## 2097                         1981                PS3557.A712A89 1981   6649038
## 2098                         1972               PZ3.G139Jo7PR6013.A5    540934
## 2099                         1979         PZ4.G2312No 1979PR6057.A63   4834754
## 2100                         1970                                        96332
## 2101                         1968             PZ4.G1513FamPR6057.A38     38118
## 2102                         1982                                      8132093
## 2103                         1952                                      5844938
## 2104                         1970            PZ3.F8498Ci8PS3511.R258     78871
## 2105                    1964-1967                        PZ3.F8513Cl  17565032
## 2106                         1961                       PZ3.F8513Ro2   1442456
## 2107                         1976                                      2890312
## 2108                         1981                 PS3556.R367P6 1981   7274353
## 2109                         1969                     PS1705.A2 1969     22060
## 2110                         1964                        PZ4.F854Val   1691326
## 2111                         1964                        PZ4.F8988Mo    582860
## 2112                         1966                        PZ4.F8988BL   1611127
## 2113                         1956                         PZ3.F895Le   1434836
## 2114                         1965                        PZ4.G664Rab   1098690
## 2115                         1980                       PR6057.O67A8   7174019
## 2116                         1963                        PZ3.G6525O1    284653
## 2117                         1975             PZ4.G6684HamPS3557.O75   1502306
## 2118                         1960                        PZ4.G659Par   1673143
## 2119                         1965                          PZ4.G66No    364544
## 2120                         1952                          PZ4.G66So    924669
## 2121                         1957                      PS3569.M443T5   8110680
## 2122                         1953                        PZ3.G6172Li   1745802
## 2123                         1951                      PZ3.T21373Gam   1465765
## 2124                         1966                        PZ3.G1863Ul   2296064
## 2125                         1959                         PZ4.G238Fi   1437055
## 2126                         1972                                       516827
## 2127                         1973             PZ4.G2465HePR6057.A724    976370
## 2128                         1959                        PZ3.G1863Ne   3592525
## 2129                         1975                                      1723361
## 2130                         1968             PZ3.G1848CabPR6057.A67     43408
## 2131                         1962                        PZ3.G1848Si   2460484
## 2132                         1969              PZ3.H4525G5PT2617.E85      4885
## 2133                         1968                                       629740
## 2134                         1969             PZ3.H4525Pe5PT2617.E85     16847
## 2135                         1980               PZ4.T394WoPS3570.H4;   6087513
## 2136                         1961                                      2791516
## 2137                         1975                         PS228.M9H8   1056976
## 2138                         1983                   PS3570.H4L6 1983   8785973
## 2139                         1972             PZ3.H258Pe3PR6015.A674    220578
## 2140                         1977                                      2818666
## 2141                         1965                                      1303772
## 2142                         1970                  PZ3.T844Hp9PG3421    534186
## 2143                         1955                                     67315218
## 2144                         1957                                      1320490
## 2145                         1956                                     43491895
## 2146                         1963                       PZ4.M945El 2   1448603
## 2147                         1971                                       183426
## 2148                         1958                                      5686885
## 2149                         1970                                      2325768
## 2150                         1954                                     33411056
## 2151                         1964                                      1705566
## 2152                         1975                                      1705191
## 2153                         1981                      PG7158.L39A24   7177024
## 2154                         1967            PZ4.G6493Co3PG7158.G669     54241
## 2155                         1967                          PZ4.D68Ti    956779
## 2156                         1954                                      2561971
## 2157                         1960          PZ3.G5875Ob 1979PG3337.G6   1043911
## 2158                         1959                       PG3337 P5T93   1450699
## 2159                         1974            PZ3.H2693Go20PG5038.H28    698763
## 2160                         1978                                      6994334
## 2161                         1970             PZ4.K649ShPG5039.21.L5    163862
## 2162                         1977                                     59054837
## 2163                         1978       PZ4.S919De 1978PG3476.S78835   3396784
## 2164                         1965                                       321163
## 2165                         1979                                      4679098
## 2166                         1976               PZ1.A619 1976PG3286;   3185978
## 2167                         1977                                      2963017
## 2168                         1955                       PZ3.G2125Sar  37233592
## 2169                         1978    PZ4.G28913Eag 1978PR9199.3.G415   4056032
## 2170                         1979                                      8093877
## 2171                    1970-1971                                     66268587
## 2172                    1970-1971                                     66268587
## 2173                         1967                          PZ4.G43Mu   2008126
## 2174                         1976           PZ3.G35373ShtPR6013.T254   2426395
## 2175                         1974              PZ4.G55RePR9199.3.G57    886400
## 2176                         1970                       PR6057.O35N4    210948
## 2177                         1956                                      9284639
## 2178                         1959                         PZ4.G618Op    169568
## 2179                         1963                        PZ4.G6167Sc   1465562
## 2180                         1956                          PZ4.G63Pi   1573979
## 2181                         1974             PZ4.G634ManPS3513.O337    960099
## 2182                         1979                                      5737725
## 2183                         1965                        PZ3.G3733Am   1445015
## 2184                         1956                      PZ4.G4829Van2   1657238
## 2185                         1963                                      3451393
## 2186                         1963                                      6154217
## 2187                         1974               PZ4.G546CoPR6057.L28   3103360
## 2188                         1961                                      4814775
## 2189                         1978                                      4670481
## 2190                         1974                        PZ3.G399Way    745932
## 2191                         1964                                      4836732
## 2192                         1970                        PL2658.E8J4     98140
## 2193                         1958                         PZ4.Y385Sc    752437
## 2194                         1958                        PL2780.F4F2   5235173
## 2195                         1980                                      7398398
## 2196                         1982                PQ2476.V4E9213 1982   8627321
## 2197                         1968                        PZ3.R118De7    461542
## 2198                         1962                                      2227182
## 2199                         1978       PZ4.A549Wp vol. 4PS3551.N378   3627721
## 2200                         1978       PZ4.A549Wp vol. 7PS3551.N378   3627593
## 2201                         1978         PZ4.A549Or 1978PS3551.N378   3627722
## 2202                         1979        PZ4.D6849Ob 1979PQ8097.D617   5352687
## 2203                         1969               PZ4.B856TrPS3552.R47     33480
## 2204                         1959                          DF850.A76    634971
## 2205                         1967                                      2502898
## 2206                         1970               PZ4.C963HoPS3553.U32     49625
## 2207                         1950                                      5876752
## 2208                         1980        PZ3.G4204Ch 1980PS1744.G57;   6330761
## 2209                         1954                                PZ3    759738
## 2210                         1956                   PA4025.A5P6 1956  22160899
## 2211                         1953                                       920083
## 2212                         1973          PZ3.C1574Hap4PQ2605.A3734    409719
## 2213                         1955                                      3654216
## 2214                         1956                        PZ3.M6878So    169586
## 2215                         1972             PZ4.L643Fu3PQ2672.E823   2722426
## 2216                         1975              PZ4.J354Su3PT9875.J37   1056979
## 2217                         1979                                     39302098
## 2218                         1975                  PZ1.S2876FoPT1327   1176796
## 2219                         1967                      PG3476.O37Z23    606771
## 2220                         1968                                       448605
## 2221                         1979           PZ3.A999Th 1979PQ7297.A9   5356043
## 2222                         1982                                      8843870
## 2223                         1954                        PZ4.B2635Br   1208491
## 2224                         1963                                      2340373
## 2225                         1968                                       439665
## 2226                         1976                PZ4.U76TrPS3541.R46   1973841
## 2227                         1963               PL 833 I7U89 E5 1963   1448129
## 2228                         1980               PS3523.E4583S58 1980   6915459
## 2229                         1957                 PG3337.L4G413 1957   5069102
## 2230                         1974                                     40320631
## 2231                         1963                                      2029763
## 2232                         1975               PZ4.B453Go3PT6405.B6   1551777
## 2233                         1961                                      2791516
## 2234                         1976                                      2153338
## 2235                         1975               PZ4.T839ChPS3570.R55   1119648
## 2236                         1962                        PZ3.R2913Bu    368388
## 2237                         1971             PZ4.B826AbPS3503.R2736    132408
## 2238                         1958                  PR6019.A67O5 1958   3084905
## 2239                         1972             PZ4.C9175CarPS3553.R46    222054
## 2240                         1952                         PZ3.A48Ep3   1178306
## 2241                         1972              PZ4.T8163BalPR6070.R4    524984
## 2242                         1971             PZ3.C67984OvPQ2605.O28    201333
## 2243                         1960                       PQ1553.C3A25   8991754
## 2244                         1968                                         4118
## 2245                         1971                                       356116
## 2246                         1963                                     10499449
## 2247                         1981                 PR6029.D58A15 1981   7283687
## 2248                         1954                        PZ3.S1274An  66126112
## 2249                         1974               PK6451.B53D3213 1974    867989
## 2250                         1978             PZ4.A5488FiPS3551.N377   4135805
## 2251                         1959                                      1191899
## 2252                         1970                  PZ3.K282Pe5PT2374    110266
## 2253                         1978       PZ4.J6696Ly 1978PS3560.O3746   3844058
## 2254                         1957                       PQ2649.O8C63    343959
## 2255                         1965              PC 839 S12B19 E5 1965   2862519
## 2256                         1964                                       296303
## 2257                         1973                  PZ3.A93Wa13PR4034    570437
## 2258                         1965                         PZ4.L575Su   1028298
## 2259                         1956                                       279803
## 2260                         1980      PZ3.H1467War 1980PS3558.A373;   5751135
## 2261                         1981                                      9133213
## 2262                         1982                PS3568.O453S55 1982   8283547
## 2263                         1967                        PZ3.M2815Wh    374717
## 2264                         1961                                      2791516
## 2265                         1961                                      2791516
## 2266                         1980                        PR6070.R4O8   6607785
## 2267                         1966                       PZ4.T8163Lo2  59015246
## 2268                         1955                                       573812
## 2269                         1976                PZ4.D794GoPS3554.R8   2020164
## 2270                         1964                                      1849766
## 2271                    1980-1982                  PR6003.U13A6 1980   7108546
## 2272                         1976               PZ3.P214So3PQ6629.A7   1532046
## 2273                         1979                PQ7389.C263S52 1979   4596677
## 2274                         1958                                      1222073
## 2275                         1971             PZ3.M7962ParPQ4829.O62   1164806
## 2276                         1961                                     67894383
## 2277                         1968           PZ4.S6193Ch5PL4718.9.S57    157212
## 2278                         1967                     PQ2683.I32P613    616462
## 2279                         1958                                      2534059
## 2280                         1962               PT 9875 L2A7 E5 1962    296371
## 2281                         1972              PZ3.U88TalPG3476.U675    636982
## 2282                         1982                                      8309889
## 2283                         1966                       PR6009.K94L6   3573910
## 2284                         1962            PZ3.Q397ScPQ6422.E51H27    264544
## 2285                         1983                PR9369.3.B45D4 1983   9927685
## 2286                         1983                  PR6052.R8C78 1983  11541848
## 2287                    1979-1983              PZ3.T75An 1979PR5684;   5333975
## 2288                         1969                                        53811
## 2289                         1979       PZ3.M3213Bat 1979PR6063.A384   4497317
## 2290                         1965                        PR6025.A5F7   1269385
## 2291                         1974                 PZ3.Y75Lo5PL842.O5   3207978
## 2292                         1952                         PZ3.Q313Is   1896945
## 2293                         1967                       PZ3.A6483Wan    956764
## 2294                         1982                                     16605322
## 2295                         1960                 PZ1.S8893PL2658.E8   1665497
## 2296                         1963                        PZ3.L846Ch8    288571
## 2297                         1963                         PZ3.P416Mi   3969299
## 2298                         1971                                     67406571
## 2299                         1975                                      2031382
## 2300                         1950                                     66283841
## 2301                         1967             PZ1.S493 1967PG5145.E8    204528
## 2302                         1984               PS3503.E4488H56 1984  10506529
## 2303                         1974             PZ3.N617Ci4PS3527.I865   1210766
## 2304                         1971                                       127848
## 2305                         1973               PZ4.A843EyPQ7499.A75    495210
## 2306                         1982                     PS3573.I4496T3   7653648
## 2307                         1956                        PZ4.R726Lan   1613515
## 2308                         1967                                       838728
## 2309                         1959                                      1040202
## 2310                         1955                                      3728620
## 2311                         1966                   PC839.G5V52 1966    312528
## 2312                         1973              PZ3.R662Ve7PQ2635.O52   3090955
## 2313                         1959                                     11008525
## 2314                         1974                  PZ4.I6HePQ2617.O6   1037623
## 2315                         1976                       PN1997.A4813   2087910
## 2316                         1954                                      1545097
## 2317                         1973                                      2009411
## 2318                         1979        PZ3.A478Ti 1979PQ9697.A647;   4498341
## 2319                         1968                 PZ4.J6St3PR6060.H3    437845
## 2320                         1971              PZ4.A549OpPS3551.N378    139700
## 2321                         1961                                       744446
## 2322                         1969           PZ4.R117Man3PT6592.28.A2      5822
## 2323                         1981                 PL2804.C5L613 1981   7554885
## 2324                         1968                  PL2658.E8W28 1968    233339
## 2325                         1975               PZ1.W22St10PL2658.E8   1622170
## 2326                         1974             PZ3.H8592Vi6PL2765.I34    922642
## 2327                         1958                                      9150913
## 2328                         1954                                     16212815
## 2329                         1965                        PZ3.D9327Fo   5855994
## 2330                         1970                                      2327918
## 2331                         1965                                       343866
## 2332                         1955                                      8852563
## 2333                         1955                  PQ4272.E5A39 1955   1382734
## 2334                         1977         PZ3.S5892Ir 1977PQ2637.I53   3120804
## 2335                         1968                                       441294
## 2336                         1975             PZ3.S5892Bh3PQ2637.I53   1056930
## 2337                         1971                                      2011903
## 2338                         1982                                     62288210
## 2339                         1983                 PT2603.R397A2 1982  66267152
## 2340                         1960                                     10211145
## 2341                         1978                                      3433403
## 2342                         1983                PR9499.3.N3T54 1983   9066410
## 2343                         1966                                      2502616
## 2344                         1970                                       103505
## 2345                         1963                                     67412200
## 2346                         1981                                     60044678
## 2347                         1963                PT9875.S6D613x 1963   2193954
## 2348                         1965                         PZ4.K237Sm    330114
## 2349                         1961                      BS551.D4 1961    381976
## 2350                         1962                                      1303560
## 2351                         1970              PZ3.G3613Im7PQ2613.I2     66083
## 2352                         1966                        PZ4.W1814Ju    273394
## 2353                         1957                                      3136211
## 2354                         1978              PZ4.C62FamPS3553.L385   3892266
## 2355                         1978                                      3516537
## 2356                         1977            PZ4.T7927StPQ3919.2.T73   4859344
## 2357                         1953                                      1618632
## 2358                         1959                                     25912522
## 2359                         1968            PZ3.M2989MamPQ2625.A716     36747
## 2360                         1960                         PZ3.S247Pl   1450888
## 2361                         1982                PS3554.E4425N3 1982   8474207
## 2362                         1976                                      3034413
## 2363                         1970              PZ3.C1695Mo6PG5038.C3     61110
## 2364                         1975           PZ4.B6713Ab 4PT2603.O394   1659561
## 2365                         1982                 PS3554.U493D8 1982   7977778
## 2366                         1963                                       250817
## 2367                         1977                                      2984410
## 2368                         1973                   PQ6555.F7E5 1973   1288956
## 2369                         1971                                      1912408
## 2370                         1966                                      3106006
## 2371                         1961                                      2791516
## 2372                         1958                                       321288
## 2373                         1968              PZ4.A515No5PJ5054.A65    688168
## 2374                         1955                    PT1856.A91 1955    883607
## 2375                         1981                PQ2683.I32T413 1981   6942955
## 2376                         1952                         PZ3.R118Cm   4710566
## 2377                         1963                                      1014970
## 2378                         1957                  PZ3.G558Es5PG3333     19700
## 2379                         1978               PZ3.A898CoPS3501.U25   3843151
## 2380                         1970                          Z682.5.D8    150168
## 2381                         1971                                      1151646
## 2382                         1976             PZ3.O9445Xal3PQ3989.O8   2589949
## 2383                         1973               PZ3.U543Mi5PQ6639.N3    650660
## 2384                         1965               PZ4.V948Go4PS3572.O5    506628
## 2385                         1967                                      1027124
## 2386                         1972             PZ4.L769FamPQ9697.L585    323783
## 2387                         1979          PZ3.M4375Wo 1978PR4987.M7   4211089
## 2388                         1974          PZ3.B64755Sad4PT2603.O725    866767
## 2389                         1965                     PS3537.H384V65    287559
## 2390                         1968                                       321122
## 2391                         1968                                       438162
## 2392                         1957                        PZ3.S246Pap    486278
## 2393                         1960                        D810.J4M493   3519459
## 2394                         1974                      PG3476.T85A27   1057579
## 2395                         1977        PZ3.P1978Sp 1977PG3476.P255   3205569
## 2396                         1980               PS3558.O3485C68 1980   6222197
## 2397                         1956                         PZ4.D393 I   3736629
## 2398                         1963                                      1698949
## 2399                         1971              PZ4.C348ThPQ4809.A682   2656736
## 2400                         1956                                      2883011
## 2401                         1970              PZ3.A798Tal5PJ5129.A8     97997
## 2402                         1969                                          625
## 2403                         1950                                      2815205
## 2404                         1982                  PS3555.L62S7 1982   8825918
## 2405                         1967                                       229891
## 2406                         1957                                       276631
## 2407                         1959                         PZ4.R935Pe    518428
## 2408                         1975                     PL4718.9.S62T6   3479571
## 2409                         1980                    PL4718.9.P6V513   8765143
## 2410                         1977              PZ3.Q325Su4PQ2633.U43   2542558
## 2411                         1975                      PL4718.9.V3M3   3609806
## 2412                         1972                                       261510
## 2413                         1951                   PS3545.Y6D5 1951    291337
## 2414                         1979        PZ4.D275Th 1979PR9510.9.D35   4495496
## 2415                         1981                      PS3551.N365C3   6815237
## 2416                         1960                         PZ3.A535OL  66139085
## 2417                         1976               PZ4.D615Th6PS3554.I8   2376702
## 2418                         1976                     PL4718.9.S62E6   3543935
## 2419                         1974             PZ4.R1283ZePL4718.9.R2   2149670
## 2420                         1974           PZ4.S6193Ir3PL4718.9.S57   2149685
## 2421                         1978                                      4435203
## 2422                         1970           PZ3.L49955InPQ2623.E3657     97809
## 2423                         1975                                      2004899
## 2424                         1982               PQ2603.E362Q313 1982   8473991
## 2425                         1982                     PT2374.A2 1982   8113791
## 2426                         1973         PZ4.S61953Lo3PT9876.29.J63    632362
## 2427                         1972          PZ4.S61953AbPT9876.29.J63    314294
## 2428                         1977                                      3943546
## 2429                         1965                                      1162981
## 2430                         1973                                     31026547
## 2431                         1956                                      2547893
## 2432                         1958                                     11482840
## 2433                         1964                                       296303
## 2434                         1972                   F2728.G513 1972b    520956
## 2435                         1961                                      1172496
## 2436                         1962         PD25.N6 no.33PT1759.R4S413   4124266
## 2437                         1956                        PZ3.H4525Jo   3066743
## 2438                         1980                                      6676721
## 2439                         1968                           PZ4.Q9He    443980
## 2440                         1971              PZ4.Y387Th4PJ5054.Y42    157012
## 2441                         1982                     PG3326.B4 1982   8729232
## 2442                         1977                                      2645396
## 2443                         1961                                      5970637
## 2444                         1950                                     10589997
## 2445                         1958                                       321000
## 2446                         1974               PZ3.K282Ba5PT2374.F3    897667
## 2447                         1967                        PZ3.L492Co6    715592
## 2448                         1968                       PZ3.D4998Cat    449740
## 2449                         1968                        PZ3.A396Nc5    431611
## 2450                         1967                       PZ3.S9179Mad   1024385
## 2451                         1969                PZ3.K1775HoPL832.A8     23608
## 2452                         1963                        PZ3.A2878He    335866
## 2453                         1966                        PZ4.R633Mai   1164504
## 2454                         1957                         PZ3.P867At    371487
## 2455                         1964                                       598816
## 2456                         1981                                      7472630
## 2457                         1960                                      7013954
## 2458                         1960                                      7013954
## 2459                         1982                                      8884110
## 2460                         1973                    BF1411.H25 1973    683094
## 2461                         1965                        PZ3.M8346On    289427
## 2462                         1958                      PZ3.H87313Tam    581679
## 2463                         1956                     PG 3456M8 1956   1162686
## 2464                         1963                         PZ4.S962Sw    568784
## 2465                         1975                                      3103877
## 2466                         1970                 PR6003.E282M6 1970    138103
## 2467                         1982                  PT2361.E4A14 1982   8437591
## 2468                         1971                                       292202
## 2469                         1968                        PZ4.C5559Po    413595
## 2470                         1983                                     10789667
## 2471                         1966                                       424253
## 2472                         1971                        PJ7694.E8M6   4437411
## 2473                         1960                                       295840
## 2474                         1978            PZ3.H1467BadPS3558.A373   3516690
## 2475                         1951                         PZ3.M713Em   1894114
## 2476                         1964                      PQ4835.I7F813   1379034
## 2477                         1965                                      4354762
## 2478                         1982               PJ5054.T317R413 1982   8050475
## 2479                         1959                       PZ1.F3813St3    331100
## 2480                         1959                  PQ4835.I7A26 1959   1214688
## 2481                         1960                        PT1525.A425   1372338
## 2482                         1954                       PT9875.M5I6x   2779048
## 2483                         1974                  PZ4.I6HePQ2617.O6   1037623
## 2484                         1972               PZ3.A45Sar8PT9729.G3    579847
## 2485                         1975                                      2932428
## 2486                         1956                  PS3507.R55A6 1956  62415010
## 2487                         1951           PZ3.W16986WanPH355.W3M5E   1392455
## 2488                         1953          PZ3.W16986DarPH355.W3J613   1488283
## 2489                         1967                                       303396
## 2490                         1958              PZ4.H678Ei4PG7158.H55    322290
## 2491                         1960                         PZ4.H678Ne   1675427
## 2492                         1971           PZ4.C7775Kr3PR6053.O5469    152090
## 2493                         1978                                      5337651
## 2494                         1968                                      7983140
## 2495                         1975                                      2277367
## 2496                         1955                       PZ3.O1285Wal   1488042
## 2497                         1955                                      1497588
## 2498                         1969                                         4897
## 2499                         1955                        PZ4.B6713Ac   1186713
## 2500                         1967                 PQ9261.E3C422 1967    943073
## 2501                         1972              PZ4.M8185AlPR6063.O59    633118
## 2502                         1969            PZ3.T22113DauPJ5054.T36    107169
## 2503                         1963                                      8633118
## 2504                         1917                                     23344714
## 2505                         1960                                       296026
## 2506                         1977               PZ4.D615EarPS3554.I8   3157155
## 2507                         1970             PZ4.B6713ChPT2603.O394     50773
## 2508                         1980               PZ4.V78SnPS3572.I53;   5412267
## 2509                         1982                                      7977837
## 2510                         1980          PZ4.M956Tw 1980PT5860.M85   6249822
## 2511                         1982              PJ5054.M352A8813 1982   7573472
## 2512                         1955                                      3728620
## 2513                         1967                       PZ3.F7347Ef2   2720257
## 2514                         1983                                     10059981
## 2515                         1971          PZ3.W382332Gar8PS3157.W62    159248
## 2516                         1950                        PZ3.F618M22   3270759
## 2517                         1950                        PZ3.D742C15  18751390
## 2518                         1974           PZ4.B6372Tr3PR9199.3.B48    902388
## 2519                         1974                  PQ1496.M75E5 1974    740952
## 2520                         1960                     PT9875.M55N913    560492
## 2521                         1951                                      3235398
## 2522                         1968                                     67226943
## 2523                         1982                 PL812.A8W313 1982b   7945287
## 2524                         1981                 PS3552.R226C5 1981   7177101
## 2525                         1959                                      1216957
## 2526                         1982                    PT8721.S54 1982   8195992
## 2527                         1979                                      5316942
## 2528                         1958                                      3283357
## 2529                         1972             PZ3.S5892Di4PQ2637.I53    393451
## 2530                         1968              PZ3.S5892NfPQ2637.I53     40490
## 2531                         1964                        PZ3.S5892Bf    424830
## 2532                         1964                        PZ3.S5892Fk    762115
## 2533                         1975             PZ3.S5892Ho3PQ2637.I53   1273609
## 2534                         1952                        PZ3.S7512Ab   1862580
## 2535                         1976                 PZ3.F7347Je4PT1863   2372916
## 2536                         1961                                      7636067
## 2537                         1979          PZ4.D324Sa 1979PR6054.E37   4135551
## 2538                         1975                                      1364099
## 2539                         1976              PZ3.S557Fam3PL816.H55   2753177
## 2540                         1953                                      1194555
## 2541                         1956                                      1980430
## 2542                         1963                                      9456232
## 2543                         1969                                     13002911
## 2544                         1978              PZ4.V652 RePQ9909.V47   4466228
## 2545                         1962                         PZ4.C616ki    943494
## 2546                         1969              PZ3.B8199Cl8PS1139.B9    234078
## 2547                         1954                       PT2621.A26D4    961255
## 2548                         1964                         PZ4.G775Ke    284645
## 2549                         1978                                      3345464
## 2550                         1970                PS3525.O7475A6 1970     50536
## 2551                         1954                        PZ3.S7512Jo   1513796
## 2552                                                                    849611
## 2553                         1967                         PZ3.T844Sk    940199
## 2554                         1979                    PZ1.M4775PT5926   5007359
## 2555                         1952                        PZ3.M4463Lo    832290
## 2556                         1961                          PS536.E55   1042562
## 2557                         1957                       PZ3.W58469Vo    367858
## 2558                         1983                PT2607.O35V413 1983   9154689
## 2559                         1976              PZ4.D338Bab5PR6054.E4   2377518
## 2560                         1974              PZ3.K1775Lak3PL832.A9   1139069
## 2561                         1954                                      1121958
## 2562                         1973                PS3525.I5454C6 1973    741848
## 2563                         1968           PZ3.M2989Das5PQ2625.A716     36744
## 2564                         1958                      PT2621.A26B34    296120
## 2565                         1975                 PZ3.G212Ru13PR4711   1341338
## 2566                         1959                            D431.G4   1525489
## 2567                         1977             PZ3.W7813In5PG7158.W52   2137159
## 2568                         1954                      PG3456.A13Y33  24627989
## 2569                         1983                     PS2112.S7 1983   9412148
## 2570                         1965                                      3304574
## 2571                         1975                                      2169665
## 2572                         1961                         PZ4.G97Cg3   1882350
## 2573                         1964                                      5906732
## 2574                         1980              PQ3989.2.B45R413 1980   7188052
## 2575                         1979       PZ4.B79968Wi 1979PS3552.R228   4494925
## 2576                         1954                       PZ3.H19866Li   3198166
## 2577                         1979        PZ3.H19866Ag 1979PT8175.H33   4667583
## 2578                         1952                PL 801 K8R2 E5 1952    275884
## 2579                         1983              PG3479.6.O85K613 1983   9576889
## 2580                         1954                                     14194048
## 2581                         1981                        PL817.A8A24   7816081
## 2582                         1961                        PZ3.M8894Af   1563033
## 2583                         1950                                       223194
## 2584                         1983               PT5830.D434T513 1983   9081954
## 2585                         1962                        PZ3.A5735Vi    583422
## 2586                         1972                                      1961486
## 2587                         1968                     PZ3.B38868Mal2  11203572
## 2588                         1964                                      1376205
## 2589                         1966                                      8378355
## 2590                    1965-1980                     PG3456.A1 1965    185344
## 2591                    1965-1980                     PG3456.A1 1965    185344
## 2592                         1975               PZ4.B396ChPS3552.E26   1527460
## 2593                         1962                       PZ3.S5855Br5    345007
## 2594                         1981                    PK2659.A44U5413   7977414
## 2595                         1982                  PG3456.A15W5 1982   9758512
## 2596                         1965                                     19941282
## 2597                         1959                      PQ2635.O117Jx   1887344
## 2598                         1975               PZ3.K1775Be3PL832.A9   1119523
## 2599                         1962           PL 4718.9 S62C39 E5 1962   1802755
## 2600                         1974            PZ3.H19866Lu5PT8175.H33    897514
## 2601                         1956                        PZ3.L2206Ro   1446820
## 2602                         1958                         PZ3.E205Me  25065712
## 2603                         1983              PT9876.17.U8T413 1983   9083206
## 2604                         1960              PZ3.A576In10PG7158.A7    850937
## 2605                         1965                                      4354762
## 2606                         1983                  PS3556.A72G6 1983   9533068
## 2607                         1974              PZ1.W935DiPN6071.H724   1206997
## 2608                         1967                        D810.S8T643  11583767
## 2609                         1971                                     36649312
## 2610                         1971             PZ4.H733EarPS3558.O348    163923
## 2611                         1967                         PZ4.C78Or2  11015075
## 2612                         1971                                       146551
## 2613                         1971                                       294371
## 2614                         1982           PZ4.O994Le 1981PS3565.Z5   6304322
## 2615                         1971               PZ3.S817StPG3948.S78    151845
## 2616                         1973                   PQ1542.E5S6 1973    724114
## 2617                         1977               PZ3.M996LiPA5624.Y68   2977783
## 2618                         1969               PZ4.S944DePS3569.U33     30263
## 2619                         1953                                     36364607
## 2620                         1973              PZ4.S5627IagPG3487.U5   1047212
## 2621                         1978                                      4355302
## 2622                         1971                PQ3989.2.B35A7 1971    607873
## 2623                         1976           PZ3.M2989Co12PQ2625.A716   2526961
## 2624                         1975             PZ4.V156GoPR9199.3.V35   1857930
## 2625                         1982                     PA5610.K39M413   7740929
## 2626                         1978             PZ4.W242BjPS3573.A475;   3274343
## 2627                         1978             PZ3.V6668KalPS3543.I26   3516173
## 2628                         1973                 PZ3.D742Br50PG3326   1718120
## 2629                         1963                        PZ3.L6367Ju   1447735
## 2630                         1965                        PZ3.A478Vi2    347596
## 2631                         1983                                      9662194
## 2632                         1979       PZ4.B79968Sh 1979PS3552.R228   4494930
## 2633                         1966                      PZ3.B72453Tw3   6530572
## 2634                         1971           PZ3.S5892MaegxPQ2637.I53    134267
## 2635                         1979                  PZ4.A13SePL845.B4   4775598
## 2636                         1969             PZ3.S5897De3PT2639.I63     44441
## 2637                         1951                       PZ3.L1354Bar   1854532
## 2638                         1972                  PM2711.Z95E5 1972    278003
## 2639                         1957                                      2105582
## 2640                         1959                       PZ3.B38868Mq    743704
## 2641                         1982               PG7158.M553Z313 1982   8495207
## 2642                         1983               PQ2603.A695A713 1983   8785205
## 2643                         1963                          PZ4.A15On    321552
## 2644                         1978              PZ4.B564PePQ3989.2.B4   5355362
## 2645                         1973                PZ3.S583Me7PH355.S5    613684
## 2646                         1983                                     18541845
## 2647                         1983                PL5139.I77A813 1983   9928272
## 2648                         1984                 PS3573.I475M3 1984  10489852
## 2649                         1963                                     16218943
## 2650                         1980                PR9619.3.P56A6 1980   7170759
## 2651                         1965                         PZ3.L86K15    626270
## 2652                         1972                 PZ3.T6385Te9PK8548    741479
## 2653                         1989                                     20304999
## 2654                         1951          PZ3.W923CaiPS3545.O98C299   3014962
## 2655                         1972                                      1099418
## 2656                         1974              PZ4.S115ThPQ2637.A122    673658
## 2657                         1974                  BV3325.A6H43 1974   1055729
## 2658                         1985               PJ5053.A4S52413 1985  11917589
## 2659                         1963                                      5035862
## 2660                         1964                        PZ4.M1576Ro   1739447
## 2661                         1989               PJ5054.Y42M5513 1989  17806959
## 2662                         1973                PQ4847.I77D613 1973    805073
## 2663                         1987                  PL855.A32A27 1987  15317593
## 2664                         1988                PL858.E14M313 1988x  17201002
## 2665                         1973                     PZ3.S5892Maegc    659103
## 2666                         1968                                       274757
## 2667                         1958                                      3368537
## 2668                         1979                                      4491627
## 2669                         1965                                       875895
## 2670                         1960                                       310302
## 2671                         1979                                      5950967
## 2672                         1956                          PZ3.Z74Bd   1099049
## 2673                         1953                                     17909469
## 2674                         1972                 PG3467.K93A24 1972    532606
## 2675                         1973             PZ4.K1432Dar3PL855.A32    707233
## 2676                         1957                                       909045
## 2677                         1973              PZ4.M2134GoPJ7846.A46    810424
## 2678                         1969                                     31930093
## 2679                         1964                        PZ4.H9457Go    291571
## 2680                         1983               PT9875.F788J313 1983   9196455
## 2681                         1951                                       687094
## 2682                         1970             PZ3.L5884Fr5PS3523.E94    112762
## 2683                         1980      PZ4.M2627Sk 1980PG3483.2.M56;   6194995
## 2684                         1978        PZ3.N8187Pl 1978PS3527.O625   3481074
## 2685                         1982                  PS2381.5.T38 1982   7924621
## 2686                         1968                PZ3.V594Tou25PQ2469    468640
## 2687                         1962                                      1851827
## 2688                         1964                                      1436439
## 2689                         1957                                      1410629
## 2690                         1975          PZ3.C13035Fi3PR9199.3.C27   1207329
## 2691                         1984                  PS3572.I53W6 1984  10185416
## 2692                         1974                          D781.N613    897432
## 2693                         1978                                      4516140
## 2694                         1977           PZ3.L5293Co8PS3523.E4583   2912382
## 2695                         1973             PZ4.V117GuPG5039.32.A2    632133
## 2696                         1956                      PZ3.C67984Cl4   2845137
## 2697                         1969                                      2208455
## 2698                         1983                 PS3572.A424L9 1983   9378398
## 2699                         1976          PZ3.C11427Gam3PR9499.3.C3   1859742
## 2700                         1981                                      8829613
## 2701                         1981                                      7657167
## 2702                         1978      PZ4.C67725Ni 1978PR9199.3.C58   3540456
## 2703                         1972             PZ4.S5267No4PL5139.S55    800990
## 2704                         1973               PZ3.Z79Wo10PG3476.Z7    578227
## 2705                         1979       PZ4.B9767Har 1979PS3552.U814   4493369
## 2706                         1978                                      3481455
## 2707                         1964                      PK8547.S28E56   4869591
## 2708                         1954                    PQ2520.A46 1954   2082927
## 2709                         1967                        PZ4.F7925Po    651958
## 2710                         1975             PZ3.S5892He8PQ2637.I53   2464259
## 2711                         1975              PZ3.S5892OtPQ2637.I53   2006157
## 2712                         1975                                      1833970
## 2713                         1983                PQ2637.I53T313 1983   9042770
## 2714                         1955                                      2459993
## 2715                         1978       PZ4.N5688Pe 1978PR9381.9.N45   4222103
## 2716                         1957                       PZ3.R73617Re    174699
## 2717                         1970                PZ4.T928FiPR6070.U5     92611
## 2718                         1952                                      1478329
## 2719                         1982                                      8759236
## 2720                         1979          PZ4.B5248Co 1979PT2662.E7   4135228
## 2721                         1974              PZ3.E3457C13PJ5129.E5   1160203
## 2722                         1956                        PJ5129.A2P3   3023944
## 2723                         1972               PZ4.T729OgPQ2680.O83    410406
## 2724                         1950                        PZ3.S5892Sn   1006163
## 2725                         1971               PZ1.H1255ClPR1309.H6    240113
## 2726                         1954                       PR6039.H47W4   1983177
## 2727                         1957                       PZ3.T3486Do2   1390310
## 2728                         1956               PG 3476 T6P4 E5 1956   1832912
## 2729                         1970                    PZ1.D18RuPG3286    129290
## 2730                         1956                         PZ4.Q9 Ce2   1029190
## 2731                         1983               PS3563.A31166G7 1983  10683684
## 2732                         1950                        PQ2613.I2Z3   1982721
## 2733                         1975              PZ4.D6413We5PS3554.O3   1366120
## 2734                         1962                                     19650182
## 2735                         1952                                PZ3    433870
## 2736                         1981               PQ3919.2.F4C513 1981   8709033
## 2737                         1973                PZ1.C2339UnPS648.S3    623985
## 2738                         1983                PS3563.A3125S9 1983   9557878
## 2739                         1980                                      7686093
## 2740                         1980                                      7074603
## 2741                         1983                                     15095762
## 2742                         1983                                     11677294
## 2743                         1984                  PR6021.E33T5 1984   9646431
## 2744                         1983                 PS3570.A398I5 1983   9217407
## 2745                         1983              PQ7539.2.A68D513 1983   9646458
## 2746          <estimate="[195-]">                                        57467
## 2747                         1963                          PZ4S69On2    297275
## 2748                         1982                 PL248.H45M413 1982   8554230
## 2749                         1964                        PZ3.W5265Vo    687000
## 2750                         1974                         HQ1747.V53   1176505
## 2751                         1977                                      8227573
## 2752                         1978                                      8178316
## 2753                         1960                       PZ3.Q325Zaz2    343368
## 2754                         1984                                     10183121
## 2755                         1963                                     26893126
## 2756                         1979                   GR153.5.S82 1979   6480331
## 2757                         1983                   PR6003.E6R5 1983  36334681
## 2758                         1982                                      8853782
## 2759                         1951                         PZ4.D258Te   3506888
## 2760                         1984                  PC3937.M4A27 1984  10207131
## 2761                         1960                        PZ3.M3213Gr   4157162
## 2762                         1983                                     12554359
## 2763                         1967                         PZ3.J234Bn    225668
## 2764                         1979                   PR5684.M318 1979   4211061
## 2765                         1966                                       322497
## 2766                         1967                       PZ4.S8789Hal    885029
## 2767                         1984                PJ5129.R2I5313 1984   9971310
## 2768                         1984                                     10123376
## 2769                         1974                                       858829
## 2770                         1964                                      4428067
## 2771                         1984                PS3573.O5617I5 1984  10342248
## 2772                         1983                  PR6023.E42W4 1983   9557455
## 2773                         1956                        PZ3P6475 Ro   6111006
## 2774                         1957                        PZ3.G558D25   2147235
## 2775                         1979                                      5050822
## 2776                         1984                  PL845.R5K613 1984  11239840
## 2777                         1970                                      5883661
## 2778                         1958                                       795254
## 2779                         1956                      PZ8.1.H75IWat    789637
## 2780                         1966                                      1417016
## 2781                         1954                       PZ3.B4308Lo2    665925
## 2782                         1959                        PZ3.P2869Am  67227236
## 2783                         1957                        PZ3.R2818Bl    296032
## 2784                         1979                   PS3564.I9I5 1979   4907925
## 2785                         1970            PZ3.S5892MaigPQ2637.I53     93881
## 2786                         1985              PT2603.O394V4713 1985  11532795
## 2787                         1984                                     10348437
## 2788                         1985                  PS3557.A28C3 1985  11344874
## 2789                         1975             PZ4.C3753BlPQ2663.A847   1119692
## 2790                         1986              PR9199.3.K443I58 1986  12839904
## 2791                         1987                 PS3553.R46A74 1987  14068143
## 2792                         1984                                     10672254
## 2793                         1987                                     16709410
## 2794                         1988                 PS3555.X58L37 1988  17201106
## 2795                         1982                     PL2892.A345A24   7737654
## 2796                         1983                                      9332295
## 2797                         1974             PZ4.W429My3PS3573.E415    771677
## 2798                         1954                       PZ4.B85036Wi   1086684
## 2799                         1979                                      6572394
## 2800                         1962                                      1355013
## 2801                         1956                        PZ4.B2635In   1204202
## 2802                         1967                     PQ7499.A75M813   1044884
## 2803                         1971               PZ4.W222UnPT2685.A48    292459
## 2804                         1984                                     14001455
## 2805                         1984                  PS3551.L78O9 1984  10724609
## 2806                         1972         PZ3.M6878Se vol. 1PL833.I7   2002297
## 2807                         1954                       PZ3.F618B 18   2847130
## 2808                         1956                            F951.B3   1264488
## 2809                         1984                  PG3463.D4D49 1984  10484279
## 2810                         1964                                      6075442
## 2811                         1978                                      3604267
## 2812                         1965                        PZ3.M9737To   1308657
## 2813                         1966                        PZ3.P867So2    311135
## 2814                         1953                                      1454100
## 2815                         1952                                      5952735
## 2816                         1963                    PS3505.A4342Z52    281005
## 2817                         1985                PQ2683.I32C613 1985  11444075
## 2818                         1976            PZ4.S428Raj3PR6069.C596   2627072
## 2819                         1981                         PZ3.N121Ki  15598944
## 2820                         1956                       PL3000.C5A26    324851
## 2821                         1985               PT5860.M85A6313 1985  11288940
## 2822                         1984                PS3562.E2618F3 1984  10559291
## 2823                         1983                                     10137815
## 2824                         1979                                      6426652
## 2825                         1963                                       498485
## 2826                         1971                PZ4.S69St3PG3488.O4    209370
## 2827                         1957                                       322535
## 2828                         1985              PQ4835.A274S5313 1985  11399871
## 2829                         1960                         PZ4.T332Tr   4612457
## 2830                         1972              PZ3.K8194CalPR6021.O4    595792
## 2831                         1985                PS3503.A8423V5 1985  11574178
## 2832                         1986                PS3553.O633G47 1986  12263219
## 2833                         1985               PQ2637.I547R613 1985  12080983
## 2834                         1985                    PR4967.C87 1985  12371453
## 2835                         1951                         F869.S38K7   2356603
## 2836                         1983               PT2675.B47K5613 1983   8667177
## 2837                         1982                                      9973483
## 2838                         1961                                      2791516
## 2839                         1971            PZ3.P2869To3PQ4835.A846    156919
## 2840                         1975                                      3032933
## 2841                         1970                                        97218
## 2842                         1959                       PZ3.B8647Sai    190591
## 2843                         1983                PL830.T35.T413 1983   8451448
## 2844                         1969               PZ3.V624BrPT8950.V42     32782
## 2845                         1973               PZ3.K792Fac3PL832.O3    624049
## 2846                         1960                         PZ3.B847Ru   1425906
## 2847                         1968                        PZ3.A8316As   2616076
## 2848                         1983                   PR6068.U2B7 1983   9896554
## 2849                         1979                                      4402454
## 2850                         1956                                      2160698
## 2851                         1961                                      2791516
## 2852                         1958                                      1042659
## 2853                         1970             PZ3.Z158We15PG3476.Z34    124326
## 2854                         1975              PZ3.B869Co3PG3476.B78   1531199
## 2855                         1971                                       148832
## 2856                         1957                       PZ3.B81554Ro   1613102
## 2857                         1982                 PT2653.W42U62 1982   8668518
## 2858                         1954                                     15807968
## 2859                         1955                                PZ3   2061562
## 2860                         1983                                     10284241
## 2861                         1983                                      8975769
## 2862                         1962                                     20020567
## 2863                         1976                                      3860491
## 2864                         1978        PZ4.C1259Vi 1978PQ7389.C233   3914169
## 2865                         1962                                      6191591
## 2866                         1977          PZ3.S3598Lg 1977PT2638.N5   3415363
## 2867                         1974              PZ3.S3598Li6PT2638.N5   1069218
## 2868                         1974               PQ3989.S46V613 1974b    850229
## 2869                         1983               PS3573.E1955C68 1983   9280680
## 2870                         1980                    PL4718.9.B33A23   7813277
## 2871                         1958                                      9331529
## 2872                         1982               PQ2631.I638C413 1982   9749182
## 2873                         1955                      PR9619.3.W5T7    891773
## 2874                         1958                                      3441758
## 2875                         1976            PZ4.B2984VoPL4718.9.B33   4136956
## 2876                         1970               PZ4.W652BePQ2683.I32     58221
## 2877                         1965                                      1070024
## 2878                         1972                 PJ5054.O9M513 1972    208905
## 2879                         1974                        PZ3.V6668Mz    934591
## 2880                         1982                                      8509817
## 2881                         1983                PS3568.O4544S2 1983   9095544
## 2882                         1974                    PQ2603.E378M413   1130330
## 2883                         1981                  PR6064.Y4F38 1981   7170427
## 2884                         1969               PQ9939.H65N6713 1969     56566
## 2885                         1951                        PZ3.M3213Sc   7418003
## 2886                         1972            PZ3.C13034DoPQ9697.C223    292366
## 2887                         1968                        PZ4.K4453To    441290
## 2888                         1961                           E99.E7F7  28781023
## 2889                         1969             PZ4.A549SatPS3551.N378     34633
## 2890                         1978                                      5031955
## 2891                         1958                         PZ5.H134Th   1406666
## 2892                         1967                   PQ7087.E5C6 1967    236775
## 2893                         1969             PZ4.A6278BlPQ2601.R619      5530
## 2894                         1958                                       254314
## 2895                         1983                PT2666.E37B313 1983   9558011
## 2896                         1974               PZ4.B637SaiPQ3919.B6    858733
## 2897                         1982                                      7795604
## 2898                         1955              PZ3.O807HoPL835.S3K5x   4621132
## 2899                         1976            PZ3.M3162Bl10PT2625.A43   2199329
## 2900                         1973               PZ4.B5248LiPT2662.E7    677316
## 2901                         1965                                     22549295
## 2902                         1963                        PS3570.A6C6   2951898
## 2903                         1971                                       106081
## 2904                         1951                       D767.25.N3N3   2950198
## 2905                         1960                  PA4025.A5R4 1960a    522441
## 2906                         1962                                      1912203
## 2907                         1963                                       855073
## 2908                         1960                    PQ2603.O754M413    933353
## 2909                         1962                  PQ1805L5A713 1962  67227167
## 2910                         1964                        PZ3.G2114Hi    592815
## 2911                         1960                                      1677861
## 2912                         1965                   PR6039.A2A6 1965   1018333
## 2913                         1956                                      3020799
## 2914                         1966                        PZ4.F1637Fi    838083
## 2915                         1962                                      2918097
## 2916                         1983                                     20696119
## 2917                         1955                        PZ3.A7348Dr   1332465
## 2918                         1968                       PZ3.L591Is12    288821
## 2919                         1969                                         5361
## 2920                         1977             PZ4.H2763CiPJ5054.H292   2633792
## 2921                         1970                                       971246
## 2922                         1977            PZ4.H753Go7PS3558.O3594   3012958
## 2923                         1978             PZ3.T72897ImPG3489.R5;   4583807
## 2924                         1953                      PZ3.T728897St   1932443
## 2925                         1960          PZ3.G4535Ce2PG3476.G53T83    633685
## 2926                         1976                PZ4.F192LePQ4866.A4   2493634
## 2927                         1984             GR350.32.M33C3413 1984  10146437
## 2928                         1976                   PQ1494.L3E5 1976   2563145
## 2929                         1955                                      6619681
## 2930                         1970                                       105367
## 2931                         1966                                      1386231
## 2932                    1965-1980                     PG3456.A1 1965    185344
## 2933                         1980                       PR6060.O64E3   6389043
## 2934                         1983                PG3482.S5S213 1983b   9081327
## 2935                         1956                     PS3537.T316C48    290351
## 2936                         1950                      PS3537.T316Wx   2014597
## 2937                         1982                    PS2472.M37 1982   8588784
## 2938                         1967                          PZ4.A65Pr    459293
## 2939                         1979                                      6387874
## 2940                         1971                  PZ4.I14LiPL830.B8    515134
## 2941                         1982                                      8456552
## 2942                         1980             PZ3.P416Sh 1980PQ6555;   6016137
## 2943                         1980                                      6473741
## 2944                         1964                    D810.J4D27 1964    432424
## 2945                         1982                                      9160030
## 2946                         1982              PT2603.R7753N513 1982   8133134
## 2947                         1970               PZ4.O988Bo4PQ3989.O9     86061
## 2948                         1977              PZ4.D338Fal6PR6054.E4   2894024
## 2949                         1971                PZ4.N468LoPG5029.N4    128724
## 2950                         1983                 PS3552.A763M6 1983   9441903
## 2951                         1966                                      1379502
## 2952                         1973               PZ4.S416EqPQ4879.C54    577990
## 2953                         1984                                     10605700
## 2954                         1975             PZ3.T6985 KiPT3919.T7;   1832223
## 2955                         1975                                      2889800
## 2956                         1982                PQ2680.O83G313 1982   8194661
## 2957                         1967                      PR6045.A249S6    562180
## 2958                         1980                                     22891470
## 2959                         1982                 PS3523.O46A6 1982b   8282984
## 2960                         1953                                      1294316
## 2961                         1950                       PZ3.S4838Cas    561146
## 2962                         1968                       PZ3.R7113Th3    437389
## 2963                         1973           PZ4.B87235ExPR6052.R5823    750277
## 2964                         1977                PZ4.Y3Th5PL248.Y275   2614433
## 2965                         1962                 PH3281.M6S913 1962    122139
## 2966                         1975             PZ4.R227CamPQ2635.A379   1174645
## 2967                         1971              PZ3.B75232BrPJ5053.B7    196250
## 2968                         1964                                       401804
## 2969                         1965                        PZ4.A842Gam   1309975
## 2970                         1967                        PZ4.P653Bag    957272
## 2971                         1951                          PG 3421N6  10974055
## 2972                         1983               PG1418.C63V7213 1983   9645651
## 2973                         1983               PG1418.C63V7213 1983   9645651
## 2974                         1973                                     21617290
## 2975                         1978                                      3966201
## 2976                         1978                                      4926531
## 2977                         1982                  PR6069.A42G6 1982   8554064
## 2978                         1969                    PZ3.Z74SiPQ2501     23669
## 2979                         1984                  PS3575.A83Y6 1984  10558755
## 2980                         1971                                       118272
## 2981                         1979                PZ4.S717MuPS3569.O7   4468643
## 2982                         1970                                       172933
## 2983                         1950                                      4823022
## 2984                         1981                                      7934638
## 2985                         1956                          PZ3.F12Ro    321993
## 2986                         1963                         PZ3.Y153Ed    326685
## 2987                         1960                                      1251951
## 2988                         1963                 PT2670.O38M83 1963   2563185
## 2989                         1980                                      6526014
## 2990                         1958                                     10785090
## 2991                         1979                  PZ1.N44415PG3273;   5286378
## 2992                         1977                                      4491029
## 2993                         1970               PZ3.H736Le6PS1949.H8     67395
## 2994                         1983               PG1418.C63V7213 1983   9645651
## 2995                         1963                         PZ4.S986Li  16699033
## 2996                         1977          PZ4.B7478Le 1977PL4209.B6   3762849
## 2997                         1981               PG1418.C63V7213 1981   7671667
## 2998                         1972              PZ4.B3176BePQ4807.A79    409762
## 2999                         1963                                      1494752
## 3000                         1971              PZ3.L1354Et7PT9875.L2    198028
## 3001                         1974            PZ3.C54336DoPS3505.L254    994960
## 3002                         1978             PZ4.G6493ThPG7158.G669   3868852
## 3003                         1951                       PZ3.M39384Ni    358056
## 3004                         1967                       PZ4.P43125St    956024
## 3005                         1955                                       652672
## 3006                         1963                                       333178
## 3007                         1980             PZ4.C803OlPS3553.O649;   6379510
## 3008                         1984                PJ5054.Y42G413 1984   9620015
## 3009                         1966                         PZ4.L572Fr   2695256
## 3010                         1978        PZ4.A5435My 1978PT2601.N353   3632166
## 3011                         1958                        PZ3.C6478Mi    341803
## 3012                         1966                                     29302467
## 3013                         1960                        PZ3.R1102Jo   1911685
## 3014                         1964                                       321303
## 3015                         1955                         PZ3V587Ma2   1834803
## 3016                         1963                      PZ3.B814 1963    962936
## 3017                         1959                         PZ4.B988Ch   1628263
## 3018                         1974                                      3114009
## 3019                         1963                                      8174342
## 3020                         1976              PZ4.I5446Be4PT2669.N6   2119359
## 3021                         1979                                      5748029
## 3022                         1982                  PS3545.H16A6 1982   8429861
## 3023                         1982                                     10288108
## 3024                         1956                         PZ3.M713Wh   1376900
## 3025                         1964                                      1657332
## 3026                         1955          PZ3.S1274Hat 1955PC839.S3   3432343
## 3027                         1972                                       615538
## 3028                         1969                PZ3.L449WoPT7511.L3      5501
## 3029                         1963                                     11009006
## 3030                         1963                      PZ3.B814 1963    962936
## 3031                         1961                                      7506651
## 3032                         1963                                      1332682
## 3033                         1984                PG3478.N34P713 1984  10432471
## 3034                         1959                       PZ4.B6278Tao   1574730
## 3035                         1979           PZ4.L97Dk 1979PG5038.L85   4490423
## 3036                         1958                         PZ3.M189No    795764
## 3037                         1971                   PR6051.R3T7 1971    216683
## 3038                         1978                PZ3.L612CoPL2780.F4   4991119
## 3039                         1976                                      2466093
## 3040                         1960                                      2205384
## 3041                         1983                                      9557837
## 3042                         1969                      GR550.O7 1969     45158
## 3043                         1966                                     39372795
## 3044                         1968                       PZ3.S61657Sd    325073
## 3045                         1975         PZ4.S61953Co4PT9876.29.J63   2090008
## 3046                         1976                  PZ3.A355Pl5PS1017   2035180
## 3047                         1967                         PZ3.V594Se    459893
## 3048                         1970                 PZ1.F67 1970PG3286     92486
## 3049                         1963                                      4398223
## 3050                         1974               PZ3.T844ScPG3421.A15   1366500
## 3051                         1957                         PZ4.B814Ro    544621
## 3052                         1980                                      6992992
## 3053                         1955                       E185.97.W226    423553
## 3054                         1964                                     18388079
## 3055                         1954                         PZ3.K843Si  66130417
## 3056                         1971                                      2512576
## 3057                         1953                            DS266M4    895961
## 3058                         1984               PG7173.083R3613 1984  10322669
## 3059                         1954                                      5308841
## 3060                         1973                                       296519
## 3061                         1955                         PZ3.R642Bo   1499205
## 3062                         1956                                     13219627
## 3063                         1953                                      2828013
## 3064                         1972                 PQ4272.E5A355 1972    571737
## 3065                         1972              PZ3.F8582St4PG3948.F7    870076
## 3066                         1976            PZ3.P1978Se3PG3476.P255   2924650
## 3067                         1976              PZ4.M8185LiPR6063.O59   2615688
## 3068                         1977                                      2508323
## 3069                         1967                                      4202409
## 3070                         1971               PZ4.G692WhPS3557.O85    141363
## 3071                         1977              PZ4.K165RoPJ5054.K326   3169617
## 3072                         1971                        PN6222.O7F4    278798
## 3073                         1973              PZ4.H888CoPS3558.U325    644832
## 3074                         1972                    PR4553.W35 1972    320013
## 3075                         1965                                      4610868
## 3076                         1969            PZ3.H19866Li5PT8175.H33     54604
## 3077                         1984                 PG3482.S5S213 1984  10146429
## 3078                         1971                                       137900
## 3079                         1978                                     16425660
## 3080                         1957                                     31216172
## 3081                         1984                                      9758743
## 3082                         1984                                     12505518
## 3083                         1978                                      4391820
## 3084                         1964             PQ 4807 A76L96 E5 1964   1275778
## 3085                         1954                 PA 5610 K23G7 1953    310368
## 3086                         1973              PZ4.S415WoPQ2637.C736    550260
## 3087                         1959                                      1813622
## 3088                         1984                  PS3523.O46M3 1984   9828615
## 3089                         1978               PZ4.O37LePB1399.O449   4494564
## 3090                         1961                       PZ3.M59943Wy   2042210
## 3091                         1981                   PC839.E38A2 1981   7739304
## 3092                         1966                         PZ3.L449Fi   2655978
## 3093                         1951                       PZ3.B73847Ri   9326967
## 3094                         1959              PQ2613.I57B6[13] 1959    342168
## 3095                         1964                         PZ3.A397Oc   2319957
## 3096                         1967                        D811.M34013   1286997
## 3097                         1955                                       747449
## 3098                         1962                         PZ4.A772No   1357167
## 3099                         1981                                      8606532
## 3100                         1972                                     59144249
## 3101                         1950          PZ3.S81475DePS3537.T37825   1345789
## 3102                         1971                        PZ3.M8346Fj    162102
## 3103                         1972                  PZ3.C3985SlPG3456    523978
## 3104                         1979                 PL2727.S2S713 1979   4495528
## 3105                         1984                  PS3555.L62E4 1984  10913828
## 3106                         1968             PZ3.K1055NarPJ5053.K25    473153
## 3107                         1974                          F74.R9C67    700775
## 3108                         1964             PH 3213 D43O69 E5 1964   1908674
## 3109                         1971              PZ3.H4525KnPT2617.E85    159352
## 3110                         1957                     PZ3.N559Cas 1d   6361661
## 3111                         1972               PZ4.P2318BlPK2598.P3   2176176
## 3112                         1976              PZ1.V25Ne5PK2598.Z95E   1929674
## 3113                         1984                PG3476.A3164N6 1984  10997977
## 3114                         1984                PQ2680.O83C613 1984  10208367
## 3115                         1959                         PZ4U885 Ad    884934
## 3116                         1982                                      8526446
## 3117                         1964                   PS3565.A7W5 1964    304539
## 3118                         1965                                      1534472
## 3119                         1950                        PZ3.S4521Be   1467346
## 3120                         1981                                      8015923
## 3121                         1983                  PL839.S8N513 1983  10287436
## 3122                         1961                                      9617219
## 3123                         1971                                       160716
## 3124                         1970                                       559417
## 3125                         1964                PL 801 K8A6 E5 1964    279720
## 3126                         1962                        PZ4.B5285Co   1637279
## 3127                         1984                PS3562.Y4255O4 1984  10457175
## 3128                         1982                 PQ7439.Z4C513 1982   9505543
## 3129                         1984               PS3554.A93777M9 1984  10229615
## 3130                         1971                                       127940
## 3131                         1952                          PT1327.L3    294008
## 3132                         1964                                     68136974
## 3133                         1977                   PZ1.S69597PG3286   4292493
## 3134                         1976           PZ4.V2215Dr10PS3572.A424   2377283
## 3135                         1973                       PT7296.T71S3    800717
## 3136                         1983               PQ7439.M265M513 1983  10324441
## 3137                         1954                       PZ3.L6547Fai  33959103
## 3138                         1953                                      7711404
## 3139                         1969                                        14885
## 3140                         1962                                      3251150
## 3141                         1984                 PR6015.A674S8 1984   9829518
## 3142                         1965                       PZ3.H72833No    283545
## 3143                         1971             PZ3.A478Te3PQ9697.A647    158681
## 3144                         1975           PZ4.B9198Bo3PT2662.U3134   1175880
## 3145                         1973                   PZ1.H842EyPQ7085    757662
## 3146                         1981                 PL2851.E7S553 1981   8786193
## 3147                         1950                       PZ3.M59943Dr   2835135
## 3148                         1971                                       240163
## 3149                         1972                      PZ3.M39384Rav    515829
## 3150                         1965                                      5154750
## 3151                         1963                                      2344633
## 3152                         1970               PZ3.J6316NiPT9875.J6    203027
## 3153                         1962                                      2082188
## 3154                         1968                          PZ4.F12Kr    461966
## 3155                         1966                                       296382
## 3156                         1979                                      5762396
## 3157                         1982                    PT8950.B713L513   7835639
## 3158         <estimate="[195-?]">                                       967492
## 3159                         1955                        PL2851.L5H8   3411282
## 3160                         1984                                     12971810
## 3161                         1966                       PZ3.D9327Sai    244305
## 3162                         1962                   PQ2607.U8245D613    649382
## 3163                         1971                                       126562
## 3164                         1960                                      5163468
## 3165                         1960                      PZ3.S85166Cau   1651234
## 3166                         1978                                      5650854
## 3167                         1962                                     16692185
## 3168                         1976                                      2609421
## 3169                         1971              PZ4.N154Fi3PR6064.A33    149193
## 3170                         1955                                     37187191
## 3171                         1952                                      5783746
## 3172                         1974                 PZ3.H222Lh15PR4750   2756941
## 3173                         1958                        PZ4.M9783Se   1337650
## 3174                         1960                       PZ3.M7683Bac   1547466
## 3175                         1981                                      7420703
## 3176                         1985                         PS14021985  11343909
## 3177                         1979           PZ3.H21968SlPS3515.A5672   4493557
## 3178                         1972                                       252136
## 3179                         1962                                      1389784
## 3180                         1967                         PZ3.J234Bn    225668
## 3181                         1985                     PG3326.D8 1985  11159398
## 3182                         1984               PR9199.3.V384M9 1984  11494909
## 3183                         1975               PZ4.O989Un3PJ5054.O9   1418901
## 3184                         1981                      PS3573.I434L5   7553537
## 3185                         1983                                     12419386
## 3186                         1978              PZ4.C835Ti3PG1418.C63   3034165
## 3187                         1975          PZ4.K6132Gar3PG1419.21.I8   1418787
## 3188                         1966                         PZ1.K832Yu   1654359
## 3189                         1979       PZ4.K336Co 1980PR9619.3.K46;  28993817
## 3190                         1984                 PR6039.H52A15 1984  10711818
## 3191                         1960                       PZ3.J6363Hu2    364976
## 3192                         1956                       PZ3.J6363Las  18920906
## 3193                         1978                                      3203085
## 3194                         1963            PZ3.N121GiPG3476.N3D313    265075
## 3195                         1952                                     11107105
## 3196                         1979              PZ4.D553SrPS3554.I328   5944169
## 3197                         1951                       PZ3.B69796Sm    586488
## 3198                         1967                       PZ3.A3632So7    362594
## 3199                         1958           PZ3.D4998MacPS3507.E8673    758326
## 3200                         1965              PQ 2607 R56F42E5 1965   1435476
## 3201                         1958                         PZ4.C269To   1806950
## 3202                         1966               PZ3.T1285Far 3PK1723   7706171
## 3203                         1973               PZ3.D830Co5PQ2607.R5    886764
## 3204                         1975                                     66747780
## 3205                         1984                  HV8148.N5A32 1984  10694670
## 3206                         1952                        PZ4.N693Har   1738671
## 3207                         1958                                      1495722
## 3208                         1977                                       651868
## 3209                         1952                       PZ3.H17456Gr   2360960
## 3210                         1981                PT2680.N38N613 1981   6789145
## 3211                         1975               PZ3.N121Ty3PG3476.N3   1054258
## 3212                         1970                  PZ3.T844Ho7PG3420     88687
## 3213                         1966                        PZ4.T787Gt2    367427
## 3214                         1954                       PZ3.M39384Bo    308245
## 3215                         1984                PQ2667.O53A713 1984  10751221
## 3216                         1967                                       820162
## 3217                         1961                                     68137622
## 3218                         1983               PQ2637.I547L413 1983   9393114
## 3219                         1983                                      9965060
## 3220                         1960                                       321908
## 3221                         1984                                     11149419
## 3222                         1969                                        13987
## 3223                         1953                                       603642
## 3224                         1971               PZ4.P619BlPQ2631.I49    208302
## 3225                         1974               PZ4.A517En3PR6001.M6    947947
## 3226                         1970           PZ4.G5753HaiPQ3919.2.G55    162033
## 3227                         1984                                     11255682
## 3228                         1964                                       997470
## 3229                         1979                                      8033001
## 3230                         1980                     PL5139.S55S413   7667257
## 3231                         1971            PZ4.A6794Hal3PQ7390.A72    196705
## 3232                         1992                                     29940112
## 3233                         1994             PQ2666.R2664S4613 1994  27641402
## 3234                         1993                 PR6070.H58P53 1993  28291850
## 3235                         1994               PT2635.I65Z4513 1994  29028463
## 3236                         1994                                     29028022
## 3237                         1993                 PR4174.B56C66 1993  28547537
## 3238                         1993               PR6052.R5816D65 1993  28257476
## 3239                         1985                PS3573.I444T48 1984  15114095
## 3240                         1980                                      6354621
## 3241                         1961                         PZ3.E32Th4   2340679
## 3242                         1981                                      8168167
## 3243                         1973                PZ1.T156MePJ5059.E8    981779
## 3244                         1960                           DS727.K5   1227371
## 3245                         1957                         PZ4.D835No    321198
## 3246                         1958                       PZ3 .B847Gat    938364
## 3247                         1979         PZ4.R319Mu 1979PS3568.E362   4835364
## 3248                         1961               PT2653.W42U6.E5 1961   1625093
## 3249                         1959               PT2653.W42K3213 1959   6577379
## 3250                         1979              PZ4.S416CanPQ4879.C54   4933246
## 3251                         1965                                      9486019
## 3252                         1973             PZ4.T28727ThPG3476.T42    677886
## 3253                         1979           PZ4.H288CanPS3558.A62475   4933771
## 3254                         1966                                      1908620
## 3255                         1983                                     10546395
## 3256                         1974                                      1531023
## 3257                         1974           PZ3.S5892Mafa4PQ2637.I53    740982
## 3258                         1959                         PZ3.U568Fo    296341
## 3259                         1982                   PZ7.S4136Lo 1982   7836162
## 3260                         1962                         PZ4.E349Bu   3573869
## 3261                         1984                                     59094887
## 3262                         1958                          BR936.B15    381336
## 3263                         1957                                      1420767
## 3264                         1967               PZ3.S7737ChPK2098.S7     79489
## 3265                         1972              PZ3.S967Lay6PT2533.S3    329662
## 3266                         1982                                      8813776
## 3267                         1970            PZ3.L9564Vi5PS3523.O953    127916
## 3268                         1985            PQ2607.U8245A62613 1985  11497818
## 3269                         1963                      GR350.A7 1962    486137
## 3270                         1984                                     11760731
## 3271                         1962                                      8449943
## 3272                         1967      PZ3.K153HoPG3476.K4S913 1967a   1033676
## 3273                         1972                  PT9813.G5E57 1972    622816
## 3274                         1971               PZ3.V86Nak6PG3476.V6    235223
## 3275                         1976            PZ3.T36027De5PR6039.H52   2857057
## 3276                         1952                        PZ3.M1817Ep    347574
## 3277                         1985              PT2668.O376U5613 1985  11599288
## 3278                         1982               PR9199.3.C266B5 1982   8109634
## 3279                         1969                       PJ7680.B3313    120539
## 3280                         1966                         PZ4.N435Gu   1171266
## 3281                         1965                   PQ2003.V5E5 1979    690042
## 3282                         1978               PZ4.K175CoPL4659.K3;   5673438
## 3283                         1974               PZ4.K175Wh3PL4659.K3   2491683
## 3284                         1981                      PS3511.A784L4   7462489
## 3285                         1967                       PZ3.S55854Fi    777302
## 3286                         1968                     PG3366.A1 1968    319817
## 3287                         1984              PQ2607.U8245D413 1984  11021755
## 3288                         1969               PZ3.D363Mi2PS1525.D5     50315
## 3289                         1964                                     67409908
## 3290                         1983             PQ9698.12.R293Z33 1983  10053614
## 3291                         1963                         PZ4.E349Be   1214182
## 3292                         1978            PZ4.E563Vo 1978PL849.N4   4465988
## 3293                         1985                  PG3478.K7A28 1985  10695205
## 3294                         1971            PZ3.M4415Wr3PR6025.A858    129780
## 3295                         1968                        PZ3.M4415Sc    441279
## 3296                         1958           PZ3.S97192ThPS3537.W3743   1811656
## 3297                         1967                        PZ3.M3213Ro    955425
## 3298                         1975                                      1119711
## 3299                         1964               PQ 4809 A8C9 E5 1964   1457374
## 3300                         1960                        PZ4.C343Fau   1415799
## 3301                         1978           PZ4.I545Tu 1978PL830.N63   4222594
## 3302                         1974                                     68271438
## 3303                         1962              PZ4.M533Pi7PQ2625.E39   4441187
## 3304                         1976               PZ4.D86Cap3PR6054.U4   1975177
## 3305                         1961                        PZ3.M445B15   1452374
## 3306                         1965                                     22900333
## 3307                         1964                 PQ8219.I2H813 1972    204185
## 3308                         1982                                      8969045
## 3309                         1976             PZ4.P379TiPG1419.26.E5   2332249
## 3310                         1971           PZ4.M632Wh3PG1419.23.I33    130088
## 3311                         1970              PZ4.S852Cr3PR6069.T46     87016
## 3312                         1979                                     29004036
## 3313                         1968                        PZ4.P2835Vi    458660
## 3314                         1966                          PZ4.A83Gr    362535
## 3315                         1963                       PQ1971.C6W39    344593
## 3316                         1981                     PG7170.O66M513   8337113
## 3317                         1980                       PG3948.K6A23   7171013
## 3318                         1960                         PZ4.S938Se    292188
## 3319                         1962                   PS3569.T9L6 1962   2729723
## 3320                         1981                     PS3569.M5377G6   6914272
## 3321                         1966                        PH355.S5I43    322983
## 3322                         1954                          PT1327.P5   1289823
## 3323                         1973              PZ3.C583Tp3PR6053.L43    750380
## 3324                         1976            PZ3.M8346RePS3525.O7475   2090863
## 3325                         1983                                      9802280
## 3326                         1953                       PZ3.C12734Cn   9865961
## 3327                         1976                                      2975945
## 3328                         1978                                      6015664
## 3329                         1978                                      4410408
## 3330                         1980                                     11344637
## 3331                         1972              PZ4.L1627StPS3562.A28    235463
## 3332                         1982                                      8287871
## 3333                         1981                                     17986770
##      place  recordid
## 1      mau 100310375
## 2      quc 100310933
## 3      enk 100731071
## 4      nyu   9085033
## 5      enk   9087510
## 6      ctu  12202855
## 7      nyu  12370542
## 8      xx   11405142
## 9      nyu  12445403
## 10     enk  11405174
## 11     nyu  11742528
## 12     mau  11405198
## 13     enk  11405437
## 14     nyu   9076439
## 15     enk  11712490
## 16     nyu   9473966
## 17     ohu  11742773
## 18     iau  11406270
## 19     nyu 100011232
## 20     inu   9089735
## 21     nyu  12203227
## 22     gau  11742720
## 23     nyu  10008083
## 24     nyu  12238927
## 25     nyu  12238927
## 26     enk  12203259
## 27     enk  11742746
## 28     stk  11406347
## 29     enk  11406340
## 30     dcu  11406334
## 31     nyu 100227404
## 32     nyu   9209084
## 33     enk  11743106
## 34     nyu   4579672
## 35     onc   9475047
## 36     ilu  11743181
## 37     nyu  11743180
## 38     nju 100332229
## 39     nyu 100325542
## 40     nyu    703424
## 41     enk   1255817
## 42     pau 100488539
## 43     nyu 100524761
## 44     nyu   6655274
## 45     dcu 100555607
## 46     pau 100783653
## 47     enk 100783672
## 48     iau 100645901
## 49     miu 100643439
## 50     xx  100647427
## 51     ch  100643322
## 52     nyu 100647070
## 53     nyu 100643758
## 54     mau 100645613
## 55     iau 100645636
## 56     nyu 100646609
## 57     nyu 100646674
## 58     miu  11922483
## 59     at   11922492
## 60     enk   7584424
## 61     nyu   5658541
## 62     rur   6946929
## 63     rur   6946929
## 64     nyu   7586912
## 65     nyu   7393514
## 66     xx    7593293
## 67     nyu   7587888
## 68     oru   6929072
## 69     enk   8560757
## 70     nr    6062723
## 71     nyu   7591289
## 72     enk   7021885
## 73     enk   7576614
## 74     enk   7583354
## 75     enk   7571733
## 76     nr    6063658
## 77     nr    6063696
## 78     nyu   9397800
## 79     nyu   7586790
## 80     dcu   7017153
## 81     nyu   9397720
## 82     ctu   7022270
## 83     cau   7578807
## 84     nyu   7594131
## 85     enk   7594186
## 86     nyu   7578966
## 87     nyu   7569094
## 88     enk   7442512
## 89     yu   11810090
## 90     enk   7586786
## 91     enk   2457909
## 92     nyu   7568236
## 93     nyu      4783
## 94     enk   7994805
## 95     enk   7587314
## 96     nyu   9398070
## 97     nz    6061006
## 98     nyu   9400028
## 99     nyu   1827464
## 100    nyu   7019416
## 101    nyu   7977998
## 102    rur   7019448
## 103    mau   7579027
## 104    sa    6062432
## 105    enk   7566914
## 106    at    6061516
## 107    nyu   7019471
## 108    nyu   7587316
## 109    wlk   6935503
## 110    nz    6060975
## 111    nyu   7591689
## 112    nyu   7568345
## 113    pau   6061908
## 114    nyu   6056818
## 115    cau   7570274
## 116    nyu   6058733
## 117    enk   9254645
## 118    enk   1424738
## 119    enk   6061208
## 120    enk   6062437
## 121    nyu   7593239
## 122    nyu   6060240
## 123    enk   6057236
## 124    enk   7592418
## 125    enk   7573034
## 126    rh    6060603
## 127    nyu    303503
## 128    xx    7586906
## 129    nyu   6061974
## 130    enk   6059857
## 131          7578972
## 132    nyu   6058907
## 133    nyu   7594009
## 134    enk   7569089
## 135    enk   7569089
## 136    enk   9254633
## 137    enk   7570236
## 138    enk   9399055
## 139    enk   1424738
## 140    nyu   7578973
## 141    nyu   9398161
## 142    enk   7592324
## 143    le    7568709
## 144    mau   7586833
## 145    enk   6058684
## 146    xx    6058831
## 147    nyu   7572965
## 148    enk   7016458
## 149    enk   9524438
## 150    enk   7278008
## 151    enk   7592419
## 152    enk   7569031
## 153    enk   7587753
## 154    enk   9397456
## 155    enk   7578865
## 156    dcu   7568850
## 157    enk   7578799
## 158    enk   7591703
## 159    wlk   6931083
## 160    nyu   7446557
## 161    ua    1080751
## 162    nyu   9398063
## 163    enk   7278925
## 164    enk   7585714
## 165    enk   7278932
## 166    cau   7988313
## 167    at    6061517
## 168    ilu   7576743
## 169    enk   7574777
## 170    enk   7593285
## 171    nyu   7568490
## 172    nyu   7597227
## 173    nyu   7585508
## 174    nyu   7586182
## 175    nyu   6059685
## 176    enk   9398602
## 177    enk   9398061
## 178    nyu   9399150
## 179    nyu   1185238
## 180    enk   7583365
## 181    xx    6058970
## 182    nyu   6055774
## 183    cou   6058799
## 184    nyu   7570219
## 185    cau   7568510
## 186    nyu   7587269
## 187    nyu   7593931
## 188    pau   6059767
## 189    miu   1030222
## 190    enk   7586205
## 191    sa    6062462
## 192    enk   9398091
## 193    enk   7573154
## 194    enk   7573154
## 195    enk   7589518
## 196    enk   7578793
## 197    rur  11810582
## 198    mau   7578825
## 199    nyu   7584451
## 200    scu   6811690
## 201    gau   7580726
## 202    sa    6062510
## 203    enk   7567323
## 204    nyu   7592454
## 205    enk   7588065
## 206    enk   7587798
## 207    enk   7580008
## 208    enk   7588344
## 209    nyu   7586050
## 210    un    7017169
## 211    si   10550620
## 212    enk   7588203
## 213    nyu   7832911
## 214    nyu   7831810
## 215    nyu   7594215
## 216    enk   7390194
## 217    nyu   7588492
## 218    enk   6035315
## 219    enk   6811660
## 220    nr    6063740
## 221    nyu   7578776
## 222    enk   7587533
## 223    enk   7588298
## 224    no    6014355
## 225    enk   7588518
## 226    nyu   7578824
## 227    nyu   7583312
## 228    enk   7580010
## 229    enk   7581721
## 230    enk   7581400
## 231    nju   2577872
## 232    enk   7588014
## 233    nyu   2876376
## 234    nyu   7587666
## 235    enk   7274543
## 236    nyu   7568021
## 237    enk   7587627
## 238    enk   7587782
## 239    enk   9398659
## 240    nyu   8566799
## 241    enk   7587462
## 242    xx    9678316
## 243    enk   5283082
## 244    enk   7588041
## 245    xx    6059994
## 246    enk   7588297
## 247    enk   7583489
## 248    enk   7574868
## 249    enk   7590943
## 250    enk   7594025
## 251    enk   9401636
## 252    af    7589304
## 253    at    6060961
## 254    nyu   7587699
## 255    mau   9254627
## 256    nyu   7593828
## 257    enk   7581468
## 258    enk   7584440
## 259    sa    6062496
## 260    enk   7584902
## 261    enk   6036368
## 262    xx    6063913
## 263    dcu   7019771
## 264    nyu   7586097
## 265    nyu   8566620
## 266    wau   7079651
## 267    enk   7588059
## 268    nyu   7588124
## 269    nyu   6059518
## 270    nr    7590817
## 271    nyu   7592409
## 272    enk   7587852
## 273    xx    9677427
## 274    nyu   7587710
## 275    enk   7022465
## 276    enk   7388811
## 277    nyu   9524415
## 278    enk   2620247
## 279    nyu   7588093
## 280    nyu   7588091
## 281    enk   8561593
## 282    enk   7020882
## 283    enk   7587538
## 284    enk   7019392
## 285    stk   6939600
## 286    ru    7015550
## 287    enk   8561626
## 288    enk   7588519
## 289    enk   6950685
## 290    enk   7586819
## 291    nyu   7021818
## 292    enk   7013046
## 293    jm    7585697
## 294    mp    6940721
## 295    enk   7830695
## 296    enk   9398175
## 297    enk   7585875
## 298    enk   7020701
## 299    nbu   6930548
## 300    enk   7978386
## 301    enk   7587581
## 302    enk   7591824
## 303    ru    7274223
## 304    enk   7978393
## 305    enk   7831750
## 306    enk   7583507
## 307    xxk   7020883
## 308    enk   7588351
## 309    enk   7277646
## 310    enk   7587714
## 311    enk   7587867
## 312    nyu   1822074
## 313    nyu   6937059
## 314    enk   7993604
## 315    nyu   7592407
## 316    nyu   7275156
## 317    enk   9402582
## 318    enk  10555346
## 319    enk   7591732
## 320    za    7590112
## 321    onc   7587670
## 322    enk   7978002
## 323    enk   7394295
## 324    at    7591655
## 325    nr    6061287
## 326    at    7591661
## 327    nyu   6838542
## 328    nyu   7830337
## 329    enk   7575205
## 330    enk   6057778
## 331    enk   6044302
## 332    nyu   6058753
## 333    enk   7578946
## 334    nz    7591845
## 335    enk   8568570
## 336    mau   9397498
## 337    nyu   9524961
## 338    cau   6943192
## 339    enk   7587761
## 340    nyu   7978004
## 341    nyu   3962474
## 342    enk   7584423
## 343    enk   7593314
## 344    enk   7825330
## 345    mau   9400055
## 346    nyu   8566628
## 347    nyu   1029963
## 348    nyu   7591315
## 349    at    7591710
## 350    at    7591634
## 351    at    7591629
## 352    nyu   2437392
## 353    ua    7566737
## 354    enk   9399154
## 355    is    7590694
## 356    mau   7586787
## 357    enk   7568988
## 358    enk   7585883
## 359    enk   7585883
## 360    nyu   6935781
## 361    nkc   7568863
## 362    th    2606804
## 363    nyu   7586852
## 364    enk   7587539
## 365    enk   9524920
## 366    enk   7580237
## 367    nyu   7394366
## 368    enk   7592395
## 369    nyu    842989
## 370    ilu   1277032
## 371    enk   6940791
## 372    enk   7590477
## 373    sa    7589505
## 374    iau  11821741
## 375    enk   7581718
## 376    nr    7590656
## 377    nr    7588772
## 378    enk   9526803
## 379    nyu  10557313
## 380    sa    6062431
## 381    nyu   7575072
## 382    enk   6060024
## 383    nyu   6059926
## 384    xxk   7583385
## 385    enk   7576616
## 386    nyu   1025299
## 387    enk   7022106
## 388    enk   7587506
## 389    enk   8566796
## 390    enk   7587742
## 391    iau   7275179
## 392    nyu   7022470
## 393    nyu   7582222
## 394    nyu   7978342
## 395    enk   7569028
## 396    nyu   7574927
## 397    nyu   7578929
## 398    nyu   7593980
## 399    cou   3146145
## 400    ilu   7387405
## 401    vau   7592408
## 402    nyu   8566802
## 403    enk   7590147
## 404    wlk   6934381
## 405    bs    7589496
## 406    miu   6935349
## 407    nyu  10553472
## 408    enk   1787274
## 409    enk   6943243
## 410    at    7591741
## 411    sa    7589378
## 412    xx    7573075
## 413    enk   7586771
## 414    enk   6957327
## 415    xx    6792302
## 416    nyu   7574939
## 417    nyu  11821832
## 418    enk   7436494
## 419    enk   9401216
## 420    nyu   7581480
## 421    enk   7593918
## 422    enk   9398005
## 423    quc   7576286
## 424    mau   7587638
## 425    enk   7576577
## 426    enk   9401348
## 427    at    7591673
## 428    nyu   7578927
## 429    enk   7588184
## 430    xxu   6808260
## 431    xx    6936045
## 432    sa   10555580
## 433    txu   6809367
## 434    nyu   7581482
## 435    ilu   7573054
## 436    cc   10550616
## 437    nyu   7594127
## 438    enk   1287046
## 439    enk   7581422
## 440    nyu   4025249
## 441    enk   7573085
## 442    nyu   9254683
## 443    onc   7576310
## 444    nyu   7570186
## 445    nyu   7594088
## 446    nyu   7587687
## 447    sa    6062482
## 448    enk   9397115
## 449    nyu   7830497
## 450    enk   7586216
## 451    nyu   9399967
## 452    enk   7275938
## 453    nyu   7590691
## 454    enk   9402741
## 455    enk   7441323
## 456    enk   7587923
## 457    nyu   6708246
## 458    sa    7589288
## 459    nyu   7593923
## 460    sa   10559211
## 461    nr    7590004
## 462    xx    9679765
## 463    enk   9399618
## 464    nyu   7279938
## 465    enk   7597142
## 466    ke    7590438
## 467    enk   7016531
## 468    enk   7016531
## 469    enk   7016531
## 470    hu    7016125
## 471    enk   7016109
## 472    stk   7578142
## 473    at    7591749
## 474    nyu   8560871
## 475    cau   6810507
## 476    oru   7594221
## 477    hu    7016185
## 478    hu    7016062
## 479    hu    7013887
## 480    nyu   7979418
## 481    enk   7977774
## 482    onc   7576318
## 483    enk   7567763
## 484    ie    7587425
## 485    nyu   4192982
## 486    nyu   7588263
## 487    nyu   9400076
## 488    ie    7587424
## 489    rm    6950674
## 490    vau   6950700
## 491    enk   7567313
## 492    mnu   9400260
## 493    enk   9402368
## 494    at    7591687
## 495    nyu  10550623
## 496    enk   7575069
## 497    ne    7993632
## 498    cau   7390330
## 499    enk   7578309
## 500    nr    7590842
## 501    enk   7588678
## 502    enk   8561653
## 503    enk   6061196
## 504    nyu   9397563
## 505    enk   7578303
## 506    nyu   8566617
## 507    ilu   7021850
## 508    enk   6792801
## 509    enk   7568625
## 510    enk  10550997
## 511    enk   7568626
## 512    mp    6940732
## 513    ii    7590182
## 514    nyu   7830329
## 515    enk   7583361
## 516    gw    7994802
## 517    nyu   9524547
## 518    ie    9399177
## 519    enk   9400564
## 520    nyu   6067543
## 521    enk   7015637
## 522    enk   7578921
## 523    enk   9524372
## 524    enk   7582531
## 525    enk   6058219
## 526    enk   7581652
## 527    nr    7590022
## 528    cau   7830785
## 529    nyu   7593767
## 530    xr    6011377
## 531    nyu   7594040
## 532    enk   7587868
## 533    nyu   7597084
## 534    miu   6937749
## 535    is    7588526
## 536    enk   7587681
## 537    cau   7590206
## 538    nik   7588454
## 539    nyu   7597078
## 540    nyu   7594252
## 541    nyu   7593245
## 542    nyu   7593812
## 543    nyu   7594253
## 544    ie    7587781
## 545    nyu   4353714
## 546    enk   7574957
## 547    fr    9400869
## 548    nyu   7597087
## 549    enk   7978374
## 550    enk   7581528
## 551    mnu   7594095
## 552    nyu   7588399
## 553    vau   7578820
## 554    enk   7831842
## 555    ua    7570459
## 556    ua    7570417
## 557    ua    7568738
## 558    ua    7568849
## 559    txu   6955808
## 560    stk   7977909
## 561    nyu   7597081
## 562    enk   7581229
## 563    nyu   7831854
## 564    enk   9398147
## 565    nbu   6932773
## 566    nyu   7390437
## 567    enk   7578790
## 568    sa    6940876
## 569    enk   7578770
## 570    at    7591819
## 571    at    7591792
## 572    nyu   7597128
## 573    enk   7582892
## 574    xr    7830516
## 575    nyu   7593817
## 576    txu   7594072
## 577    mbc   7278819
## 578    snc   7017134
## 579    sa    7589272
## 580    ie    7588369
## 581    riu   7441044
## 582    onc   7588618
## 583    txu   6811692
## 584    ii    6930678
## 585    no    6809296
## 586    nyu   7575210
## 587    ru    7277775
## 588    enk   6059702
## 589    enk   6060007
## 590    ru    7017926
## 591    nyu   7589513
## 592    nyu   7594338
## 593    onc   7576411
## 594    alu   7594114
## 595    enk   9399048
## 596    ua    7449666
## 597    ua    7449598
## 598    dcu   6930700
## 599    nyu   8563119
## 600    xx    9677397
## 601    xx    9676797
## 602    enk   7573009
## 603    nyu   9397148
## 604    xx    9679718
## 605    enk   6067236
## 606    enk   7588435
## 607    ctu   6928842
## 608    cau   9398547
## 609    nyu   7597069
## 610    nyu   6958746
## 611    nyu   7587458
## 612    nyu   7594336
## 613    enk   6809942
## 614    nyu   7594053
## 615    at    7591648
## 616    xx   10558141
## 617    nz    4335253
## 618    sa    7589383
## 619    at    7591686
## 620    at    7591698
## 621    cau   9400035
## 622    onc   7588787
## 623    onc   7574842
## 624    li    3313197
## 625    enk   7571861
## 626    txu   7594129
## 627    enk   7581181
## 628    enk   9398642
## 629    ua    7448271
## 630    enk   7588379
## 631    enk   6046733
## 632    enk   7588378
## 633    nyu   7594333
## 634    enk   9402851
## 635    enk   9402869
## 636    ru    7021668
## 637    flu   7978315
## 638    ii    7828600
## 639    nyu   7594254
## 640    enk   7587735
## 641    enk   7977119
## 642    enk   6811209
## 643    enk   6791133
## 644    tnu   9397486
## 645    enk   8564684
## 646    enk   9686028
## 647    nyu   9677179
## 648    nyu   9679008
## 649    at    9401589
## 650    nyu   7594120
## 651    wlk   7588317
## 652    stk   9403364
## 653    stk   9397179
## 654    enk   6790376
## 655    utu   7979395
## 656    enk   7979358
## 657    utu   7979391
## 658    utu   7979392
## 659    at    7591603
## 660    ie    7588443
## 661    enk   6061804
## 662    alu   5235312
## 663    enk   7588423
## 664    enk   7436680
## 665    enk  10555320
## 666    th    6943202
## 667    enk   6808121
## 668    enk   7581367
## 669    nyu   7593973
## 670    enk   7023620
## 671    at    7591818
## 672    mau   7444108
## 673    nyu   7594284
## 674    ie    7588216
## 675    nyu   6938709
## 676    enk   6028454
## 677    tu    7979362
## 678    tu    7979365
## 679    ie    7588373
## 680    nyu   7594288
## 681    pau   7574949
## 682    ie    7588503
## 683    nyu   7581288
## 684    nyu   7594145
## 685    nyu   9525086
## 686    cau   7594389
## 687    ie    7978290
## 688    enk   7588389
## 689    cau   7594325
## 690    pau   4962989
## 691    enk   7573074
## 692    oru   7594116
## 693    nyu   6063911
## 694    enk   7586087
## 695    enk   9524581
## 696    enk   9399176
## 697    enk  10555319
## 698    enk   9400187
## 699    enk   9397138
## 700    stk   9399079
## 701    stk   6810677
## 702    enk   9398350
## 703    enk   9403033
## 704    cau   7978377
## 705    enk   7588072
## 706    enk   7977908
## 707    ctu   7589144
## 708    enk   7978303
## 709    wlk   7588460
## 710    sa    7590235
## 711    enk   9398088
## 712    sz    6943906
## 713    enk   7588436
## 714    ii    6935713
## 715    pk    7828599
## 716    ctu  10563146
## 717    nyu  10561412
## 718    nyu  10559944
## 719    nyu  10559482
## 720    nyu  10559481
## 721    ilu  10559486
## 722    enk  10561601
## 723    xx   10550362
## 724    za   10550507
## 725    nyu  10558249
## 726    nyu  10557130
## 727    ctu  10557167
## 728    nyu  10557005
## 729    nyu  10557022
## 730    pau  10556970
## 731    enk  10556962
## 732    nyu  10556945
## 733    nyu  10557092
## 734    nju   9914340
## 735    nyu  10557139
## 736    enk  10557119
## 737    pau  10557121
## 738    enk  10556829
## 739    nyu  10557101
## 740    it    8905954
## 741    enk  10560297
## 742    nyu  10558261
## 743    nyu  10558870
## 744    nyu  10558929
## 745    nyu  10558914
## 746    nyu  10558503
## 747    nyu  10559508
## 748    inu  10558539
## 749    nyu  10557135
## 750    meu  10557152
## 751    nyu  10557037
## 752    cou   2716883
## 753    nyu  10563555
## 754    nyu  10562467
## 755    nyu  10559596
## 756    at    5077420
## 757    nyu   9400112
## 758    enk   7581323
## 759    enk   7589141
## 760    at    7591620
## 761    xr    7273170
## 762    enk   7978005
## 763    nyu   9397164
## 764    nyu   6063910
## 765    nyu   5546051
## 766    ii    7832723
## 767    cau  11809774
## 768    nyu   7581509
## 769    ctu   9254714
## 770    ctu   8563120
## 771    nyu   7594280
## 772    enk   7585426
## 773    enk   7585426
## 774    yu    8562509
## 775    enk   7588505
## 776    ctu   9397444
## 777    ctu   9254643
## 778    ctu   9397923
## 779    ctu   8564699
## 780    ctu   9397964
## 781    ctu   8563079
## 782    ctu   9397631
## 783    ctu   8560869
## 784    ctu   8561265
## 785    ctu  10551000
## 786    ctu   9397495
## 787    pau   9397146
## 788    pau   9254650
## 789    ctu   8563070
## 790    ctu  11810633
## 791    ctu   9254639
## 792    ctu   9397888
## 793    ctu   9397915
## 794    ctu   9254635
## 795    ctu   9254634
## 796    enk   7830303
## 797    enk   1600535
## 798    np    6929557
## 799    ilu   1276541
## 800    enk   6946422
## 801    enk   9802695
## 802    nyu   9529324
## 803    nyu   9803273
## 804    nyu   9803244
## 805    enk   9803085
## 806    lau   9397596
## 807    sa    9401319
## 808    xv    8561969
## 809    sa    9524215
## 810    enk  10559730
## 811    enk  10563306
## 812    cou   9397568
## 813    enk  10563303
## 814    ctu   5655565
## 815    pau   9254674
## 816    pau   9397143
## 817    pau   9400048
## 818    ctu   9397469
## 819    ctu   6937276
## 820    ctu   8561604
## 821    ctu   9397834
## 822    nyu   9397509
## 823    ctu   6937230
## 824    ctu   8560868
## 825    pau   9254697
## 826    pau   9397501
## 827    pau   9254691
## 828    ctu   6937276
## 829    xxu   9397151
## 830    wlk   9399250
## 831    mou   9524661
## 832    nr    9401616
## 833    ctu   8561265
## 834    enk   9524281
## 835    xxu   9399352
## 836    tnu   9400056
## 837    sa    9524272
## 838    enk    484464
## 839    gw    5844779
## 840    enk   9400788
## 841    dcu  11811504
## 842    pau   9524166
## 843    nyu   9524525
## 844    dk    9524182
## 845    inu   9048089
## 846    nyu   9048091
## 847    nju   7579750
## 848    cau   7571791
## 849    nyu   7585508
## 850    xx    6059464
## 851    gh    6060781
## 852    enk   6058829
## 853    enk   6061204
## 854    xx    6061205
## 855    enk   6059422
## 856    nyu   6061784
## 857    enk   7586324
## 858    enk   6061984
## 859    enk   7387376
## 860    inu   1276187
## 861    enk   7586877
## 862    nyu   6056704
## 863    enk   7586359
## 864    enk   7826059
## 865    enk   7586178
## 866    enk   6055277
## 867    enk   1422273
## 868    nyu   1113336
## 869    xx    6059696
## 870    ru    7019530
## 871    nyu   6055821
## 872    enk   7581532
## 873    enk   6058181
## 874    enk   7568511
## 875    enk   6056886
## 876    enk   7583363
## 877    enk   7587337
## 878    enk   7568134
## 879    mau   6061915
## 880    ctu   7597231
## 881    enk   6059790
## 882    enk   6059784
## 883    enk   6060035
## 884    enk   6060036
## 885    enk   6059842
## 886    enk   6059731
## 887    enk   7587937
## 888    enk   7569046
## 889    mau   6049611
## 890    nyu   6936161
## 891    nyu   7830729
## 892    nyu   7574890
## 893    enk   7580657
## 894    nyu   8560882
## 895    enk   1027246
## 896    enk   7568521
## 897    nyu   7594022
## 898    enk   7586751
## 899    enk   7586853
## 900    cau   6056666
## 901    nyu   8561297
## 902    nyu   6940869
## 903    nyu   7592318
## 904    enk   7586068
## 905    nyu   7586955
## 906    enk   6059999
## 907    enk   6059100
## 908    nyu   7446558
## 909    nyu   7977892
## 910    tu    7979364
## 911    nyu   7442503
## 912    enk   7576620
## 913    enk   6062955
## 914    mdu   8561672
## 915    enk   6058551
## 916    nyu   7568203
## 917    enk   7571740
## 918    enk   1197637
## 919    enk   1425521
## 920    enk   7573080
## 921    nyu   7587820
## 922    enk  11810976
## 923    xx    7585418
## 924    enk   7587819
## 925    nyu   7978359
## 926    ohu   6785655
## 927    nyu   7586033
## 928    nyu    433427
## 929    enk   6058968
## 930    miu   1026322
## 931    ch   10550630
## 932    nyu    921219
## 933    enk   7588074
## 934    enk    538325
## 935    nyu     18301
## 936    nyu   1030628
## 937    enk   6059937
## 938    enk   7571738
## 939    enk   7831806
## 940    nyu   1377201
## 941    enk   7587384
## 942    enk    306602
## 943    enk   7579023
## 944    enk   9397072
## 945    nyu   9400067
## 946    nyu   6790611
## 947    enk   7016535
## 948    enk   7579008
## 949    nyu   6061986
## 950    enk   9397700
## 951    enk   6059850
## 952    enk   6063918
## 953    enk   6059431
## 954    enk   6058906
## 955    enk   7587931
## 956    enk   7588058
## 957    meu   7593212
## 958    nyu   6033436
## 959    ke    6062698
## 960    enk   6061488
## 961    at    6060714
## 962    enk   7587647
## 963    cou   6060019
## 964    sa    6062467
## 965    enk   1188668
## 966    ug    6062584
## 967    bu    8562597
## 968    enk    482529
## 969    nyu   6067348
## 970    dcu   7017272
## 971    dcu   7017272
## 972    nyu   7584782
## 973    enk   6058829
## 974    nyu   7592389
## 975    enk   6034655
## 976    nyu   6034642
## 977    nyu   7022222
## 978    enk   6057869
## 979    gw    6058130
## 980    enk   6058188
## 981    nyu   7831934
## 982    xx    7594082
## 983          6058803
## 984    nyu   6940764
## 985    nyu   7830586
## 986    nyu   7830634
## 987    enk  11811502
## 988    nyu   1826552
## 989    nyu   7587693
## 990    nyu   6056739
## 991    nyu   7019475
## 992    at    6061566
## 993    enk   7976194
## 994    enk   7589407
## 995    nyu   7993801
## 996    enk   7584457
## 997    enk   6059632
## 998    nyu   7585349
## 999    nyu   6849530
## 1000   nyu  10553510
## 1001   enk   6059030
## 1002   enk   9401157
## 1003   nyu   7588257
## 1004   enk   7574959
## 1005   at    6060973
## 1006   nyu   7587483
## 1007   nyu    828243
## 1008   nyu   8324516
## 1009   enk   7587426
## 1010   nyu   7831843
## 1011   enk   9398118
## 1012   enk   7831817
## 1013   enk   7594251
## 1014   onc   7576319
## 1015   nyu   7589491
## 1016   enk   7443508
## 1017   mau   7573107
## 1018   enk   7574961
## 1019   enk   7576617
## 1020   nyu   7569053
## 1021   nyu   6058816
## 1022   enk   6061828
## 1023   nyu   7830551
## 1024   nyu   7587764
## 1025   nyu   7584421
## 1026   at    6060919
## 1027   nyu   7022096
## 1028   enk   7581529
## 1029   nyu   7592420
## 1030   enk   7976193
## 1031   enk   7576640
## 1032   nyu   7589158
## 1033   ng    6061310
## 1034   cau   7578828
## 1035   enk   7594105
## 1036   enk   7588246
## 1037   nyu   8566794
## 1038   enk   7586100
## 1039   enk   7571686
## 1040   enk   9400031
## 1041   enk   7274069
## 1042   enk   9397113
## 1043   enk   7587265
## 1044   enk   7574973
## 1045   xx    7017827
## 1046   rur   6792245
## 1047   enk   7581724
## 1048   enk   7021853
## 1049   enk   7578872
## 1050   enk   8560870
## 1051   enk   7588332
## 1052   enk   7575013
## 1053   enk   7597141
## 1054   enk   7022280
## 1055   enk   7586741
## 1056   pau   7574914
## 1057   rur   7021698
## 1058   nyu   7583410
## 1059   rur   7022529
## 1060   nr    6061313
## 1061   enk   9397974
## 1062   inu   7588240
## 1063   cau   7278937
## 1064   enk   7019718
## 1065   cau   7278933
## 1066   enk   6941840
## 1067   enk   7825251
## 1068   nmu   6003525
## 1069   at    6060950
## 1070   enk   7578800
## 1071   enk   7583414
## 1072   enk   7274393
## 1073   nyu   8324520
## 1074   nyu   7578836
## 1075   at    7591784
## 1076   rur   6947858
## 1077   enk   6060231
## 1078   enk   7571739
## 1079   enk   7277633
## 1080   nyu   7587630
## 1081   ilu   7586183
## 1082   nyu   7570220
## 1083   mau   6949722
## 1084   nyu   7450025
## 1085   at    6060739
## 1086   rh    6060463
## 1087   enk   7576615
## 1088   nyu   7587924
## 1089   ur    6792249
## 1090   enk   7584425
## 1091   inu   8566577
## 1092   nyu   7583409
## 1093   enk    980943
## 1094   at    6061524
## 1095   nr    6060018
## 1096   enk   7277714
## 1097   mau  10550622
## 1098   unr   6056087
## 1099   nyu   7574878
## 1100   at    6060711
## 1101   rur   6067219
## 1102   enk   6943186
## 1103   nyu   7579020
## 1104   cau   6019526
## 1105   nyu   9400109
## 1106   enk   7586114
## 1107   cau   9400000
## 1108   at    6061483
## 1109   enk  11810635
## 1110   enk   7586771
## 1111   enk   7586771
## 1112   stk   7081083
## 1113   at    7018246
## 1114   rur   8561671
## 1115   enk   6060958
## 1116   wau   3265296
## 1117   at     470280
## 1118   enk   6063791
## 1119   onc   7977862
## 1120   at    6061485
## 1121   enk   6060644
## 1122   enk   8561078
## 1123   enk   6059062
## 1124   mau   7978339
## 1125   enk   7276113
## 1126   ke    6062701
## 1127   unr   7018592
## 1128   enk   7571806
## 1129   nyu   6934514
## 1130   enk   7587700
## 1131   cau   7576515
## 1132   pp    6063780
## 1133   enk   7593988
## 1134   enk   9401098
## 1135   enk   7593836
## 1136   enk   7575202
## 1137   nyu   7587622
## 1138   yu    7019190
## 1139   cau    710976
## 1140   nyu  11821274
## 1141   xx    6059326
## 1142   mau   7575233
## 1143   mau   7575253
## 1144   kn    6940788
## 1145   ctu  11813987
## 1146   enk   7586806
## 1147   enk   7021574
## 1148   enk   6024324
## 1149   enk   7587357
## 1150   enk   7586147
## 1151   nyu   6057503
## 1152   enk   6060740
## 1153   onc   1069839
## 1154   ru    8561260
## 1155   ctu   7021817
## 1156   ctu   8561592
## 1157   enk   7588125
## 1158   sa    6061636
## 1159   enk   7588299
## 1160   enk   7578818
## 1161   ke    6062699
## 1162   nr    6061393
## 1163   ctu    749232
## 1164   enk   1188269
## 1165   cu    6062310
## 1166   nyu   9398180
## 1167   gh    6062644
## 1168   enk   7569103
## 1169   miu   7577681
## 1170   enk   7576138
## 1171   ntc   5998749
## 1172   nyu   7588244
## 1173   enk   6060959
## 1174   enk   6061512
## 1175   enk   7593236
## 1176   nyu   7587623
## 1177   ke    6062574
## 1178   nyu   6014295
## 1179   enk   7587451
## 1180   cau   7594039
## 1181   nyu    719450
## 1182   enk   7571744
## 1183   enk   7394377
## 1184   enk   6060010
## 1185   at      82864
## 1186   ctu   8560917
## 1187   nyu  11821807
## 1188   enk   6059367
## 1189   ke    6062714
## 1190   enk   7583517
## 1191   is    6056651
## 1192   enk   7588079
## 1193   enk   7571851
## 1194   nyu   7592394
## 1195   ctu   7596119
## 1196   ctu   7580414
## 1197   nyu   7591849
## 1198   nyu   6056901
## 1199   enk   7589426
## 1200   enk  10555600
## 1201         9399017
## 1202   enk   7586905
## 1203   enk    482531
## 1204         6059509
## 1205   nyu   7588193
## 1206   us    6060273
## 1207         7586933
## 1208   nyu   6059914
## 1209   enk   7586179
## 1210   mau   6058766
## 1211   enk   6790616
## 1212   nyu   6064007
## 1213   nyu   7977981
## 1214   enk   1188697
## 1215   enk  10555324
## 1216   at    6060713
## 1217   at    6060881
## 1218   enk   6058088
## 1219         7586726
## 1220   enk   6059858
## 1221   sa    6062505
## 1222   enk   7980213
## 1223   enk   7590910
## 1224   enk   6058337
## 1225   nyu   7016465
## 1226   enk   7569034
## 1227   nyu   7278873
## 1228   nyu   7588137
## 1229   mau   8566783
## 1230   rur   6947372
## 1231   enk   9397679
## 1232   enk   7571687
## 1233   enk   6059982
## 1234   nyu   7443514
## 1235   cau   7579036
## 1236   rh    6060472
## 1237   at    6060864
## 1238   enk   7575215
## 1239   enk   7591682
## 1240   enk   7591701
## 1241   nyu   7393941
## 1242   onc   7275933
## 1243   enk   7596851
## 1244   nyu   9398643
## 1245   rur   7276076
## 1246   at    6061563
## 1247   enk   7021634
## 1248   enk   7587805
## 1249   nyu   7993756
## 1250   nr    6941067
## 1251   nyu   9524392
## 1252   enk   6059324
## 1253   enk   7279060
## 1254   enk   7021902
## 1255   nyu   7575201
## 1256   rur   6060137
## 1257   enk   6059925
## 1258   enk   7590200
## 1259   nyu   7586823
## 1260   at    6061530
## 1261   err   6947355
## 1262   nyu   7588522
## 1263   enk   7592329
## 1264   nyu   7587832
## 1265   nyu   7581619
## 1266   at    6061518
## 1267   unr   7017155
## 1268   enk   8564682
## 1269   enk   6025062
## 1270   nyu   7586942
## 1271   enk   7022103
## 1272   nyu   7444202
## 1273   enk   7585459
## 1274   nyu   6809448
## 1275   rm    6939069
## 1276   enk   6941645
## 1277   sa    6941564
## 1278   ch    6943255
## 1279   enk   6939622
## 1280   cc    6940685
## 1281   enk   1276824
## 1282   enk   6934332
## 1283   oru   6936060
## 1284   nyu   6934461
## 1285   rur   6936035
## 1286   err   6936121
## 1287   inu    607799
## 1288   at    6941638
## 1289   mau    831735
## 1290   mdu   6935423
## 1291   mdu   6935423
## 1292   enk   6939056
## 1293   mau   6809807
## 1294   nyu   6935495
## 1295   enk   7394152
## 1296   nyu   6938710
## 1297   ke     146477
## 1298   nyu    703791
## 1299   enk   6934612
## 1300   ic    6937733
## 1301   ic    6937738
## 1302   hu    6936266
## 1303   enk   6943198
## 1304   lh    6811948
## 1305   onc   6932854
## 1306   nju   6809101
## 1307   ko    6084223
## 1308   ko    6084223
## 1309   pau   6940858
## 1310   at    6943220
## 1311   nyu   6939573
## 1312   enk   6933374
## 1313   vtu   6940784
## 1314   xx    6941203
## 1315   nyu   6941698
## 1316   nyu   6936237
## 1317   enk   6936422
## 1318   ohu   6938693
## 1319   kyu   6809999
## 1320   pau   6811668
## 1321   nyu   6929122
## 1322   hk    6943253
## 1323   scu   1197457
## 1324   miu   6809404
## 1325   enk   1276829
## 1326   nyu   6812046
## 1327   enk   3928555
## 1328   enk   6938336
## 1329   ja    6930101
## 1330   nyu   1277055
## 1331   ilu   1056297
## 1332   nyu   6812001
## 1333   nyu   1276479
## 1334   ohu   6931607
## 1335   nyu   1201625
## 1336   enk   6938357
## 1337   txu   1645828
## 1338   enk   1277036
## 1339   vau   6088679
## 1340   enk   1277074
## 1341   enk   1276717
## 1342   xx    6929967
## 1343   nyu   6929966
## 1344   nyu   6058680
## 1345   nju   6938485
## 1346   ii    1075850
## 1347   nyu   6938463
## 1348   inu   6928959
## 1349   nyu   6809941
## 1350   enk   7021577
## 1351   enk   7021577
## 1352   miu   8566688
## 1353   enk   7571555
## 1354   nyu   7567251
## 1355   inu   7592380
## 1356   enk    193373
## 1357   nyu    383435
## 1358   ncu   1030216
## 1359   nyu   1049703
## 1360   |||      9013
## 1361   cau    126972
## 1362   mau   1015206
## 1363   nyu   1024175
## 1364   nyu   1417677
## 1365   nyu     84699
## 1366   nyu   1029832
## 1367   nyu   2428918
## 1368   nyu     27689
## 1369   ctu    684761
## 1370   enk   1424941
## 1371   enk   1424941
## 1372   nyu    966006
## 1373   nyu   1198132
## 1374   enk   1784483
## 1375   nyu     12915
## 1376   enk    265793
## 1377   nyu    692386
## 1378   enk   1913279
## 1379   enk   1424746
## 1380   nyu    194681
## 1381   nyu   1015666
## 1382   nyu   1016151
## 1383   enk   1419924
## 1384   enk   1424941
## 1385   nyu   1419637
## 1386   enk   1186081
## 1387   nyu   1424751
## 1388   nyu    682471
## 1389   nyu    703642
## 1390   nyu    102555
## 1391   enk    738710
## 1392   nyu     31058
## 1393   nyu    178385
## 1394   nyu    210589
## 1395   nyu     35387
## 1396   nyu    230319
## 1397   mau   1218728
## 1398   mau    184906
## 1399   enk     99654
## 1400   enk    979229
## 1401   nyu    251652
## 1402   nyu    673607
## 1403   nyu    186245
## 1404   nyu   1030658
## 1405   enk   1209940
## 1406   |||   1200405
## 1407   enk   1357266
## 1408   nyu   1185793
## 1409   nyu   1016084
## 1410   nyu   1050403
## 1411   ilu    293780
## 1412   enk     97136
## 1413   nyu    673480
## 1414   enk   1219275
## 1415   at     673609
## 1416   cau    299918
## 1417   ncu    673613
## 1418   xx     673616
## 1419   at     673617
## 1420   nyu     36351
## 1421   nyu     93095
## 1422   nyu    673542
## 1423   nyu    704302
## 1424   nyu   1376442
## 1425   enk   1376454
## 1426   nyu   1376391
## 1427   enk   1376422
## 1428   enk   1398793
## 1429   nyu    259889
## 1430   enk   1910696
## 1431   enk   1398798
## 1432   enk     41309
## 1433   ilu   1376497
## 1434   nyu    756235
## 1435   nyu   1398813
## 1436   nyu   1376589
## 1437   enk   1910772
## 1438   nyu    190154
## 1439   nyu   1376653
## 1440   nyu   1398823
## 1441   enk   1910782
## 1442   enk   1910516
## 1443   nyu   1376219
## 1444   nyu   1376221
## 1445   inu    672189
## 1446   enk    723539
## 1447   enk    478329
## 1448   nyu   1188292
## 1449   nyu   1793924
## 1450   nyu   1108479
## 1451   nyu    178944
## 1452   nyu    179633
## 1453   nyu   1015273
## 1454   nyu    622734
## 1455   miu   1003894
## 1456   inu    389430
## 1457   nyu   1847664
## 1458   enk   1498831
## 1459   nyu   1028889
## 1460   enk   1464165
## 1461   enk    584599
## 1462   nyu   1110448
## 1463   nyu   1377142
## 1464   nyu    132107
## 1465   nyu    507611
## 1466   nyu   1003939
## 1467   my     307665
## 1468   nyu    695167
## 1469   enk    672914
## 1470   nyu   1218727
## 1471   nyu   1112551
## 1472   nyu    481473
## 1473   nyu   1910983
## 1474   enk   1398876
## 1475   nyu   1030011
## 1476   nyu   1376992
## 1477   nyu   1238828
## 1478   nyu    393104
## 1479   nju    391360
## 1480   enk    391637
## 1481   nyu   1376956
## 1482   nyu    216134
## 1483   enk   1377098
## 1484   enk     30801
## 1485   nyu   1186092
## 1486   nyu   1194541
## 1487   nyu   1186090
## 1488   enk    101407
## 1489   nyu    632705
## 1490   pau   1418330
## 1491   mau    632803
## 1492   pau    175492
## 1493   nyu    707137
## 1494   nyu    143600
## 1495   enk   1774798
## 1496   enk    721937
## 1497   nyu   1185888
## 1498   nyu   1185884
## 1499   enk   1774813
## 1500   nyu    632686
## 1501   enk    301989
## 1502   nyu    632800
## 1503   nyu   1185940
## 1504   mau   1185941
## 1505   flu    219022
## 1506   enk    317807
## 1507   nyu   1791861
## 1508   nyu    433944
## 1509   nyu    434201
## 1510   enk    433950
## 1511   nyu    717776
## 1512   enk    317807
## 1513   enk    317807
## 1514   nyu    434453
## 1515   nyu    507626
## 1516   nyu    174266
## 1517   nyu    432800
## 1518   |||     10606
## 1519   onc    436743
## 1520   onc    175724
## 1521   ilu    217048
## 1522   onc      2432
## 1523   enk   1224324
## 1524   at     184323
## 1525   nyu    592112
## 1526   nyu    256449
## 1527   fr     589893
## 1528   nyu    590071
## 1529   nyu    536746
## 1530   nyu    129456
## 1531   pp     758321
## 1532   nyu    590292
## 1533   nyu    590797
## 1534   nyu     88527
## 1535   nyu    757523
## 1536   nyu       809
## 1537   onc    704793
## 1538   onc    295859
## 1539   onc    211935
## 1540   nyu    230899
## 1541   mau    589420
## 1542   nyu   1056404
## 1543   at     592265
## 1544   nyu    591101
## 1545   nyu    257025
## 1546   mau    537941
## 1547   nyu    537937
## 1548   nyu    537887
## 1549   enk    536842
## 1550   nyu    591440
## 1551   nyu    591445
## 1552   at     592351
## 1553   at     592355
## 1554   enk    536234
## 1555   onc     91009
## 1556   nyu    536384
## 1557   nyu    591322
## 1558   enk    591946
## 1559   enk    592404
## 1560   mau    592396
## 1561   nyu    256120
## 1562   nyu    757240
## 1563   nyu   1030006
## 1564   enk   1030251
## 1565   nyu   1217796
## 1566   |||    507506
## 1567   nyu    432172
## 1568   enk    394636
## 1569   enk    591045
## 1570   nyu   1110460
## 1571   mau    724977
## 1572   nyu    255560
## 1573   nyu    701745
## 1574   nyu    103150
## 1575   ii    1393235
## 1576   ctu    729950
## 1577   cou    685264
## 1578   nyu    966268
## 1579   nyu    980816
## 1580   pau    983886
## 1581   enk    748653
## 1582   nyu   1188217
## 1583   si     754433
## 1584   enk    672887
## 1585   pau    633445
## 1586   nyu   1376995
## 1587   nyu    624223
## 1588   nyu   1230282
## 1589   |||    507661
## 1590   nyu   1054899
## 1591   nyu   1021209
## 1592   nyu   1375656
## 1593   nyu    625790
## 1594   nyu    981384
## 1595   nyu   1030451
## 1596   enk   1186077
## 1597   miu    257943
## 1598   nyu   1187459
## 1599   nyu   1008997
## 1600   nyu   1218601
## 1601   pau    703012
## 1602   xx    1564248
## 1603   rur    727179
## 1604   nyu   1013613
## 1605   kyu   1028359
## 1606   nyu   1184916
## 1607   cc    1185272
## 1608   nyu   1418486
## 1609   nyu   1419404
## 1610   nyu   2433288
## 1611   nyu   1021021
## 1612   nyu   1424929
## 1613   onc    777366
## 1614   enk    312289
## 1615   ii     773806
## 1616   enk    777234
## 1617   enk    236664
## 1618   bg     585957
## 1619   rur    116300
## 1620   enk    157846
## 1621   ie     115980
## 1622   enk    271184
## 1623   enk    117298
## 1624   enk    118842
## 1625   onc    119197
## 1626   stk    157997
## 1627   enk    382087
## 1628   enk    200209
## 1629   cc     244295
## 1630   my     815137
## 1631   enk    203709
## 1632   enk    282934
## 1633   nyu   1200147
## 1634   enk    416835
## 1635   mau    136537
## 1636   mau    538577
## 1637   stk   2202307
## 1638   enk    765564
## 1639   enk    147729
## 1640   enk   2203654
## 1641   enk    763011
## 1642   nyu   2192567
## 1643   enk    819976
## 1644   onc    765854
## 1645   enk    228626
## 1646   stk    231975
## 1647   enk   2195755
## 1648   nyu   1029672
## 1649   nyu   1029670
## 1650   enk   1363866
## 1651   nyu   1417646
## 1652   enk   1424276
## 1653   nju    688557
## 1654   mau    219615
## 1655   nyu   1353787
## 1656   nyu    179737
## 1657   nyu      6021
## 1658   enk   1015250
## 1659   nyu   1113178
## 1660   nyu   1417370
## 1661   nyu    764916
## 1662   miu    303213
## 1663   nyu   1053022
## 1664   nyu   1204938
## 1665   enk    631240
## 1666   nyu    437202
## 1667   inu     27076
## 1668   mau   1219222
## 1669   mdu   1621957
## 1670   enk    354932
## 1671   enk    809823
## 1672   nyu    272678
## 1673   enk   1226773
## 1674   nyu   1424942
## 1675   nyu   1030668
## 1676   nyu    100597
## 1677   nyu    713447
## 1678   nyu    127581
## 1679   nyu   1211465
## 1680   hk    1919057
## 1681   nyu   1185243
## 1682   nyu     33795
## 1683   nyu    100281
## 1684   ii     507947
## 1685   enk    482534
## 1686   mau    717456
## 1687   nyu    431385
## 1688   nbu    589940
## 1689   nyu    144092
## 1690   nyu    144092
## 1691   nyu   1188287
## 1692   nyu     95255
## 1693   nyu   1212115
## 1694   enk    108815
## 1695   nyu    161435
## 1696   xx    2189836
## 1697   enk    833226
## 1698   enk   2198447
## 1699   rur   2202428
## 1700   enk   2709777
## 1701   enk   2204137
## 1702   cn    2198544
## 1703   enk    334580
## 1704   enk   2199708
## 1705   is     445240
## 1706   sa    2200033
## 1707   cau   2198139
## 1708   rur   2199486
## 1709   rur   2200772
## 1710   dcu   1225288
## 1711   enk      7712
## 1712   enk   1225432
## 1713   ii    1006468
## 1714   ii      99759
## 1715   nyu    180347
## 1716   nyu   1027503
## 1717   xx    1110418
## 1718   |||      4428
## 1719   miu   1353693
## 1720   nyu    717753
## 1721   hiu    192996
## 1722   nyu   1207640
## 1723   enk   1806542
## 1724   nyu    215809
## 1725   xx     694943
## 1726   mau     26956
## 1727   nyu    745341
## 1728   nyu    197121
## 1729   nyu    672437
## 1730   nyu    709268
## 1731   nju    738916
## 1732   cc    1774373
## 1733   enk   1205799
## 1734   enk    213229
## 1735   nyu    716332
## 1736   nyu   1215522
## 1737   nyu   1769034
## 1738   nyu    477239
## 1739   enk   1782086
## 1740   nyu    626217
## 1741   ii     995883
## 1742   enk   1904249
## 1743   enk   1775982
## 1744   nyu    256194
## 1745   nyu    984271
## 1746   mau    629434
## 1747   nyu    633248
## 1748   enk    292855
## 1749   hk    1185229
## 1750   nyu   1417254
## 1751   nyu    658257
## 1752   nyu    260607
## 1753   nyu    719778
## 1754   nyu    216543
## 1755   le     966360
## 1756   cou   3070640
## 1757   nyu   1774863
## 1758   enk    428782
## 1759   nyu   1224820
## 1760   nyu    708531
## 1761   nyu     98563
## 1762   nyu   1786347
## 1763   nyu   1424563
## 1764   nyu     12224
## 1765   nyu    591904
## 1766   enk   1910465
## 1767   enk   1910467
## 1768   nyu    391823
## 1769   nyu   1220164
## 1770   nyu   1031797
## 1771   nyu   1066616
## 1772   nyu   1111535
## 1773   nyu   1880713
## 1774   nyu   1231121
## 1775   nyu   1110413
## 1776   onc   1219763
## 1777   enk   1438729
## 1778   nyu   1775724
## 1779   enk    213505
## 1780   nyu    597022
## 1781   enk    211145
## 1782   inu    192608
## 1783   nyu   1375806
## 1784   nyu   1029854
## 1785   enk   2104679
## 1786   nyu    624167
## 1787   nyu   1197247
## 1788   nyu    762476
## 1789   nyu 100071769
## 1790   enk   1744440
## 1791   ja    1184842
## 1792   |||   1223114
## 1793   nyu    763166
## 1794   vtu    396508
## 1795   nyu   1205404
## 1796   mau    390331
## 1797   enk   1205410
## 1798   nyu   1375118
## 1799   nyu    297565
## 1800   enk    687923
## 1801   nyu   1051307
## 1802   nyu    298896
## 1803   enk    672851
## 1804   nyu   1199746
## 1805   enk    393077
## 1806   nyu   1185360
## 1807   xx    1210364
## 1808   nyu   1188563
## 1809   enk    188025
## 1810   ohu   1375500
## 1811   enk   1188595
## 1812   enk    729505
## 1813   enk    263984
## 1814   enk   1218707
## 1815   nyu    683798
## 1816   nyu 100033832
## 1817         1336880
## 1818   ph      90379
## 1819   nyu    264585
## 1820   |||     39295
## 1821   enk    731324
## 1822   |||     43512
## 1823   rur   1227833
## 1824   nyu   1030563
## 1825   nyu   1521520
## 1826   nyu     82899
## 1827   enk   1793948
## 1828   nyu   1051038
## 1829   nyu   1774335
## 1830   enk    317807
## 1831   nyu   1059761
## 1832   enk   1783915
## 1833   enk    317357
## 1834   enk    757170
## 1835   nyu   1108491
## 1836   miu   2433330
## 1837   enk   1194285
## 1838   mau   1187131
## 1839   nyu   1798826
## 1840   nyu   1188487
## 1841   ohu    831396
## 1842   ohu    831396
## 1843   enk    750013
## 1844   nyu   1111794
## 1845   nyu   1378115
## 1846   onc   1398921
## 1847   nyu   1197759
## 1848   enk    148508
## 1849   hk     133783
## 1850   nyu   1189212
## 1851   nyu    428946
## 1852   enk   1793956
## 1853   enk    537269
## 1854   enk    537266
## 1855   enk    536591
## 1856   nyu    763053
## 1857   enk    591640
## 1858   nyu    591821
## 1859   nyu    591064
## 1860   nyu    591050
## 1861   enk    538891
## 1862   pau     13620
## 1863   enk   1224395
## 1864   nyu    719892
## 1865   nyu    491598
## 1866   enk   1358261
## 1867   nyu    393873
## 1868   nyu   1219653
## 1869   enk    508059
## 1870   ctu      3018
## 1871   nyu    728189
## 1872   nyu   1775740
## 1873   ilu   1564244
## 1874   nyu    299077
## 1875   nyu    980936
## 1876   nyu   2933932
## 1877   nyu   1029511
## 1878   mau    662856
## 1879   nyu   1051040
## 1880   enk    743768
## 1881   nyu     23388
## 1882   enk   1806692
## 1883   enk   1226957
## 1884   nyu    983221
## 1885   rur    721839
## 1886   nyu    180789
## 1887   nyu   1224400
## 1888   enk   1204013
## 1889   nyu    434701
## 1890   nyu    628691
## 1891   nyu    726057
## 1892   nyu   1911475
## 1893   nyu     45169
## 1894   nyu   1188742
## 1895   enk    433448
## 1896   nyu    262794
## 1897   nyu   1015407
## 1898   nyu   1442502
## 1899   nyu    629426
## 1900   cn    1848233
## 1901   nyu   1188815
## 1902   mau    726066
## 1903   txu    707280
## 1904   enk   1775875
## 1905   enk   1230441
## 1906   enk   1230077
## 1907   enk   1377975
## 1908   nyu    176406
## 1909   enk   3332159
## 1910   at     264033
## 1911   nyu   1376835
## 1912   enk   1376833
## 1913   enk   1910898
## 1914   enk   1910891
## 1915   enk   1910890
## 1916   mau   1398847
## 1917   |||   1376823
## 1918   enk   1910922
## 1919   at     825212
## 1920   at     263692
## 1921   at    1910921
## 1922   enk   1910913
## 1923   enk    169982
## 1924   enk   1377011
## 1925   enk   1800213
## 1926   onc    683721
## 1927   enk   1377016
## 1928   nyu     99181
## 1929   enk   1398913
## 1930   xx     764699
## 1931   nyu    748587
## 1932   nyu   1398900
## 1933   ne    1911050
## 1934   onc   1377305
## 1935   nyu   1029238
## 1936   miu     24940
## 1937   nyu   1377389
## 1938   nyu   1195022
## 1939   nyu   1189072
## 1940   nyu    557261
## 1941   nyu    557351
## 1942   mau    540458
## 1943   nyu    540354
## 1944   nyu    540328
## 1945   nyu    540433
## 1946   nyu    731384
## 1947   nyu    389489
## 1948   ii     171670
## 1949   nyu    557354
## 1950   enk    152986
## 1951   nyu   1377401
## 1952   enk   3445300
## 1953   enk   1911177
## 1954   nyu    750799
## 1955   nyu   1030026
## 1956   nyu   1377572
## 1957   nyu   1377592
## 1958   mau   1377591
## 1959   nyu   1911214
## 1960   nyu   1377579
## 1961   nyu   1377621
## 1962   nyu    259269
## 1963   nyu   1377607
## 1964   nyu   1377616
## 1965   enk   1377701
## 1966   mau    303470
## 1967   ii    1911296
## 1968   nyu   1377929
## 1969   nyu   1377930
## 1970   nyu   1377936
## 1971   pau   1377921
## 1972   mau   1911361
## 1973   nyu   1029337
## 1974   nyu   1377675
## 1975   nyu   1377674
## 1976   ohu    102309
## 1977   nyu   1377849
## 1978   enk   1911328
## 1979   nyu   1377804
## 1980   xx     748224
## 1981   nyu   1200354
## 1982   nyu   5653541
## 1983   cau     43357
## 1984   nyu   1020396
## 1985   nyu   1355628
## 1986   nyu    474693
## 1987   wiu   1788928
## 1988   nyu   1230286
## 1989   nyu    685741
## 1990   miu   1776112
## 1991   nyu   1604240
## 1992   nyu   1200079
## 1993   mau    255705
## 1994   nyu    363476
## 1995   nyu   1184866
## 1996   enk   1571025
## 1997   ii     988688
## 1998   enk   1353457
## 1999   xx     130904
## 2000   onc    763893
## 2001   nyu        81
## 2002   nyu    389054
## 2003   nyu    389611
## 2004   enk    760403
## 2005   enk    389707
## 2006   ilu    389277
## 2007   enk    388636
## 2008   nyu    389415
## 2009   nyu    390473
## 2010   enk    432140
## 2011   nyu    389022
## 2012   nyu   1028503
## 2013   nyu    736744
## 2014   enk    388531
## 2015   enk    388916
## 2016   nyu    389428
## 2017   nyu    540634
## 2018   nyu    557751
## 2019   nyu    557761
## 2020   nyu    540614
## 2021   nyu    557769
## 2022   at     731414
## 2023   onc     92564
## 2024   nyu    388539
## 2025   nyu   1419417
## 2026   wb    1198751
## 2027   enk    132444
## 2028   nyu    483364
## 2029   nyu   3916118
## 2030   enk    672336
## 2031   nyu   1030452
## 2032   nyu    538026
## 2033   nyu   1025813
## 2034   nyu   1029696
## 2035   enk   1015107
## 2036   nyu   1191641
## 2037   nyu       616
## 2038   xx     293931
## 2039   enk   1785576
## 2040   nyu   1191538
## 2041   enk    112732
## 2042   nyu   1200859
## 2043   enk   1786965
## 2044   enk    482778
## 2045   enk    633317
## 2046   nyu   1210444
## 2047   nyu   1020462
## 2048   nyu    481328
## 2049   nyu    596148
## 2050   nyu    259213
## 2051   ii    1353596
## 2052   enk   1353583
## 2053   enk    966018
## 2054   nyu   1353546
## 2055   nyu   1353542
## 2056   enk   1353549
## 2057   enk   1768819
## 2058   xxk    238798
## 2059   enk    980848
## 2060   enk   1353501
## 2061   inu   1768861
## 2062   enk   1120304
## 2063   nju      8059
## 2064   nyu   1422726
## 2065   mau   1417207
## 2066   nyu    672360
## 2067   nyu    438501
## 2068   ke     672621
## 2069   nyu   1211684
## 2070   msu     22800
## 2071   nyu    222063
## 2072   enk   1750576
## 2073   mau    396212
## 2074   nyu   1378258
## 2075   nyu   1278302
## 2076   nyu    712232
## 2077   enk   1030463
## 2078   nyu    390127
## 2079   enk    316420
## 2080   nyu    744843
## 2081   nyu    390116
## 2082   nyu    390013
## 2083   pau    389733
## 2084   enk    718583
## 2085   enk    179451
## 2086   nyu     34900
## 2087   nyu    391669
## 2088   nyu    391675
## 2089   nyu    391682
## 2090   nyu    300631
## 2091   nyu    391567
## 2092   nyu    213818
## 2093   nyu    431810
## 2094   enk    394883
## 2095   nyu    432588
## 2096   nyu    431897
## 2097   nyu     97918
## 2098   miu    432282
## 2099   nyu    299075
## 2100   nyu      1315
## 2101   enk    432676
## 2102   nyu    192769
## 2103   pau    434599
## 2104   nyu    390079
## 2105   nyu    392261
## 2106   nyu    392263
## 2107   onc    731791
## 2108   nyu    185002
## 2109   nyu    314747
## 2110   enk    392420
## 2111   nyu    431936
## 2112   nyu    394804
## 2113   nyu    431837
## 2114   nyu    392728
## 2115   enk    740764
## 2116   nyu    393876
## 2117   nyu     35747
## 2118   mau    393510
## 2119   nyu    394735
## 2120   nyu    394752
## 2121   nyu    394268
## 2122   nyu    394259
## 2123   nyu   1186948
## 2124   enk    434849
## 2125   nyu    433026
## 2126   enk    433486
## 2127   enk    433483
## 2128   enk    434259
## 2129   xx      35478
## 2130   onc    150637
## 2131   onc    434073
## 2132   nyu   1197268
## 2133   nyu   1184877
## 2134   nyu   1030544
## 2135   mau    689740
## 2136   nyu   1027503
## 2137   mau   1440537
## 2138   mau    109086
## 2139   nyu    434628
## 2140   nyu    210623
## 2141   enk   1775878
## 2142   enk   1054999
## 2143   rur   1353651
## 2144   |||     34486
## 2145   nyu   1362232
## 2146   nyu    981015
## 2147   nyu   1353671
## 2148   nyu   1353678
## 2149   nyu    735983
## 2150   enk   1353442
## 2151   nyu     30709
## 2152   nyu     30188
## 2153   nyu    182548
## 2154   nyu    981009
## 2155   enk     15389
## 2156   rur   1353409
## 2157   nyu    980824
## 2158   nyu    980829
## 2159   nyu    980977
## 2160   nyu    147805
## 2161   enk    980981
## 2162   nyu    752490
## 2163   nyu    751283
## 2164   nyu    980950
## 2165   nyu    260904
## 2166   rur    686953
## 2167   nyu    213383
## 2168   enk    393782
## 2169   nyu    178341
## 2170   miu     31969
## 2171   enk    317357
## 2172   enk    317357
## 2173   enk    390554
## 2174   enk    725742
## 2175   nyu    391449
## 2176   onc      3068
## 2177   enk    392160
## 2178   mau    392229
## 2179   idu    392746
## 2180   enk    391810
## 2181   nyu    391805
## 2182   onc    746641
## 2183   nyu    391377
## 2184   nyu    391505
## 2185   enk    392563
## 2186   enk    392556
## 2187   enk    392548
## 2188   enk    392539
## 2189   ii     260808
## 2190   enk    391471
## 2191   ctu    299209
## 2192   enk   1185185
## 2193   cc    1185342
## 2194   cc    1185264
## 2195   enk     85751
## 2196   ilu    273258
## 2197   enk   1215206
## 2198   enk   1807021
## 2199   mau     92158
## 2200   mau     92122
## 2201   mau     92159
## 2202   mau    757207
## 2203   nyu    584017
## 2204   enk    610164
## 2205   enk    746847
## 2206   mau    439008
## 2207   enk    665204
## 2208   nyu    709023
## 2209   nyu    766865
## 2210   nyu   1193257
## 2211   |||   1015832
## 2212   nyu   1003941
## 2213   nyu   1365085
## 2214   nyu   1184879
## 2215   enk   1213027
## 2216   nyu   1199900
## 2217   enk    138074
## 2218   nyu     42301
## 2219   nyu   1054908
## 2220   nyu   1428074
## 2221   txu    262641
## 2222   miu    767995
## 2223   enk    358303
## 2224   nyu    705998
## 2225   nyu    427849
## 2226   nyu    715889
## 2227   nyu   1184881
## 2228   mau    270165
## 2229   ru    4680863
## 2230   nyu   1365145
## 2231   nyu   3193596
## 2232   enk     26064
## 2233   nyu   1027503
## 2234   nyu    507838
## 2235   nju   1187499
## 2236   nyu   1112953
## 2237   nyu    474824
## 2238   enk    482189
## 2239   nyu    395528
## 2240   nyu    620165
## 2241   enk   1187490
## 2242   enk   1205789
## 2243   nyu   1205417
## 2244   nyu   1419992
## 2245   nyu   3906253
## 2246   enk   1730289
## 2247   nyu    142277
## 2248   rm    1193511
## 2249   nyu   1002774
## 2250   nyu    180355
## 2251   nyu   1774372
## 2252   nyu      1545
## 2253   nyu    135374
## 2254   nyu    854320
## 2255   enk   1182625
## 2256   nyu   1787677
## 2257   ctu    139558
## 2258   nyu   1442262
## 2259          384574
## 2260   nbu    743447
## 2261   cc     304750
## 2262   nyu    233104
## 2263   nyu    538727
## 2264   nyu   1027503
## 2265   nyu   1027503
## 2266   enk    693011
## 2267   enk   1187493
## 2268   nyu   1206521
## 2269   nyu    709692
## 2270   enk   1792035
## 2271   enk    271184
## 2272   nyu     20808
## 2273   nyu   1050406
## 2274   nyu   1782347
## 2275   enk   1226962
## 2276   enk   1806713
## 2277   ii       2368
## 2278   nyu   1015651
## 2279   enk   1787679
## 2280   nyu   1030848
## 2281   enk   1061323
## 2282   enk    193371
## 2283   enk   1375780
## 2284   xx    1053366
## 2285   enk    773477
## 2286   nyu    319853
## 2287   txu     37066
## 2288   enk   1775684
## 2289   nyu    256674
## 2290   enk   1025545
## 2291   ja    1184889
## 2292   nyu   1215006
## 2293   enk   1203141
## 2294   enk    765571
## 2295   cc    1194419
## 2296   enk    538952
## 2297   enk   1038175
## 2298   ir    1359510
## 2299   hiu    714354
## 2300   mau    389016
## 2301   cs    1231291
## 2302   nyu    780071
## 2303   ilu   1021085
## 2304   nyu    630336
## 2305   nyu   1111763
## 2306   nyu    766386
## 2307   |||   1029284
## 2308   nyu   1356643
## 2309   nyu   1356657
## 2310   mdu   1364667
## 2311   ilu   1182615
## 2312   enk    254351
## 2313   enk   1357219
## 2314   nyu     18438
## 2315   nyu    720724
## 2316   nyu   1356504
## 2317   nyu   1357057
## 2318   nyu    737661
## 2319   nyu   1026067
## 2320   nyu   1029847
## 2321   enk   1364527
## 2322   nyu   1113415
## 2323   inu    764368
## 2324   nyu   1194421
## 2325   ctu     21559
## 2326   ctu     14755
## 2327   enk   1427154
## 2328   enk    807906
## 2329   nyu   1004020
## 2330   xx     736432
## 2331   nyu   3910477
## 2332   enk   1358261
## 2333   nyu   1015716
## 2334   nyu    292454
## 2335   nyu   1357365
## 2336   nyu     23890
## 2337   enk    705540
## 2338   enk    228141
## 2339   nyu    271574
## 2340   ctu   1802394
## 2341   nyu    752439
## 2342   nyu    236442
## 2343   ii     746829
## 2344   mau   1418550
## 2345   enk   1417477
## 2346   mau    137974
## 2347   enk   1210572
## 2348   enk   1054857
## 2349   enk   1409382
## 2350   nyu   1844962
## 2351   nyu   1003968
## 2352   mau   1113326
## 2353   onc   1801081
## 2354   nyu    137103
## 2355   nyu     88528
## 2356   bcc    299611
## 2357   enk   1796114
## 2358   rur   1728188
## 2359   enk   1015471
## 2360   nyu   1226131
## 2361   nyu    229109
## 2362   nyu    507960
## 2363   nyu    224002
## 2364   nyu     40441
## 2365   nyu    763003
## 2366   scu   1729984
## 2367   riu    250427
## 2368   enk   1016048
## 2369   nyu    682876
## 2370   cc    1774396
## 2371   nyu   1027503
## 2372   nyu   1728625
## 2373   nyu    982974
## 2374   nyu   1192201
## 2375   nyu    127611
## 2376   enk   1215205
## 2377   nyu   1108489
## 2378   rur   1227900
## 2379   mau    135172
## 2380   nyu   1162481
## 2381   |||     38425
## 2382   ctu    735323
## 2383   nyu   1056216
## 2384   nyu   1187750
## 2385   nyu   1057220
## 2386   txu   1057221
## 2387   nyu    216498
## 2388   enk   1195734
## 2389   nyu   1378242
## 2390   nyu   1729992
## 2391   wiu   1788798
## 2392   mau   1029329
## 2393   xx     809292
## 2394   enk     24372
## 2395   ctu    295065
## 2396   nyu    692801
## 2397   enk    596433
## 2398   enk   1801114
## 2399   enk   1805126
## 2400   nyu   1207653
## 2401   nyu    983725
## 2402   nyu   1353705
## 2403   enk   1847338
## 2404   miu    192763
## 2405   enk   1111755
## 2406   nyu    621116
## 2407   nyu   1110802
## 2408   ii      87252
## 2409   ii     192337
## 2410   nyu    731949
## 2411   ii      91693
## 2412   nyu   1356037
## 2413   nyu   1189097
## 2414   nyu    256233
## 2415   nyu    733339
## 2416   ii     657241
## 2417   mau    729530
## 2418   ii      89802
## 2419   ii    1006464
## 2420   ii     733834
## 2421   ii     220397
## 2422   enk   1209141
## 2423   xx     701421
## 2424   nyu    187353
## 2425   nyu    148378
## 2426   nyu   1200032
## 2427   nyu   1200033
## 2428   gw     174915
## 2429   enk   1800629
## 2430   enk    178158
## 2431   xx    1015822
## 2432   xx     685517
## 2433   nyu   1030851
## 2434   nyu   1448917
## 2435   nyu     40604
## 2436   ncu   1443154
## 2437   enk   1209818
## 2438   enk    762733
## 2439   nyu   1215059
## 2440   enk    983554
## 2441   miu    231835
## 2442   nyu    129895
## 2443   ctu   1802379
## 2444   enk   1847616
## 2445   rur   1847273
## 2446   nyu   1197875
## 2447   nyu   1209093
## 2448   mau    540141
## 2449   mau    621400
## 2450   nyu   1200057
## 2451   ja    1184862
## 2452   nyu   1113331
## 2453   nyu   1215518
## 2454   mau   1398844
## 2455   nyu   1185180
## 2456   enk    263837
## 2457   ctu   1217111
## 2458   ctu   1217111
## 2459   enk    228144
## 2460   nyu    475270
## 2461   nyu    671219
## 2462   nyu    537050
## 2463   nyu   1224170
## 2464   nyu   1186705
## 2465   nyu    694975
## 2466   nyu   1211381
## 2467   nyu    148379
## 2468   nbu    671284
## 2469   nyu   1021470
## 2470   enk    195283
## 2471   nyu   1184895
## 2472   iq     966329
## 2473   nyu   1025378
## 2474   nyu     88583
## 2475   nyu   1112630
## 2476   nyu   1219772
## 2477   enk   1354010
## 2478   nyu    313590
## 2479   inu   1185356
## 2480   nyu   1015867
## 2481   mdu   1209617
## 2482   |||   1030853
## 2483   nyu   1208478
## 2484   nyu   1199813
## 2485   xx     701752
## 2486   ohu   1375499
## 2487   |||    981386
## 2488   nyu    981408
## 2489   nyu   1061037
## 2490   nyu   1230113
## 2491   nyu   1244112
## 2492   nyu    668675
## 2493   onc    757046
## 2494   enk    434272
## 2495   enk    720544
## 2496   xx     671576
## 2497   xx    1025709
## 2498   nyu   1428120
## 2499   xx    1191638
## 2500   ohu   1057102
## 2501   enk    633831
## 2502   is       1494
## 2503   nyu    673176
## 2504   miu    663209
## 2505   enk   1200297
## 2506   |||    293110
## 2507   nyu   1030456
## 2508   nyu    697542
## 2509   nyu    148372
## 2510   enk    142122
## 2511   nyu    192916
## 2512   mdu   1798568
## 2513   xx    1192343
## 2514   enk    160075
## 2515   nyu   1188018
## 2516   nyu   1207082
## 2517   nyu   3918200
## 2518   onc     14286
## 2519   ksu   1214163
## 2520   sw    1030854
## 2521   pau   1365030
## 2522   nyu   1185231
## 2523   nyu    268597
## 2524   nyu    111653
## 2525   nyu   1218011
## 2526   enk    195022
## 2527   miu    756719
## 2528   xx     747517
## 2529   nyu   1216449
## 2530   enk   1216446
## 2531   nyu   1216437
## 2532   nyu   1216433
## 2533   nyu     29339
## 2534   nyu   1198046
## 2535   nyu    724284
## 2536   enk   1783258
## 2537   nyu    180304
## 2538   nyu    474330
## 2539   ja     735421
## 2540   |||   1442811
## 2541   enk    484489
## 2542   ii    1328534
## 2543   ii    1328538
## 2544   enk    254769
## 2545   mau    663663
## 2546   flu    584770
## 2547   nyu   1030572
## 2548   nyu    393166
## 2549   nyu    749686
## 2550   nyu    634411
## 2551   nyu   1198047
## 2552   nyu   1784323
## 2553   mdu   1061249
## 2554   mau    102787
## 2555   nyu   1213506
## 2556   nyu   1441772
## 2557   nyu   1188294
## 2558   nyu    777086
## 2559   mau    730259
## 2560   nyu   1194297
## 2561   nyu   1417298
## 2562   nyu    672675
## 2563   enk   1213155
## 2564   nyu   1030577
## 2565   nyu     39664
## 2566   nyu    555745
## 2567   ilu    721978
## 2568   nyu   1224175
## 2569   nyu    157568
## 2570   enk    434531
## 2571   enk    691221
## 2572   nyu    432518
## 2573   hu     981601
## 2574   enk    233426
## 2575   mau    256113
## 2576   enk   1200552
## 2577   nyu    260754
## 2578   nyu   1184820
## 2579   nyu    160458
## 2580   enk   1801722
## 2581   ja     104150
## 2582   nyu    670384
## 2583   nyu   1880931
## 2584   nyu    234447
## 2585   nyu   1184251
## 2586   nyu    712189
## 2587   xx    1015274
## 2588   nyu   1418143
## 2589   enk   1364203
## 2590   xxk    238798
## 2591   xxk    238798
## 2592   nyu     44779
## 2593   nyu   1015881
## 2594   ii     261461
## 2595   enk    108820
## 2596   enk   1774152
## 2597   nyu   1215515
## 2598   nyu   1194298
## 2599   enk   1006467
## 2600   nyu   1200554
## 2601   mau    590306
## 2602   enk   1375727
## 2603   nyu    773797
## 2604   nyu   1229938
## 2605   enk   1851317
## 2606   nyu    778365
## 2607   nyu     18298
## 2608   enk    596736
## 2609   nyu   1775665
## 2610   nyu    437965
## 2611   enk    668495
## 2612   nyu   1775074
## 2613   mou   1329502
## 2614   nyu    765623
## 2615   onc   1228271
## 2616   ilu   1204261
## 2617   nhu    108677
## 2618   nyu       312
## 2619   enk   1809413
## 2620   rur     20410
## 2621   rur    141409
## 2622   ke    1211377
## 2623   nyu    722968
## 2624   onc    692557
## 2625   ohu    261890
## 2626   nyu     39949
## 2627   nyu     88422
## 2628   nyu    243219
## 2629   ohu    537831
## 2630   nyu   1111805
## 2631   enk    105774
## 2632   mau    256116
## 2633   nyu    474684
## 2634   nyu   1216461
## 2635   nyu    297606
## 2636   nyu   1113357
## 2637   xx    1199920
## 2638   nyu   1009918
## 2639   enk   1726982
## 2640   nyu   1204012
## 2641   nyu    271878
## 2642   enk    202436
## 2643   nyu   1223760
## 2644   enk    757345
## 2645   nyu    981355
## 2646   us    2204280
## 2647   si    2198008
## 2648   nyu   2199539
## 2649   enk   2574529
## 2650   at     339278
## 2651   ctu    629460
## 2652   enk   1002815
## 2653   nyu   1545788
## 2654   nyu   1113302
## 2655   nyu    121339
## 2656   nyu   1215947
## 2657   ilu   1414071
## 2658   nyu    555301
## 2659   enk   1721760
## 2660   ilu   1230317
## 2661   nyu   1301874
## 2662   nyu   1220163
## 2663   nyu    843208
## 2664   enk   1088967
## 2665   nyu   1216457
## 2666   is    1332578
## 2667          186849
## 2668   nyu    255429
## 2669   enk   1775193
## 2670   nyu   1181891
## 2671   onc     95535
## 2672   enk   1003888
## 2673   enk   1427626
## 2674   miu   1059713
## 2675   nyu   1184900
## 2676   enk   1791715
## 2677   mnu    966359
## 2678   mdu   1368692
## 2679   nyu    480453
## 2680   nbu    277935
## 2681   nyu    666741
## 2682   miu    536523
## 2683   nyu    741763
## 2684   mau     87371
## 2685   nyu    764721
## 2686   enk   1217116
## 2687   nyu   1198489
## 2688   nyu   1375657
## 2689   onc    622999
## 2690   nyu     18524
## 2691   nyu    244717
## 2692   nyu    592837
## 2693   nyu    257631
## 2694   mau    740015
## 2695   nyu      8771
## 2696   enk   1003953
## 2697   |||    685414
## 2698   nyu    202584
## 2699   nyu    695187
## 2700   cc     306697
## 2701   onc    141443
## 2702   nyu     89323
## 2703   my    1009260
## 2704   ctu   1061504
## 2705   nyu    255737
## 2706   nyu     87461
## 2707   cou   1019668
## 2708   enk   1217567
## 2709   nyu    390495
## 2710   enk    745698
## 2711   enk    703381
## 2712   enk    719438
## 2713   cau    118309
## 2714   enk    806794
## 2715   nyu    283795
## 2716   nyu    161248
## 2717   nyu   1187566
## 2718   nyu    981391
## 2719   enk    101068
## 2720   nyu    180242
## 2721   nyu    966266
## 2722   nyu    983694
## 2723   nyu   1216810
## 2724   nyu   1216466
## 2725   enk   1441824
## 2726   nyu   1187144
## 2727   nyu   1194732
## 2728   enk    980953
## 2729   nyu   1059319
## 2730   nyu   1015549
## 2731   nyu    243461
## 2732   nyu   1015405
## 2733   nyu     18555
## 2734   enk   1787074
## 2735   enk   1212529
## 2736   onc    776855
## 2737   nyu   1020663
## 2738   mau    160946
## 2739   cn     117328
## 2740   cau    203727
## 2741   nyu    204496
## 2742   enk    280342
## 2743   nyu    286031
## 2744   nyu    243959
## 2745   nyu    161695
## 2746   nyu   1800076
## 2747   enk   1110466
## 2748   nyu    284426
## 2749   nyu    716982
## 2750   mau    772163
## 2751   ii     780374
## 2752   ii     780348
## 2753   nyu   1215041
## 2754   nyu    120329
## 2755   nyu    323316
## 2756   nju    125442
## 2757   enk    779917
## 2758   enk    764572
## 2759   onc    484791
## 2760   nyu    322338
## 2761   enk    630448
## 2762   enk    121476
## 2763   enk      3290
## 2764   nyu    168534
## 2765   nyu    984257
## 2766   mau   1186556
## 2767   nyu    209775
## 2768   cau    249200
## 2769   nyu     13232
## 2770   cc    1774386
## 2771   nyu    449029
## 2772   nyu    409323
## 2773   enk   1015861
## 2774   vp     980815
## 2775   nyu    604555
## 2776   ja     413924
## 2777   enk   1353249
## 2778   nyu   1419595
## 2779   nyu   1032175
## 2780   nyu   1428022
## 2781   nyu   1199826
## 2782   nyu   1219654
## 2783   nyu   1021410
## 2784   mau    203924
## 2785   nyu   1216436
## 2786   nyu    610336
## 2787   mau    125675
## 2788   nyu    573453
## 2789   mau   1205154
## 2790   mau    434360
## 2791   nyu    808764
## 2792   enk    919372
## 2793   onc    926036
## 2794   nyu    947824
## 2795   inu    307743
## 2796   cau    281655
## 2797   nyu   1030099
## 2798   ru    5405188
## 2799   ke     600756
## 2800   nyu   1062588
## 2801   enk    358316
## 2802   nyu   1111762
## 2803   enk   1198465
## 2804   enk    364763
## 2805   nyu    290466
## 2806   nyu   1184874
## 2807   cou   1111499
## 2808   nyu   1444439
## 2809   nbu    405429
## 2810   nyu    143220
## 2811   nyu     91029
## 2812   xx    1442808
## 2813   enk   1376811
## 2814   nyu   1911386
## 2815   enk    434378
## 2816   nyu    622754
## 2817   nyu    372323
## 2818   nyu    128805
## 2819   nyu    724336
## 2820   ch     276777
## 2821   nyu    569172
## 2822   nyu    572003
## 2823   enk    652961
## 2824   enk     37241
## 2825   nyu    478063
## 2826   enk   1060884
## 2827   mnu    981120
## 2828   nyu    653956
## 2829   enk   1060801
## 2830   enk    592160
## 2831   nyu    375433
## 2832   nyu    466013
## 2833   enk    377388
## 2834   mnu    424059
## 2835   nyu   1611063
## 2836   nyu    612823
## 2837   hk     341474
## 2838   nyu   1027503
## 2839   enk 100348513
## 2840   xx     507709
## 2841   enk   1775755
## 2842   nyu    980858
## 2843   ilu    769116
## 2844   enk   1200880
## 2845   wau   1184869
## 2846   nyu    476284
## 2847   nyu    660278
## 2848   nyu    121555
## 2849   miu    219859
## 2850   rur   1848079
## 2851   nyu   1027503
## 2852   ctu   1802376
## 2853   enk   1061459
## 2854   enk     19423
## 2855   |||     15066
## 2856   nyu   1020888
## 2857   nyu    313454
## 2858   enk   1428073
## 2859   nyu   1025114
## 2860   gw     205209
## 2861   miu    312529
## 2862   enk   1780449
## 2863   nyu    136245
## 2864   nyu    174144
## 2865   enk   1807023
## 2866   nyu    751999
## 2867   nyu   1210000
## 2868   enk   1225596
## 2869   nyu    780818
## 2870   stk    226107
## 2871   enk   1771592
## 2872   nyu    322501
## 2873   nyu   1188293
## 2874   nyu   1417930
## 2875   ii     214714
## 2876   nyu   1217493
## 2877   ne    1182208
## 2878   nyu   1110507
## 2879   nyu   1187717
## 2880   nyu    123141
## 2881   nyu    240857
## 2882   enk   1204010
## 2883   nyu    128074
## 2884   enk   1111809
## 2885   enk    630457
## 2886   nyu   1056931
## 2887   nyu    589350
## 2888   ohu    561087
## 2889   nyu    660549
## 2890   nyu    302375
## 2891   xx    1427656
## 2892   mdu   1048229
## 2893   nyu   1203310
## 2894   |||      3672
## 2895   nyu    324392
## 2896   nyu   1204471
## 2897   miu    763208
## 2898   nyu   1184951
## 2899   nyu    708385
## 2900   nyu   1191533
## 2901   nyu   1787884
## 2902   nyu   1186916
## 2903   nyu   1775509
## 2904   nyu    492935
## 2905   |||   1222978
## 2906   enk   1910424
## 2907   |||   1204714
## 2908   nyu   1204712
## 2909   enk   1208835
## 2910   nyu   1207428
## 2911   nyu   1196613
## 2912   nyu   1232208
## 2913   enk    644343
## 2914   nyu   1030065
## 2915   enk   1804976
## 2916   nyu    204487
## 2917   nyu    660233
## 2918   pau    538923
## 2919   nyu   1015643
## 2920   nyu    739784
## 2921   |||     15671
## 2922   nyu    221610
## 2923   rur    705315
## 2924   ru    1061213
## 2925   nyu    980933
## 2926   nyu    735679
## 2927   nyu    124637
## 2928   nyu     85476
## 2929   enk   1418306
## 2930   nyu   2239191
## 2931   nyu     20295
## 2932   xxk    238798
## 2933   enk    709184
## 2934   nyu    155494
## 2935   mau   1029426
## 2936   mau   1029429
## 2937   enk    766723
## 2938   onc      6248
## 2939   nyu    204845
## 2940   enk   1184859
## 2941   enk    760379
## 2942   ohu    746394
## 2943   enk    692995
## 2944   enk    596300
## 2945   enk    231974
## 2946   nyu    102973
## 2947   nyu   1015664
## 2948   mau    732912
## 2949   nyu   1231252
## 2950   nyu    242164
## 2951   nyu   1219974
## 2952   nyu   1219976
## 2953   nyu    207402
## 2954   nyu     22097
## 2955   onc    125601
## 2956   nyu    232191
## 2957   enk   1187780
## 2958   nyu    122930
## 2959   nyu    230413
## 2960   nyu   1015389
## 2961   nyu   1216379
## 2962   nyu   1111822
## 2963   enk    584117
## 2964   nyu    127543
## 2965   hu     966135
## 2966   nyu   1225832
## 2967   nyu    966256
## 2968   cc    1774406
## 2969   nyu    661606
## 2970   enk   1214669
## 2971   enk   1116812
## 2972   cau    325471
## 2973   cau    325471
## 2974   nyu    120098
## 2975   nyu    175460
## 2976   enk 100169944
## 2977   mau    155234
## 2978   nju   1015204
## 2979   nyu    248870
## 2980   nyu   1873894
## 2981   nyu    254857
## 2982   nyu   2433341
## 2983   enk   1847632
## 2984   enk    184950
## 2985   rur   1227889
## 2986   txu   1111708
## 2987   nyu   1218574
## 2988   nyu   1030567
## 2989   nyu    100312
## 2990   enk   1427647
## 2991   nyu    719026
## 2992   xx     133967
## 2993   miu    478610
## 2994   cau    325471
## 2995   enk   1186850
## 2996   th     256907
## 2997   nyu    105225
## 2998   nyu   1015836
## 2999   enk   1327354
## 3000   enk   1199916
## 3001   nyu    628246
## 3002   nyu    136419
## 3003   nyu    629886
## 3004   enk   1376478
## 3005   enk   1793923
## 3006   txu   1111745
## 3007   nyu    742111
## 3008   nyu    782593
## 3009   enk    981589
## 3010   nyu     92532
## 3011   enk   1211892
## 3012   enk   1793936
## 3013   nyu   6302740
## 3014   mau   1727005
## 3015   nyu   1220136
## 3016   nyu    584484
## 3017   |||     24238
## 3018   nyu    205885
## 3019   enk   1522294
## 3020   nyu    713411
## 3021   nyu     94065
## 3022   nyu    195242
## 3023   nyu    279526
## 3024   nyu   1199983
## 3025   nyu    473135
## 3026   rm    1193510
## 3027   nyu    123753
## 3028   wiu   1113445
## 3029   enk   1796119
## 3030   nyu    584484
## 3031   onc   1801079
## 3032   |||   1247272
## 3033   nyu    123671
## 3034   ohu    471220
## 3035   nyu    255319
## 3036   nyu    538034
## 3037   enk   1372509
## 3038   hk     301728
## 3039   nyu    240998
## 3040   enk    670423
## 3041   cau    780510
## 3042   nyu   1277213
## 3043   nyu    784965
## 3044   nyu   1110523
## 3045   enk    723892
## 3046   nyu    685131
## 3047   enk   1217112
## 3048   nyu   1059331
## 3049   ch     219791
## 3050   enk   1054997
## 3051   enk    474871
## 3052   nyu    246401
## 3053   |||     11016
## 3054   enk   1782267
## 3055   enk    966019
## 3056   nyu    121340
## 3057   nyu   1248767
## 3058   nyu    167781
## 3059   enk   1360053
## 3060   nyu   1424797
## 3061   nyu   1016131
## 3062   enk   1417356
## 3063   nyu   1355795
## 3064   enk   3496535
## 3065   unr    566355
## 3066   rur    212338
## 3067   enk    127755
## 3068   nyu     83038
## 3069   nyu   1214022
## 3070   nyu   1029923
## 3071   nyu    293829
## 3072   nyu   1111453
## 3073   nyu      8977
## 3074   nyu    394090
## 3075   is    1880414
## 3076   nyu   1200553
## 3077   nyu    207540
## 3078   mau      2007
## 3079   enk    219616
## 3080   rur   1729418
## 3081   nyu    202856
## 3082   enk    332465
## 3083   enk    219701
## 3084   nyu   1218563
## 3085   nyu   1181890
## 3086   nyu   1216319
## 3087   nyu   1184310
## 3088   enk    209697
## 3089   enk    766381
## 3090   nyu    633475
## 3091   pau    227813
## 3092   enk   1199703
## 3093   enk   1200404
## 3094   nyu   1015428
## 3095   enk    621429
## 3096   nyu    806709
## 3097   nyu   1877053
## 3098   nyu   1218518
## 3099   is     144748
## 3100   enk   1779565
## 3101   nyu   1186260
## 3102   nyu   1028970
## 3103   nju    980868
## 3104   inu    306993
## 3105   nyu    163769
## 3106   is     982793
## 3107   mau   1262250
## 3108   enk    981557
## 3109   nyu   1197272
## 3110   enk   1226928
## 3111   np     694655
## 3112   ctu    691969
## 3113   nyu    563795
## 3114   nyu    327661
## 3115   mau   1187631
## 3116   enk    125075
## 3117   nyu   1376176
## 3118   enk   1911526
## 3119   nyu   1399028
## 3120   enk    762400
## 3121   vtu    161698
## 3122   rur   2243103
## 3123   nyu   1224854
## 3124   |||      7572
## 3125   nyu   1184819
## 3126   nyu    428747
## 3127   flu    165756
## 3128   nju    202659
## 3129   nyu    452046
## 3130   nyu    979011
## 3131   nyu   1030201
## 3132   enk   1904065
## 3133   ru     218036
## 3134   mau    730105
## 3135   nbu   1199738
## 3136   nyu    209870
## 3137   enk    537880
## 3138   enk    355303
## 3139   nyu   1417833
## 3140   ctu   1802156
## 3141   nyu    289248
## 3142   nyu   1032690
## 3143   nyu   1111817
## 3144   nyu   1191880
## 3145   inu   1048303
## 3146   cc     120849
## 3147   nyu    633233
## 3148   nyu   1910191
## 3149   nyu    629887
## 3150   enk   1788387
## 3151   enk   1788384
## 3152   enk   1199903
## 3153   enk   1788386
## 3154   enk   1200475
## 3155   wiu   1199838
## 3156   nyu     94205
## 3157   nyu    763032
## 3158   rur   1727408
## 3159   cc    1185337
## 3160   cc     339791
## 3161   enk   1206704
## 3162   nyu   1206700
## 3163   nyu   1419586
## 3164   enk   1788388
## 3165   nyu   1186519
## 3166   si     759580
## 3167   nyu   1417099
## 3168   inu    507973
## 3169   nyu   1026099
## 3170   enk   1418302
## 3171   enk   1417154
## 3172   enk    433800
## 3173   nyu    634925
## 3174   enk   1214056
## 3175   txu    262485
## 3176   nyu    417793
## 3177   nyu    255781
## 3178   nyu   1184313
## 3179   nyu   1775479
## 3180   enk      3290
## 3181   miu    346558
## 3182   onc    347190
## 3183   nyu     23786
## 3184   mau    181813
## 3185   enk    159519
## 3186   nyu    252387
## 3187   nyu    266120
## 3188   enk   1183555
## 3189   nyu    695730
## 3190   nyu    604549
## 3191   nyu    482756
## 3192   enk    482761
## 3193   nyu    294681
## 3194   nyu   1060042
## 3195   enk   1806114
## 3196   nyu    201952
## 3197   nyu    474118
## 3198   ilu    658661
## 3199   mau    540160
## 3200   nyu   1206489
## 3201   nyu    623080
## 3202   ii     990315
## 3203   enk   1206486
## 3204   xx     719037
## 3205   nyu    453568
## 3206   rur   1060121
## 3207   ja    1774161
## 3208   onc    178135
## 3209   nyu    982769
## 3210   nyu    226833
## 3211   nyu   1054898
## 3212   mdu   1061233
## 3213   nyu   1187467
## 3214   nyu    629882
## 3215   mau    405786
## 3216   dcu   1213560
## 3217   enk   1910499
## 3218   nju    202317
## 3219   nyu    241555
## 3220   rur   1061235
## 3221   onc    569777
## 3222   enk   1868188
## 3223   cc    1774377
## 3224   enk   1214648
## 3225   nyu     15279
## 3226   onc      2447
## 3227   xxk    605611
## 3228   nyu   1801509
## 3229   my      96455
## 3230   my     106077
## 3231   nyu    337293
## 3232   ua    2889635
## 3233   nyu   2807958
## 3234   nyu   2808188
## 3235   nhu   2808433
## 3236   onc   2808432
## 3237   enk   2808249
## 3238   nyu   2809993
## 3239   nyu    565611
## 3240   nyu    125808
## 3241   enk   1227874
## 3242   enk    149358
## 3243   enk    983589
## 3244   nyu   1267448
## 3245   nyu   1227870
## 3246   nyu    476274
## 3247   nyu    299163
## 3248   enk   1198880
## 3249   enk   1198869
## 3250   nyu    300848
## 3251   enk   1729794
## 3252   enk   1060973
## 3253   nyu    300905
## 3254   nyu    981559
## 3255   enk    559239
## 3256   enk   1801719
## 3257   nyu   1216441
## 3258   nyu   1210706
## 3259   nyu    764814
## 3260   enk   1398567
## 3261   enk    613543
## 3262   nyu   1408570
## 3263   enk    622926
## 3264   ii     995885
## 3265   nyu   1198262
## 3266   nyu   1057255
## 3267   ctu    629007
## 3268   nyu    610509
## 3269   nyu   1032124
## 3270   enk    572057
## 3271   enk   1216493
## 3272   nyu   1059522
## 3273   enk   1210579
## 3274   nyu   1061399
## 3275   enk    212122
## 3276   nyu   1111820
## 3277   nyu    574180
## 3278   nju    763577
## 3279   is       1706
## 3280   enk    981610
## 3281   scu   1213316
## 3282   ii     720987
## 3283   ii     732717
## 3284   mau    143809
## 3285   nyu   1113508
## 3286   nyu   1110413
## 3287   enk    605603
## 3288   ohu    539567
## 3289   enk   1378154
## 3290   nyu    417820
## 3291   enk   1398566
## 3292   enk    254751
## 3293   miu    605408
## 3294   nyu    630732
## 3295   nyu    630729
## 3296   nyu   1186717
## 3297   enk    629101
## 3298   enk   1798302
## 3299   nyu   1218812
## 3300   nyu   1218813
## 3301   ja     216746
## 3302   nyu   2139207
## 3303   nyu   1213655
## 3304   nyu    683353
## 3305   mdu   1213439
## 3306   mdu   1213449
## 3307   ilu   1111795
## 3308   nyu    204448
## 3309   nyu    741728
## 3310   nyu      1872
## 3311   nyu   1026132
## 3312   at     366251
## 3313   enk   1219634
## 3314   nyu   1025036
## 3315   enk   1206000
## 3316   nyu    761111
## 3317   unr     99325
## 3318   nyu   1029522
## 3319   enk   1194650
## 3320   nyu    612561
## 3321   wiu    981356
## 3322   nyu   1021304
## 3323   nyu    626204
## 3324   nyu    725626
## 3325   nhu    605280
## 3326   nyu    621677
## 3327   rur   1849493
## 3328   ua     757700
## 3329   enk    568325
## 3330   nyu    694219
## 3331   nyu   1029953
## 3332   nyu    104493
## 3333   nyu    465926
##                                                                                                                                                                                                                                                                                                                                                                               title
## 1                                                                                                                                                                                                                                                                                                                           Her sailor | a love story / | $c: by Marshall Saunders.
## 2                                                                                                                                                                                                                                                                  The Canadian brothers, or, The prophecy fulfilled | a tale of the late American war / | $c: by Major Richardson.
## 3                                                                                                                                                                                                                                                                             Tales and traditions of the Eskimo / | $c: by Henrik Rink ; translated from the Danish by the author.
## 4                                                                                                                                                                                                                                                                                              Ingo; | the story of my otter. | $c: Translated from the German by Desmond I. Vesey]
## 5                                                                                                                                                                                                                                                                                                                                                        The call of the man-eater.
## 6                                                                                                                                                                                                                                                   The created legend / | $c: by Feodor Sologub [i.e. F. K. Teternikov] ; authorized translation from the Russian by John Cournos.
## 7                                                                                                                                                                                                                                        Off on a comet! : | A journey through planetary space : (a sequel to "To the sun?") / | $c: from the French of Jules Verne by Edward Roth.
## 8                                                                                                                                                                                                                                                                                Dream days / | $c: Kenneth Grahame ; with a preface for the Garland edition by Rowland L. Collins.
## 9                                                                                                                                                                                                                                                                                                                 La Faustin. | $c: Translated by G. P. Monkshood & Ernest Tristan.
## 10                                                                                                                                                                                                                                                                                                       Scenes of clerical life / | $c: George Eliot ; introduction by Grace Rhys.
## 11                                                                                                                                                                                                                                                                                                                                                           Moonchild; a prologue.
## 12                                                                                                                                                                                                                                                                                                        Boston Blackie / | $c: Jack Boyle ; with a new introd. by Edward D. Hoch.
## 13                                                                                                                                                                                                                                                                                                                                   The professor. | $c: Introd. by Margaret Lane.
## 14                                                                                                                                                                                                                                                                                                                                 This is Goggle; | or, The education of a father.
## 15                                                                                                                                                                                                                                                                      Lays of Marie de France, | and other French legends. | $c: Translated with an introduction by Eugene Mason.
## 16                                                                                                                                                                                                                                                                                                                                                                      Zoo doctor.
## 17                                                                                                                                                                                                                                                                                                                          The wings of the dove. | $c: Introd. by Reynolds Price.
## 18                                                                                                                                                                                                                                      Fanny Fern : | a memorial volume containing her select writings and a memoir / | $c: by James Parton ; with illustrations by Arthur Lumley.
## 19                                                                                                                                                                                                                                                                                                                              The lives of the Ford Boys / | $c: by D.W. Stevens.
## 20                                                                                                                                                                                                                                                                                                                                         Upstream, downstream and out of my mind.
## 21                                                                                                                                                                                                                                                                                             Dream tales and prose poems. | $c: Translated from the Russian by Constance Garnett.
## 22                                                                                                                                                                                                                                                                                                                        Captain Blood : | his odyssey / | $c: by Rafael Sabatini.
## 23                                                                                                                                                                                                                                                                                                                       The mambo kings play songs of love / | $c: Oscar Hijuelos.
## 24                                                                                                                                                                                                                                                                                                  Virgin soil; | a novel. | $c: Translated from the Russian by Constance Garnett.
## 25                                                                                                                                                                                                                                                                                                  Virgin soil; | a novel. | $c: Translated from the Russian by Constance Garnett.
## 26                                                                                                                                                                                                                                                                                    Jennie Gerhardt / | $c: Theodore Dreiser ; edited with an introduction by Lee Clark Mitchell.
## 27                                                                                                                                                                                                                                                                                                 Greenmantle / | $c: John Buchan ; edited with an introduction by Kate Macdonald.
## 28                                                                                                                                                                                                                                                                The Bruce, the history of Robert, the Bruce, King of Scots / | $c: John Barbour ; translated by George Eyre-Todd.
## 29                                                                                                                                                                                                                                                                                      McTeague : | a story of San Francisco / | $c: edited with an introduction by Jerome Loving.
## 30                                                                                                                                                                                                                                                                                                                                    The sense of the past / | $c: by Henry James.
## 31                                                                                                                                                                                                                                                                                                               Victory / | $c: Joseph Conrad with an introduction by Tony Tanner.
## 32                                                                                                                                                                                                                                                                                                               An owl came to stay / | $c: Claire Rome ; with ill. by the author.
## 33                                                                                                                                                                                                                                                                 The adventures of Elizabeth in Rügen / | $c: Elizabeth von Arnim ; with a new introduction by Penelope Mortimer.
## 34                                                                                                                                                                                                                                                                                                                                         A rant of ravens / | $c: Christine Goff.
## 35                                                                                                                                                                                                                                                                                                    Even cows go to heaven : | veterinary antics of the 1960s / | $c: Linda Knox.
## 36                                                                                                                                                                                                                    The mysterious freebooter, or, The days of Queen Bess : | a romance / | $c: by Francis Lathom ; edited with a new introduction and notes by James D. Jenkins.
## 37                                                                                                                                                                                                                                                                                                                                                Lady Athlyne / | $c: Bram Stoker.
## 38                                                                                                                                                                                                                                                                                                                                                                 Arthur Coningsby
## 39                                                                                                                                                                                                                                                                                           News from nowhere; | or, An epoch of rest; being some chapters from a utopian romance.
## 40                                                                                                                                                                                                                                                                                                                                     The collected writings of Thomas de Quincey.
## 41                                                                                                                                                                                                                                                                                                                        Siamese harem life. | $c: With an introd. by Freya Stark.
## 42                                                                                                                                                                                                                                                                                                                                       A golden autumn / | $c: by Mrs. Alexander.
## 43                                                                                                                                                                                                                                                    The prince of Coucy : | a historical novelette / | $c: by Marcus Lehmann ; translated by Y. Weiss ; edited by Yaakov Patroff.
## 44                                                                                                                                                                                                                                                                                                                  Yellow fever. | $c: Translated from the French by Xan Fielding.
## 45                                                                                                                                                                                                                                                                                                       Star-crossed : | the life and love of an actress / | $c: by an actress ...
## 46                                                                                                                                                                                                                                                               Tales and stories / | $c: by Mary Wollstonecraft Shelley ; now first collected with an introd. by Richard Garnett.
## 47                                                                                                                                                                                                                                              A gentleman of France : | being the memoirs of Gaston de Bonne, Sieur de Marsac / | $c: Stanley Weyman ; introduced by Hugh Greene.
## 48                                                                                                                                                                                                                                                                                                                                       Father Goriot / | $c: by Honoré de Balzac.
## 49                                                                                                                                                                                                                                                                                                                                    Breaking-point, | $c: by Michael Artzibashef.
## 50                                                                                                                                                                                                                                                                                                                                                          [Works of Walter Pater.
## 51                                                                                                                                                                                                                                                                                      Strange stories from a Chinese studio / | $c: translated and annotated by Herbert A. Giles.
## 52                                                                                                                                                                                                                                                                                                    The American claimant, | and other stories and sketches, | $c: by Mark Twain.
## 53                                                                                                                                                                                                                                                                                  Hungry stones and other stories. | $c: Translated from the original Bengali by various writers.
## 54                                                                                                                                                                                                                                                                                                       Joan of Arc; | or, The maid of Orleans. From Michelet's History of France.
## 55                                                                                                                                                                                                                                                                                               Pestalozzi's Leonard and Gertrude / | $c: translated and abridged by Eva Channing.
## 56                                                                                                                                                                                                                                                                                 Master of the day of judgment / | $c: Leo Perutz ; translated from the German by Eric Mosbacher.
## 57                                                                                                                                                                                                                                                      Skipper Worse / | $c: Alexander L. Kielland ; translated from the Norwegian by Christopher Fauske ; edited by Jeff Voccola.
## 58                                                                                                                                                                                                                                                                                                                                                           Pirates of the spring.
## 59                                                                                                                                                                                                                                                                       A curate in Bohemia / | $c: Norman Lindsay ; illustrated by Norman Lindsay ; introduction by Barry Oakley.
## 60                                                                                                                                                                                                                                                                                           Gilles & Jeanne / | $c: Michel Tournier ; translated from the French by Alan Sheridan.
## 61                                                                                                                                                                                                                                                                     King, queen, knave / | $c: Vladimir Nabokov ; translated by Dmitri Nabokov in collaboration with the author.
## 62                                                                                                                                                                                                                                                                    Abai : | a novel ; | $c: Mukhtar Auezov ; [translated from the Russian by L. Navrozov ; edited by H. Perham].
## 63                                                                                                                                                                                                                                                                    Abai : | a novel ; | $c: Mukhtar Auezov ; [translated from the Russian by L. Navrozov ; edited by H. Perham].
## 64                                                                                                                                                                                                                                                                                                                                           Aspects of love / | $c: David Garnett.
## 65                                                                                                                                                                                                                                                                                         For every sin / | $c: Aharon Appelfeld ; translated from the Hebrew by Jeffrey M. Green.
## 66                                                                                                                                                                                                                                                                                                                                               Farther north / | $c: Jack London.
## 67                                                                                                                                                                                                                                                                                             Love / | $c: Elizabeth von Arnim ; with a new introduction by Terence de Vere White.
## 68                                                                                                                                                                                                                           Nehalem Tillamook tales / | $c: told by Clara Pearson ; recorded by Elizabeth Derr Jacobs ; edited by Melville Jacobs ; introduction by Jarold Ramsey.
## 69                                                                                                                                                                                                                                                                                             A country doctor's notebook / | $c: Mikhail Bulgakov ; translated by Michael Glenny.
## 70                                                                                                                                                                                                                                                                                                                                            Weapon of hunger / | $c: Meja Mwangi.
## 71                                                                                                                                                                                                                                                                                                                               The red badge of courage / | $c: by Stephen Crane.
## 72                                                                                                                                                                                                                                                                                           Sofia Petrovna / | $c: Lydia Chukovskaya ; translated from the Russian by David Floyd.
## 73                                                                                                                                                                                                                                                                                            Engagements of the heart / | $c: Françoise Sagan ; translated by Christine Donougher.
## 74                                                                                                                                                                                                                                                                                 Short stories / | $c: Luigi Pirandello ; selected, translated from the Italian by Frederick May.
## 75                                                                                                                                                                                                                                                                                                            Doctor Pascal / | $c: Émile Zola ; translated by Ernest A. Vizetelly.
## 76                                                                                                                                                                                                                                                                                                                         The last laugh and other stories / | $c: Chinelo Achebe.
## 77                                                                                                                                                                                                                                                                                                                                        Destiny : | a novel / | $c: by Hauwa Ali.
## 78                                                                                                                                                                                                                                                  Camilla : | a novella / | $c: by Dorothea Mendelssohn Veit Schlegel ; introduced by Hans Eichner ; translated by Edwina Lawler.
## 79                                                                                                                                                                                                                                                                                                                                      Funerals are fatal / | $c: Agatha Christie.
## 80                                                                                                                                                                                                                The cathedral : | a novel / | $c: by Olesʹ Honchar ; translated from the Ukrainian by Yuri Tkach and Leonid Rudnytzky ; edited and annotated by Leonid Rudnytzky.
## 81                                                                                                                                                                                                                                             Debit and credit / | $c: translated from the German of Gustav Freytag by L.C.C. ; with a preface by Christian Charles Josias Bunsen.
## 82                                                                                                                                                                                                                                                                                                              Grammar of love / | $c: by Ivan Bunin ; translated by John Cournos.
## 83                                                                                                                                                                                                                                                                 Maigret and the death of a harbor-master / | $c: Georges Simenon ; translated from the French by Stuart Gilbert.
## 84                                                                                                                                                                                                                                                                                                                                Command and control / | $c: by James D. Mitchell.
## 85                                                                                                                                                                                                                                                                                                                                               Blue movie / | $c: Terry Southern.
## 86                                                                                                                                                                                                                                                                   Portrait of a man unknown / | $c: Nathalie Sarraute ; translated by Maria Jolas ; preface by Jean-Paul Sartre.
## 87                                                                                                                                                                                                                                                 Fifteen by Maupassant; | $c: a collection of short stories by the great French writer. Selected and translated by Miriam Morton.
## 88                                                                                                                                                                                                                                                                                         Tent of miracles / | $c: Jorge Amado ; translated from the Portuguese by Barbara Shelby.
## 89                                                                                                                                                                                                                                                                                                 Minuet for 25-shot guitar / | $c: Vitomil Zupan ; [translated by Harry Leeming].
## 90                                                                                                                                                                                                                                                                                                                                       Death on the Nile / | $c: Agatha Christie.
## 91                                                                                                                                                                                                                                                                       El̂oisa : | or, a series of original letters / | $c: Jean-Jacques Rousseau ; translated by William Kenrick.
## 92                                                                                                                                                                                                                                                                                                     Tales from a mother-of-pearl casket. | $c: Translated by Henri Pène Du Bois.
## 93                                                                                                                                                                                                                                                                                                              Buddenbrooks. | $c: Translated from the German by H.T. Lowe-Porter.
## 94                                                                                                                                                                                                                                                                                                U-boat / | $c: Lothar-G&#xfc;nther Buchheim ; translated by J. Maxwell Brownjohn.
## 95                                                                                                                                                                                                                                                                                                                                 The man who liked women | $c: [by] Marc Brandel.
## 96                                                                                                                                                                                                                                                                                                                                      The daughter of time / | $c: Josephine Tey.
## 97                                                                                                                                                                                                                                                                              Wednesday's children / | $c: Robin Hyde ; with an introduction and critical afterword by Susan Ash.
## 98                                                                                                                                                                                                                                                                                                                                            The Berets / | $c: by W.E.B. Griffin.
## 99                                                                                                                                                                                                                                                                                                           The storyteller / | $c: Mario Vargas Llosa ; translated by Helen Lane.
## 100                                                                                                                                                                                                                                                                                                                               Laughter in the dark / | $c: by Vladimir Nabokov.
## 101                                                                                                                                                                                                                                                                                              August / | $c: by Knut Hamsun ; translated from the Norwegian by Eugene Gay-Tifft.
## 102                                                                                                                                                                                                                                                                                      Sannikov land / | $c: Vladimir Obruchev ; [translated from the Russian by David Skvirsky].
## 103                                                                                                                                                                                                                                                                                         Maigret and the toy village / | $c: Georges Simenon ; translated by Elileen Ellenbogen.
## 104                                                                                                                                                                                                                                                                                                                              Tales of tenderness and power / | $c: Bessie Head.
## 105                                                                                                                                                                                                                                          The Lifted curtain. | $c: Le Comte de Mirabeau ; translation by Howard Nelson / | introduction by J-P Spencer. | $p: & My conversion /
## 106                                                                                                                                                                                                                                                                                                                                         Flawless jade / | $c: Barbara Hanrahan.
## 107                                                                                                                                                                                                                                                          The defense : | a novel / | $c: by Vladimir Nabokov ; translated by Michael Scammell in collaboration with the author.
## 108                                                                                                                                                                                                                                                                                          The collected stories of Elizabeth Bowen / | $c: with an introduction by Angus Wilson.
## 109                                                                                                                                                                                                                                                                                              Supernatural Clwyd : | the folk tales of North-East Wales / | $c: Richard Holland.
## 110                                                                                                                                                                                                                                                                                                                   The divided world : | selected stories / | $c: Owen Marshall.
## 111                                                                                                                                                                                                                                                                                                                    Cliffs of fall and other stories / | $c: by Shirley Hazzard.
## 112                                                                                                                                                                                                                                                                                Manon Lescaut / | $c: Abbé Prévost : A new translation, with an introduction by Donald M. Frame.
## 113                                                                                                                                                                                             A Connecticut Yankee in King Arthur's court / | $c: by Samuel Langhorne Clemens ; a Facsimile of the First Edition ; with an introduction and bibliography prepared by Hamlin Hill.
## 114                                                                                                                                                                                                              The trial. | $c: Translated from the German by Willa and Edwin Muir; rev., and with additional materials translated by E. M. Butler. Illustrated by George Salter.
## 115                                                                                                                                                                                                                                                                                                      Atala : | René / | $c: Chateaubriand ; a new translation by Irving Putter.
## 116                                                                                                                                                                                                                                                                                                                                                                       I, Robot.
## 117                                                                                                                                                                                                                                                                         The scarlet letter; | a romance. | $c: [by] Nathaniel Hawthorne. With an introduction by Douglas Grant.
## 118                                                                                                                                                                                                                                                                                                                                                          Stories of a lifetime.
## 119                                                                                                                                                                                                                                                                                                                                                              The Belton estate.
## 120                                                                                                                                                                                                                                                                                                                                A world of strangers / | $c: by Nadine Gordimer.
## 121                                                                                                                                                                                                                                                                                                                                Norstrilia / | $c: [by] Cordwainer Smith [pseud]
## 122                                                                                                                                                                                                                                                                                                                                                 The Roman spring of Mrs. Stone.
## 123                                                                                                                                                                                                                                                                                           The castle / | $c: Franz Kafka; translated from the German by Willa Muir ... [et al].
## 124                                                                                                                                                                                                                                                                                                                                   Farewell, my lovely / | $c: Raymond Chandler.
## 125                                                                                                                                                                                                                                                                                        Clochemerle / | $c: Gabriel Chevallier ; translated from the French by Jocelyn Godefroi.
## 126                                                                                                                                                                                                                                                                                                                                         Crossroads / | $c: Spencer S.M. Tizora.
## 127                                                                                                                                                                                                                                                             Chinese fairy tales and fantasies / | $c: translated and edited by Moss Roberts ; with the assistance of C. N. Tay.
## 128                                                                                                                                                                                                                                                                                                                                                                  Brighton rock.
## 129                                                                                                                                                                                                                                                     Swallow barn; | or, A sojourn in the Old Dominion. | $c: With introd. and notes by William S. Osborne.  Illus. by Strother.
## 130                                                                                                                                                                                                                                                                                                                                                      Adrift in Soho, | a novel.
## 131                                                                                                                                                                                                                                                                                                             The age of reason. | $c: Translated from the French by Eric Sutton.
## 132                                                                                                                                                                                                                                                                                                                                   Lucky Jim; | a novel, | $c: by Kingsley Amis.
## 133                                                                                                                                                                                                                                                                                                                 The stainless steel rat saves the world / | $c: Harry Harrison.
## 134                                                                                                                                                                                                                                                                                                                                         The complete short stories [in 3 vols.]
## 135                                                                                                                                                                                                                                                                                                                                         The complete short stories [in 3 vols.]
## 136                                                                                                                                                                                                                                                                                                                                     The portrait of a lady / | $c: Henry James.
## 137                                                                                                                                                                                                                                                                             Eugénie Grandet / | $c: Honoré de Balzac ; translated by Ellen Marriage ; introd. by Marcel Girard.
## 138                                                                                                                                                                                                                                                                                                                                Jane Eyre. | $c: Lithographs by Anthony Colbert.
## 139                                                                                                                                                                                                                                                                                                                                                          Stories of a lifetime.
## 140                                                                                                                                                                                                                                                                                                                  The reprieve. | $c: Translated from the French by Eric Sutton.
## 141                                                                                                                                                                                                                                                                                                                             The prime of Miss Jean Brodie / | $c: Muriel Spark.
## 142                                                                                                                                                                                       Tales of terror and fantasy: ten stories from "Tales of mystery and imagination"; | $c: chosen and edited by Roger Lancelyn Green; with colour plate and line drawings by Arthur Rackham.
## 143                                                                                                                                                                                                                                                                                          Bird of the East. | $c: Translated from the Arabic with an introd. by R. Bayly Winder.
## 144                                                                                                                                                                                                                                                                                                                                                                       Lord Jim.
## 145                                                                                                                                                                                                                                             A sentimental journey through France and Italy, | $c: by Mr. Yorick. With an introd. by John Cowper Powys and illus. by Brian Robb.
## 146                                                                                                                                                                                                                                                                                                                         The call of the wild; | $c: illustrated by Robert Todd.
## 147                                                                                                                                                                                                                                                                               Passing time & A change of heart; | two novels. | $c: Translated from the French by Jean Stewart.
## 148                                                                                                                                                                                                                                                    Anna Karenina / | $c: Leo Tolstoty ; translated and with an introduction by Rosemary Edmonds ; monotypes by Dodie Masterman.
## 149                                                                                                                                                                                                   Canada Bill; | including 'The talking leather' and '"One Eye" Joe Burkers,' | $c: [by] Karl May; translated from the German by Fred Gardner; illustrated by Elizabeth Clarke.
## 150                                                                                                                                                                                                                                                                                      The farewell party / | $c: Milan Kundera ; translated from the Czech [ms.] by Peter Kussi.
## 151                                                                                                                                                                                                                                                                                                                                                        The Chandler collection.
## 152                                                                                                                                                                                                                                                                                                                     The black tulip. | $c: With an introduction by D. Brereton.
## 153                                                                                                                                                                                                                                                                                                                                              Poisoned bait / | $c: James Ngumy.
## 154                                                                                                                                                                                                                                             The pilgrim's progress from this world to that which is to come, | delivered under the similitude of a dream, | $c: by John Bunyan.
## 155                                                                                                                                                                                                                                                                                    Sylvie - her teenage years / | $c: Henri Troyat ; translated from the French by Anthea Bell.
## 156                                                                                                                                                                                                                                                                       The cheapest nights, and other stories / | $c: Yusuf Idris ; translated from the Arabic by Wadida Wassef.
## 157                                                                                                                                                                                                                                                                                            Uncle Charles / | $c: Georges Simenon ; translated from the French by Howard Curtis.
## 158                                                                                                                                                                                                                                                                                                                                           Cabin fever / | $c: Elizabeth Jolley.
## 159                                                                                                                                                                                                                                                         Mabinogion tales / | $c: translated by Charlotte Guest ; edited by Owen Edwards ; illustrations prepared by Jo Nathan. 
## 160                                                                                                                                                                                                                                                                                        The family Carnovsky / | $c: I.J. Singer ; translated from the Yiddish by Joseph Singer.
## 161                                                                                                                                                                                                                                                                                                                   Arab folktales / | $c: translated and edited by Inea Bushnaq.
## 162                                                                                                                                                                                                                                                          The middle parts of fortune : | Somme and Ancre, 1916 / | $c: Frederic Manning ; with an introduction by Paul Fussell.
## 163                                                                                                                                                                                                                            Memoirs of a space traveller : | further reminiscences of Ijon Tichy / | $c: Stanisław Lem ; translated by Joel Stern and Maria Swiecicka-Ziemianek.
## 164                                                                                                                                                                                                                                                                                                                 Ruler in Hiroona : | a West Indian novel / | $c: G.C.H. Thomas.
## 165                                                                                                                                                                                                                                                                                                                             More tales of Pirx the pilot / | $c: Stanisław Lem.
## 166                                                                                                                                                                                                                                                                                                    The instant millionaire : | a tale of wisdom and wealth / | $c: Mark Fisher.
## 167                                                                                                                                                                                                                                                                                                                                             Spider cup / | $c: Marion Halligan.
## 168                                                                                                                                                                                                                                                                         Seven red Sundays / | $c: Ramón J. Sender ; translated from the Spanish by Sir Peter Chalmers Mitchell.
## 169                                                                                                                                                                                                                                             Each man in his darkness / | $c: by Julien Green ; translated from the French by Anne Green ; with an introduction by Paul Binding.
## 170                                                                                                                                                                                                                                                They shoot horses, don't they ; Kiss tomorrow goodbye ; No pockets in a shroud ; I should have stayed home / | $c: Horace McCoy.
## 171                                                                                                                                                                                                                                                      The opportunities of a night. | $c: Translated by Eric Sutton from La nuit et le moment. With an introd. by Aldous Huxley.
## 172                                                                                                                                                                                                                                                                                                                                            Cat and mouse / | $c: Günther Grass.
## 173                                                                                                                                                                                                                                                                                                                                                               Tales and novels.
## 174                                                                                                                                                                                                                                                                                                                                            Lilith. | $c: Introd. by Lin Carter.
## 175                                                                                                                                                                                                                                                                                                                                                                  The ante-room.
## 176                                                                                                                                                                                                                                                                                              Young Tr̲less / | $c: Robert Musil ; translated by Eithne Wilkins and Ernst Kaiser.
## 177                                                                                                                                                                                                                                                                                                                                  The heart of the matter / | $c: Graham Greene.
## 178                                                                                                                                                                                                                                                                                                                     Nectar in a sieve : | a novel / | $c: by Kamala Markandaya.
## 179                                                                                                                                                                                                                                                                                       The Golden Lotus; | a translation from the Chinese original of the novel, Chin pʻing mei,
## 180                                                                                                                                                                                                                                                                                                          Two adolescents : | Agostino and Disobedience / | $c: Alberto Moravia.
## 181                                                                                                                                                                                                                                                                                                                                                                   Tell freedom.
## 182                                                                                                                                                                                                                                                                                                                              Last tales / | $c: Isak Dinesen [i. e. K. Blixen].
## 183                                                                                                                                                                                                                                                                                                                                                      Seduction of the minotaur.
## 184                                                                                                                                                                                                                                                                         Seraphita. | $c: Translated by Katherine Prescott Wormeley. With an introd. by George Frederic Parsons.
## 185                                                                                                                                                                                                                                                                                                 The nun (La religieuse) | $c: Translated from the French by Eileen B. Hennessy.
## 186                                                                                                                                                                                                                                                                                                            A wreath for Udomo. | $c: With an introd. by Stanlake J.T. Samkange.
## 187                                                                                                                                                                                                                                                                                                                                                             Can such things be?
## 188                                                                                                                                                                                                                                                                                                 A Muriel Spark trio: | The comforters, The ballad of Peckham Rye, Memento mori.
## 189                                                                                                                                                                                                                                                            The Song of the Nibelungs. | A verse translation from the Middle High German Nibelungenlied | $c: by Frank G. Ryder.
## 190                                                                                                                                                                                                                                                                                                                                     In black and white / | $c: Rudyard Kipling.
## 191                                                                                                                                                                                                                                                                                                          A rackety colt : | the adventures of Thomas Stubbs / | $c: Guy Butler.
## 192                                                                                                                                                                                                                                                                                                                                 The Doris Lessing reader / | $c: Doris Lessing.
## 193                                                                                                                                                                                                                                                                                                                                                             The accursed kings.
## 194                                                                                                                                                                                                                                                                                                                                                             The accursed kings.
## 195                                                                                                                                                                                                                                                                                                                                          The powers that be / | $c: Mike Nicol.
## 196                                                                                                                                                                                                                                                                                    Maigret sets a trap / | $c: Georges Simenon ; translated from the French by Daphne Woodward.
## 197                                                                                                                                                                                                                                                                                        Notes from the dead house / | $c: Fyodor Dostoyevsky ; translated by Guy and Elena Cook.
## 198                                                                                                                                                                                                                                                                                  Maigret and the pickpocket / | $c: Georges Simenon ; translated from the French by Nigel Ryan.
## 199                                                                                                                                                                                                                                                                                        The long voyage / | $c: by Jorge Semprun ; translated from the French by Richard Seaver.
## 200                                                                                                                                                                                                                                                                                                                          North Carolina ghosts & legends / | $c: Nancy Roberts.
## 201                                                                                                                                                                                                                                                                                   The other side of the mountain / | $c: by Michel Bernanos ; translated by Elaine P. Halperin.
## 202                                                                                                                                                                                                                                                                                                                                         Stowaway to nowhere / | $c: Jenny Seed.
## 203                                                                                                                                                                                                                                                                                                                                     The toilers of the sea / | $c: Victor Hugo.
## 204                                                                                                                                                                                                                                                                                Mountain man : | a novel of male and female in the early American West / | $c: by Vardis Fisher.
## 205                                                                                                                                                                                                                                                                                                                                               The fog line / | $c: Carol Birch.
## 206                                                                                                                                                                                                                                                                                                                                     The great English nude / | $c: Simon Mason.
## 207                                                                                                                                                                                                                                                                                                       The sacred night / | $c: Tahar Ben Jelloun ; translated by Alan Sheridan.
## 208                                                                                                                                                                                                                                                                                                                                      A passionate man / | $c: Joanna Trollope..
## 209                                                                                                                                                                                                                                                                                The uncollected writings of Thomas De Quincey. | $c: With a pref. and annotations by James Hogg.
## 210                                                                                                                                                                                                                             Zakhar Berkut : | a picture of life in thirteenth-century Carpathian Ruthenia / | $c: Ivan Franko ; translated from the Ukrainian by Mary Skrypnyk.
## 211                                                                                                                                                                                                                                                          The Golden Lotus : | a translation, from the Chinese original, of the novel Chin Pʻing Mei / | $c: by Clement Egerton.
## 212                                                                                                                                                                                                                                                                                                                                        "Was- " : | a novel / | $c: Geoff Ryman.
## 213                                                                                                                                                                                                                                              Confessions of Felix Krull, confidence man : | the early years / | $c: Thomas Mann ; translated from the German by Denver Lindley.
## 214                                                                                                                                                                                                                                                                                                                           Memoirs of an anti-Semite / | $c: Gregor von Rezzori.
## 215                                                                                                                                                                                                                                                                                                                                  Last refuge / | $c: Elizabeth Ann Scarborough.
## 216                                                                                                                                                                                                                                                                             Constancia and other stories for virgins / | $c: Carlos Fuentes ; translated by Thomas Christensen.
## 217                                                                                                                                                                                                                                                                                                                                          Last man to die / | $c: Michael Dobbs.
## 218                                                                                                                                                                                                                                                                                                       A circle round the sun : | a foreigner in Japan / | $c: Peregrine Hodson.
## 219                                                                                                                                                                                                                                                                                                                                          Ghosts of Surrey / | $c: John Janaway.
## 220                                                                                                                                                                                                                                                                                                                                For a roll of parchment / | $c: Cyprian Ekwensi.
## 221                                                                                                                                                                                                                                                                                 Maigret goes to school / | $c: Georges Simenon ; translated from the French by Daphne Woodward.
## 222                                                                                                                                                                                                                                                                                                                           Varying degrees of hopelessness / | $c: Lucy Ellmann.
## 223                                                                                                                                                                                                                                                                                                                                    Dry bones that dream / | $c: Peter Robinson.
## 224                                                                                                                                                                                                                                                                                Of gods and giants; | norse mythology. | $c: by Harald Hveberg ; translated by Pat Shaw Iversen.
## 225                                                                                                                                                                                                                                                                                                                                         Dangerous games / | $c: Susan Crosland.
## 226                                                                                                                                                                                                                                                                               The truth about Bébé Donge / | $c: Georges Simenon ; translated from the French by Louise Varèse.
## 227                                                                                                                                                                                                                                                                         A violent life : | a novel / | $c: Pier Paolo Pasolini ; translated from the Italian by William Weaver.
## 228                                                                                                                                                                                                                                                                                                  Silent day in Tangier / | $c: Tahar Ben Jelloun ; translated by David Lobdell.
## 229                                                                                                                                                                                                                                                                       Four novellas / | $c: Natalia Ginzburg ; translated from the Italian by Avril Bardoni and Beryl Stockman.
## 230                                                                                                                                                                                                                                                                                     Our share of time / | $c: Yves Navarre ; translated by Dominic Di Bernadi and Noëlle Domke.
## 231                                                                                                                                                                                                                                                                                    Korean folk & fairy tales / | $c: retold by Suzanne Crowder Han ;[illustrated by Mi-on Kim].
## 232                                                                                                                                                                                                                                                                                     Straight up : | the autobiography of Arthur Daley / | $c: Paul Ableman [and Leon Griffiths]
## 233                                                                                                                                                                                                                                                                                        Fathers and children / | $c: Ivan Turgenev ; translated from the Russian by Avril Pyman.
## 234                                                                                                                                                                                                                                                                                                                                        Bones and silence / | $c: Reginald Hill.
## 235                                                                                                                                                                                                                                                         Mendelssohn is on the roof / | $c: Jiří Weil ; translated from the Czech by Marie Winn ; with a preface by Philip Roth.
## 236                                                                                                                                                                                                                                                 The last days of William Shakespeare : | a novel / | $c: Vlady Kociancich ; translated from the Spanish by Margaret Jull Costa.
## 237                                                                                                                                                                                                                                                                                                                        Clap hands, here comes Charlie / | $c: Brian Freemantle.
## 238                                                                                                                                                                                                                                                                                                      It ends with magic ... : | a Milligan family story / | $c: Spike Milligan.
## 239                                                                                                                                                                                                                                                                                             Right and left / | $c: Joseph Roth ; translated from the German by Michael Hofmann.
## 240                                                                                                                                                                                                                                                                                                                                             Queer / | $c: William S. Burroughs.
## 241                                                                                                                                                                                                                                                                                                                                     Beyond the black stump / | $c: Nevil Shute.
## 242                                                                                                                                                                                                                                                                                                                                            Forced smiles / | $c: David Coverly.
## 243                                                                                                                                                                                                                                                                                                  Five novels / | $c: Vladimir Nabokov ; with an introduction by Peter Quennell.
## 244                                                                                                                                                                                                                                                                                                                                 The killer : | a novel / | $c: by Colin Wilson.
## 245                                                                                                                                                                                                                                                                                                                                              Adam Bede / | $c: by George Eliot.
## 246                                                                                                                                                                                                                                                                                                                                               Ruined boys / | $c: Peter Robins.
## 247                                                                                                                                                                                                                                                          Bread and wine / | $c: Ignazio Silone ; translated from the Italian by Eric Mosbacher ; introduction by Isabel Quigly.
## 248                                                                                                                                                                                                                                                                                                                                         The distant lands / | $c: Julian Green.
## 249                                                                                                                                                                                                                                                                                                                                      A kind of marriage / | $c: Buchi Emecheta.
## 250                                                                                                                                                                                                                                                                                                                                             Dogeaters / | $c: Jessica Hagedorn.
## 251                                                                                                                                                                                                                                                                                                                                    Pita Dumbrok's prison / | $c: Ken Saro-Wiwa.
## 252                                                                                                                                                                                                                                                                                                                                                Song of be / | $c: Lesley Beake.
## 253                                                                                                                                                                                                                                                                                                                                                                   The battlers.
## 254                                                                                                                                                                                                                                                                                                                                   Strange loyalties / | $c: William McIlvanney.
## 255                                                                                                                                                                                                                                                                                      The country of the pointed firs / | $c: Sarah Orne Jewett ; illustrated by Douglas Alvord.
## 256                                                                                                                                                                                                                                                                                                                 The last prince of Ireland : | a novel / | $c: Morgan Llywelyn.
## 257                                                                                                                                                                                                                                                                                      Women in evidence / | $c: Sebastien Japrisot ; translated from the French by Ros Schwartz.
## 258                                                                                                                                                                                                                                                                                                                    Women / | $c: Philippe Sollers ; translated by Barbara Bray.
## 259                                                                                                                                                                                                                                                      Footprints in the Quag : | stories & dialogues from Soweto / | $c: Miriam Tlali ; with an introduction by Lauretta Ngcobo.
## 260                                                                                                                                                                                                                                                                                                                                                    They couldn't lose the body.
## 261                                                                                                                                                                                                                                                   The destruction of the Jews. | $c: Translated and with an introduction by G.A. Williamson. Wood-engravings by Garrick Palmer.
## 262                                                                                                                                                                                                                                                                                                                                                                 A severed head.
## 263                                                                                                                                                                                                                         The struggle in space; | red dream: Soviet-American war | $c: [by] Aleksandr Beliayev. Translated from the Russian and with an introd. by Albert Parry.
## 264                                                                                                                                                                                                                                                                                                                      Poets and dreamers: studies & translations from the Irish.
## 265                                                                                                                                                                                                                                                                                                                                    The professor of desire / | $c: Philip Roth.
## 266                                                                                                                                                                                                                                                      Mogens and other stories / | $c: Jens Peter Jacobsen ; translated from the Danish and with an afterword by Tiina Nunnally.
## 267                                                                                                                                                                                                                                                                                                                                              Night shift / | $c: Dermot Bolger.
## 268                                                                                                                                                                                                                                                                                                                                                Bleak spring / | $c: Jon Cleary.
## 269                                                                                                                                                                                                                                                                                                                                                           They came to Baghdad.
## 270                                                                                                                                                                                                                                                                                                       The sympathetic undertaker and other dreams / | $c: 'Biyi Bandele-Thomas.
## 271                                                                                                                                                                                                                                                                                                                                          Eye in the sky / | $c: Philip K. Dick.
## 272                                                                                                                                                                                                                                                                                                                                                 Loving Roger / | $c: Tim Parks.
## 273                                                                                                                                                                                                                                                                                                        Translations from the Russian and other stories / | $c: Kirsten Rutsala.
## 274                                                                                                                                                                                                                                                                                                                  The silencer : | another Levantine tale / | $c: Simon Louvish.
## 275                                                                                                                                                                                                                                                                                      Pilgrimage to Dzhvari / | $c: Valeria Alfeyeva ; translated by Stuart and Jenny Robertson.
## 276                                                                                                                                                                                                                                                                                                The journey / | $c: Ida Fink ; translated by Joanna Weschler and Francine Prose.
## 277                                                                                                                                                                                                                                                                                                        The magic mountain / | $c: Thomas Mann ; translated by H.T. Lowe-Porter.
## 278                                                                                                                                                                                                                     The maiden who rose from the sea and other Finnish folk tales / | $c: edited and translated by Helena Henderson ; introduction by Dr. Pirkko-Liisa Rausmaa.
## 279                                                                                                                                                                                                                                                                                                                                                  The bridge / | $c: Iain Banks.
## 280                                                                                                                                                                                                                                                                                                                                         Consider Phlebas / | $c: Iain M. Banks.
## 281                                                                                                                                                                                                                                                                                             Oblomov / | $c: Ivan Goncharov ; translated from the Russian by Natalie Duddington.
## 282                                                                                                                                                                                                                                                                                                    Judge on trial / | $c: Ivan Klíma ; translated from the Czech by A.G. Brain.
## 283                                                                                                                                                                                                                                                                                                                         But beautiful : | a book about jazz / | $c: Geoff Dyer.
## 284                                                                                                                                                                                                                                                                                                                 Fear / | $c: Anatoli Rybakov ; translated by Antonina W. Bouis.
## 285                                                                                                                                                                                                                                                      Nine magic pea-hens and other Serbian folk tales / | $c: collected by Vuk Karadžić ; chosen and translated by John Adlard.
## 286                                                                                                                                                                                                                                                                                                Star peace / | $c: [compiled by Valentina Malmy ; translation from the Russian].
## 287                                                                                                                                                                                                                                                              The complete prose tales of Alexandr Sergeyevitch Pushkin / | $c: translated from the Russian by Gillon R. Aitken.
## 288                                                                                                                                                                                                                                                                                                                                           The gift of stones / | $c: Jim Crace.
## 289                                                                                                                                                                                                                                October eight o'clock / | $c: Norman Manea ; translated from the Romanian by Cornelia Golna ... [et al.] ; with an introduction by Louis Begley.
## 290                                                                                                                                                                                                                                                                                                                                        The gillyvors / | $c: Catherine Cookson.
## 291                                                                                                                                                                                                                                                                                              Oblomov / | $c: Ivan Goncharov; translated from the Russian by Natalie Duddington.
## 292                                                                                                                                                                                                                                                                                Holograms of fear / | $c: Slavenka Drakuliʹc ; translated by Ellen Elias-Bursaʹc and the author.
## 293                                                                                                                                                                                                                                                                                                                                         Tropical sins / | $c: by Dana S. Cohen.
## 294                                                                                                                                                                                                               The Legend of Cuckoo Namjil : | [folk tales from Mongolia / | $c: selected and translated into English by Damdinsurengiin Altangerel ; edited by Owen Lattimore].
## 295                                                                                                                                                                                                                                               The simple life / | $c: Ernst Wiechert ; with an introduction by Marianne Jetter ; translated from the German by Marie Heynemann.
## 296                                                                                                                                                                                                                                                                                                                                                Primavera / | $c: Stevie Davies.
## 297                                                                                                                                                                                                                                                                                            Sense and sensibility / | $c: Jane Austen ; with a new introduction by David Gilson.
## 298                                                                                                                                                                                                                       The good soldier Švejk and his fortunes in the World War / | $c: Jaroslav Hašek ; translated and introduced by Cecil Parrott ; illustrated by Josef Lada.
## 299                                                                                                                                                                                                                                                  Myths and traditions of the Crow Indians / | $c: by Robert H. Lowie ; introduction to the Bison book edition by Peter Nabokov.
## 300                                                                                                                                                                                                                                                                                        A tiler's afternoon / | $c: Lars Gustafsson ; translated from the Swedish by Tom Geddes.
## 301                                                                                                                                                                                                                                                                                                                                   The mother-in-law joke / | $c: Martyn Harris.
## 302                                                                                                                                                                                                                                                                                                                  I think we should go into the jungle / | $c: Barbara Anderson.
## 303                                                                                                                                                                                                                                                                                                          The chariot of time / | $c: Yuri Medvedev ; translated by Robert King.
## 304                                                                                                                                                                                                                                          The march of the musicians / | $c: Per Olov Enquist ; translated from the Swedish by Joan Tate ; with an introduction by Kathryn Mead.
## 305                                                                                                                                                                                                                                                                                                 Little apple / | $c: Leo Perutz ; translated from the German by John Brownjohn.
## 306                                                                                                                                                                                                                                              The knight and death : | three novellas / | $c: Leonardo Sciascia ; translated from the Italian by Joseph Farrell and Marie Evans.
## 307                                                                                                                                                                                                                                                                                                 My golden trades / | $c: Ivan Klima ; translated from the Czech by Paul Wilson.
## 308                                                                                                                                                                                                                                                                                                                                       Dreams of leaving / | $c: Rupert Thomson.
## 309                                                                                                                                                                                                                                                                                  Sleepwalker in a fog / | $c: Tatyana Tolstaya ; translated from the Russian by Jamey Gambrell.
## 310                                                                                                                                                                                                                                                                                                             Fallen angels : | stories of los gamines / | $c: Robin Lloyd-Jones.
## 311                                                                                                                                                                                                                                                                                                                                                Chapel Street / | $c: Sam North.
## 312                                                                                                                                                                                                                                                                                                                                                   Sailing / | $c: Susan Kenney.
## 313                                                                                                                                                                                                                                                             Swedish folktales and legends / | $c: selected, translated, and edited by Lone Thygesen Blecher and George Blecher.
## 314                                                                                                                                                                                                                                                                                                  Infanta / | $c: Bodo Kirchhoff ; translated from the German by John Brownjohn.
## 315                                                                                                                                                                                                                                                                                                                                           Solar lottery / | $c: Philip K. Dick.
## 316                                                                                                                                                                                                                                                                                                                     The doll / | $c: Boleslaw Prus ; translated by David Welsh.
## 317                                                                                                                                                                                                                                                                                                  The laws / | $c: Connie Palmen ; translated from the Dutch by Richard Huijing.
## 318                                                                                                                                                                                                                                        The politician and other stories / | $c: Khamsing Srinawk ; translated from the Thai by Domnern Garden ; introduced by Michael Smithies.
## 319                                                                                                                                                                                                                                                                                                                                             Grand days / | $c: Frank Moorhouse.
## 320                                                                                                                                                                                                                                                                                                                                           The chosen bud / | $c: John Luangala.
## 321                                                                                                                                                                                                                                                                                                                                              The only son / | $c: David Helwig.
## 322                                                                                                                                                                                                                                    The silken thread : | stories and sketches / | $c: Cora Sandel ; translated from the Norwegian and with an introduction by Elizabeth Rokkan.
## 323                                                                                                                                                                                                                                                                                          The kingdom of this world / | $c: by Alejo Carpentier ; translated by Harriet de Onís.
## 324                                                                                                                                                                                                                                                                                                                             Monkeys in the dark / | $c: [by] Blanche d'Alpuget.
## 325                                                                                                                                                                                                                                                                                                                                             Deadly cargo! / | $c: Tony Marinho.
## 326                                                                                                                                                                                                                                                                                                                 Post office restaurant and other stories / | $c: Barry Dickins.
## 327                                                                                                                                                                                                                                                                                                                      The ship who won / | $c: Anne McCaffrey and Jody Lynn Nye.
## 328                                                                                                                                                                                                                               Amerika / | $c: Franz Kafka ; translated by Willa and Edwin Muir ; preface by Klaus Mann ; afterword by Max Brod ; illustrations by Emlen Etting.
## 329                                                                                                                                                                                                                                                                                                                           A sea of troubles; | $c: translated by Antonia White.
## 330                                                                                                                                                                                                             The personal history and experience of David Copperfield the younger. | $c: With illustrations by Phiz [pseud.] and an introduction by Charles Dickens the younger.
## 331                                                                                                                                                                                                                                                   The reign of Nero, | $c: translated by G. G. Ramsay with an introduction by Dr. A. S. Osley and illustrations by Eric Fraser.
## 332                                                                                                                                                                                                                                                                                                                                   The man who broke things / | $c: John Brooks.
## 333                                                                                                                                                                                                                                        Southern mail. | Night flight. | $c: Translated from the French by Curtis Cate (with acknowledgements to Stuart Gilbert's translations.)
## 334                                                                                                                                                                                                                                                                                                                                        Pieces of music / | $c: Michael Jackson.
## 335                                                                                                                                                                                                                                                                                                                                     The mountain people / | $c: Colin Turnbull.
## 336                                                                                                                                                                                                                                                                                                                                     My brother, my self / | $c: by Phil Andros.
## 337                                                                                                                                                                                                                                                                                    Turbulence : | a novel / | $c: Chico Buarque ; translated from the Portuguese by Peter Bush.
## 338                                                                                                                                                                                                            A taste of earth, and other legends of Vietnam / | $c: Thich Nhat Hanh ; translated from the Vietnamese by Mobi Warren ; drawings by Nguyen Thi Hop and Nguyen Dong.
## 339                                                                                                                                                                                                                                                                                                                                    The midnight country / | $c: Michael Mullen.
## 340                                                                                                                                                                                                                                                                                                                                          The son avenger / | $c: Sigrid Undset.
## 341                                                                                                                                                                                                                                                                                         Imagining women : | Fujian folk tales / | $c: selected and translated by Karen Gernant.
## 342                                                                                                                                                                                                                                                                                 The midnight love feast / | $c: Michel Tournier ; translated from the French by Barbara Wright.
## 343                                                                                                                                                                                                                                                                                                                                                     Nexus / | $c: Henry Miller.
## 344                                                                                                                                                                                                                                                                                                               The prodigy / | $c: Hermann Hesse ; translated by W. J. Strachan.
## 345                                                                                                                                                                                                                                                                                                                                                                      Americana.
## 346                                                                                                                                                                                                                                                                                           The sword of Shannara / | $c: Terry Brooks ; illustrated by the Brothers Hildebrandt.
## 347                                                                                                                                                                                                                                                                                                                           The assistant : | a novel / | $c: by Bernard Malamud.
## 348                                                                                                                                                                                                                                                                    The house of seven gables, | $c: ed. by Clyde Furst. Revised by H.Y. Moffett. Illustrated by Homer W. Colby.
## 349                                                                                                                                                                                                                                                                                                                                           The survivor / | $c: Thomas Keneally.
## 350                                                                                                                                                                                                                                                                                                                                         To the death, amic / | $c: John Bryson.
## 351                                                                                                                                                                                                                                                                                                                                              Just like that / | $c: Lily Brett.
## 352                                                                                                                                                                                                                                                                                                     Kiss in the Hotel Joseph Conrad and other stories / | $c: by Howard Norman.
## 353                                                                                                                                                                                                                                                                          A last glass of tea and other stories / | $c: Mohamed El-Bisatie ; translated by Denys Johnson-Davies.
## 354                                                                                                                                                                                                                                                                                                                                      A year of our lives / | $c: John MacKenna.
## 355                                                                                                                                                                                                                                                                    Sibenik : | in the period of Tito's partisans, 1941-1945 / | $c: Lenke Weinerth ; translated by Paul Tabori.
## 356                                                                                                                                                                                                                                                                                                                                 Appointment with death / | $c: Agatha Christie.
## 357                                                                                                                                                                                                                                                                                     Parisians and provincials / | $c: Alexandre Dumas ; translated and edited by A. Craig Bell.
## 358                                                                                                                                                                                                                                                                                                             Emma / | $c: Jane Austen ; with a new introduction by David Gilson.
## 359                                                                                                                                                                                                                                                                                                             Emma / | $c: Jane Austen ; with a new introduction by David Gilson.
## 360                                                                                                                                                                                                                                 French folktales from the collection of Henri Pourrat / | $c: selected by C.G. Bjurström ; translated and with an introduction by Royall Tyler.
## 361                                                                                                                                                                                                                                                 Three Egyptian short stories / | $c: Youssef Idris (Yūsuf Idrīs) ; translated with a critical introduction by Saad El-Gabalawy.
## 362                                                                                                                                                                                                         Folk tales and legends of the Dai people : | the Thai Lue in Yunnan, China / | $c: translated from Chinese text by Ying Yi ; edited by John Hoskin and Geoffrey Walton.
## 363                                                                                                                                                                                                                                                                                                                                     Coromandel sea change / | $c: Rumer Godden.
## 364                                                                                                                                                                                                                                                                                                                                         The sense of things / | $c: Alison Dye.
## 365                                                                                                                                                                                                                                                        Dom Casmurro / | $c: Machado de Assis ; translated from the Portuguese and with an introduction by R.L. Scott-Buccleuch.
## 366                                                                                                                                                                                                                                                                                                                      Elissa / | $c: Fawzi Mellah ; translated by Howard Curtis.
## 367                                                                                                                                                                                                                                                                                  René's flesh / | $c: Virgilio Piñera ; translated by Mark Schafer ; foreword by Antón Arrufat.
## 368                                                                                                                                                                                                                                                                                                                                     Manhattan transfer / | $c: John Dos Passos.
## 369                                                                                                                                                                                                                                                                                                                            Zami, a new spelling of my name / | $c: Audre Lorde.
## 370                                                                                                                                                                                                                                                                                                                        Folktales of Japan. | $c: Translated by Robert J. Adams.
## 371                                                                                                                                                                                                                                                                                                                              Korean folk-tales / | $c: retold by James Riordan.
## 372                                                                                                                                                                                                                                                                                                                       The trials of Nero Okambo / | $c: D. Davin and P. Wamuhu.
## 373                                                                                                                                                                                                                                                                                                                                               Shades / | $c: Marguerite Poland.
## 374                                                                                                                                                                                                                                                                The key of gold : | 23 Czech folk tales / | $c: selected and translated by Josef Baudis ; with 11 illustrations.
## 375                                                                                                                                                                                                                                                                                                                 Family / | $c: Natalia Ginzburg ; translated by Beryl Stockman.
## 376                                                                                                                                                                                                                                                                                                                       The remains of the last emperor / | $c: Adebayo Williams.
## 377                                                                                                                                                                                                                                                                                                         Echoes in the mind : | short stories / | $c: by Akachi Adimora-Ezeigbo.
## 378                                                                                                                                                                                                                                                                                                  The city and the mountains / | $c: Eȧ de Queiros ; translated by Roy Campbell.
## 379                                                                                                                                                                                                                                                                                                                  Jury : | the people vs. Juan Corona / | $c: Victor Villaseñor.
## 380                                                                                                                                                                                                                                                                                            The collector of treasures: |  and other Botswana village tales / | $c: Bessie Head.
## 381                                                                                                                                                                                                                                                                                                A Chinese torture garden / | $c: Octave Mirbeau ; translated by Raymond Rudorff.
## 382                                                                                                                                                                                                                                                                                               The trusting and the maimed, | and other Irish stories. | $c: by  James Plunkett.
## 383                                                                                                                                                                                                                                                                                                                                             The country of marriage; | a novel.
## 384                                                                                                                                                                                                                                                                         The political prisoner, and, The beautiful summer / | $c: translated from the Italian by W.J. Strachan.
## 385                                                                                                                                                                                                                                                                                                            Wonderful clouds / | $c: Françoise Sagan ; translated by Anne Green.
## 386                                                                                                                                                                                                                                                                                            The good soldier, | a tale of passion. | $c: With an interpretation by Mark Schorer.
## 387                                                                                                                                                                                                                                         Diamonds of the night / | $c: Arnošt Lustig ; translated from the Czech by Jeanne Nĕmcová ; with an introduction by Mordecai Schreiber.
## 388                                                                                                                                                                                                                                                                                                                                              The tin men / | $c: Michael Frayn.
## 389                                                                                                                                                                                                                                                                                                                                                                     Blue river.
## 390                                                                                                                                                                                                                                                                                                                                         House of tribes / | $c: Garry Kilworth.
## 391                                                                                                                                                                                                      Forbidden fruit and other tales / | $c: by Juhani Aho ; translated from the Finnish by Inkeri Väänänen-Jensen ; edited by Joanne Asala ; illustrated by Diane Heusinkveld.
## 392                                                                                                                                                                                                                                                                                    Killers are storming the Parliament / | $c: Peter Alyoshkin ; [English translation by Golos]
## 393                                                                                                                                                                                                                                                      In his own image, | $c: by Frederick W. S. A. L. M. Rolfe (Frederick Baron Corvo, pseud.) With an introd. by Shane Leslie.
## 394                                                                                                                                                                                                                                                                                                                  From a Swedish homestead. | $c: Translated by Jessie Brochner.
## 395                                                                                                                                                                                                                                                                                                   The Count of Monte Cristo / | $c: Alexandre Dumas ; introd. by Marcel Girard.
## 396                                                                                                                                                                                                                                                                                                          The collected tales of Pierre Louÿs. | $c: Illustrated by John Austen.
## 397                                                                                                                                                                                                                                                                                    Trap for Cinderella / | $c: Sébastien Japrisot ; translated from the French by Helen Weaver.
## 398                                                                                                                                                                                                                                                                                                                                         The end of vandalism / | $c: Tom Drury.
## 399                                                                                                                                                                                                                                                                                                                               The ram of God : | a novel / | $c: John B. Keane.
## 400                                                                                                                                                                                Quo vadis : | a classic story of love and adventure / | $c: Henryk Sienkiewicz ; edited and abridged for today's reader by James S. Bell, Jr. ; [translated from the Polish by Jeremiah Curtin].
## 401                                                                                                                                                                                                                                                                                                                           Gather yourselves together / | $c: by Philip K. Dick.
## 402                                                                                                                                                                                                                                                                                                                        Half of paradise : | a novel / | $c: by James Lee Burke.
## 403                                                                                                                                                                                                                                                                                                                                        The rape of Sita / | $c: Lindsey Collen.
## 404                                                                                                                                                                                                                                                                                                The Phynodderree, and other legends of the Isle of Man / | $c: by Edward Callow.
## 405                                                                                                                                                                                                                                                                                                  Them, a novel from the last days of the old South Africa / | $c: Jenny Robson.
## 406                                                                                                                                                                                                                                Scandinavian folk-lore; | illustrations of the traditional beliefs of the northern peoples. | $c: Selected and translated by William A. Craigie.
## 407                                                                                                                                                                                                                                                                              Brothers of the Cosmos / | $c: Takis G. Phylactou ; translated from the Greek by Rhea Frangofinou.
## 408                                                                                                                                                                                                                                                                                                                       Paradise reclaimed. | $c: Translated by Magnus Magnusson.
## 409                                                                                                                                                                                                                                                                      Essential Chinese mythology / | $c: Martin Palmer and Zhao Xiaomin ; with Joanne O'Brien and James Palmer.
## 410                                                                                                                                                                                                                                                                                                                                                 Red nights / | $c: Louis Nowra.
## 411                                                                                                                                                                                                                                                                                                                                       The party is over / | $c: James Matthews.
## 412                                                                                                                                                                                                                                                                                                            Chéri, | and The last of Chéri. | $c: [Translated by Roger Senhouse]
## 413                                                                                                                                                                                                                                                                                                                                                     The works of Joseph Conrad.
## 414                                                                                                                                                                                                                                                                                            The Iliad / | $c: Homer ; translated by E. V. Rieu ; lithographs by Elisabeth Frink.
## 415                                                                                                                                                                                                                                                                      The pastoral loves of Daphnis and Chloe / done into English by George Moore ; introduction by Samuel Roth.
## 416                                                                                                                                                                                                                                                        La bâtarde / | $c: Violette Leduc ; with a foreword by Simone de Beauvoir ; translated from the French by Derek Coltman.
## 417                                                                                                                                                                                                                                       Confession of a child of the century = | Confession d'un enfant du siècle / | $c: by Alfred de Musset ; with a pref. by Henri de Bornier.
## 418                                                                                                                                                                                                                                                                                      House of dolls / | $c: by Ka-tzetnik 135633 ; translated from the Hebrew by Moshe M. Kohn.
## 419                                                                                                                                                                                                                                                                                                                                           Selected stories / | $c: Alice Munro.
## 420                                                                                                                                                                                                                                                                                                              Mobie-Diq / | $c: Marie Redonnet ; translated by Dan McGillicuddy.
## 421                                                                                                                                                                                                                                                                                                                             Rising sun : | a novel / | $c: by Michael Crichton.
## 422                                                                                                                                                                                                                                                                                 Nostromo : | a tale of the seaboard / | $c: Joseph Conrad ; introd. and notes by Norman Sherry.
## 423                                                                                                                                                                                                                                                      The children's wing / | $c: by Pierre Billon ; translated and adapted from the French by Sheila Fischman, with the author.
## 424                                                                                                                                                                                                                                                                                                                                  Seven tales and a fable / | $c: Gwyneth Jones.
## 425                                                                                                                                                                                                                                                     Pleasures and regrets / | $c: Marcel Proust ; translated from the French by Louise Varese ; with a preface by D.J. Enright.
## 426                                                                                                                                                                                                                                                                                                                                           The donor / | $c: Christiaan Barnard.
## 427                                                                                                                                                                                                                                                                                                                                                    Kent Town / | $c: Nene Gare.
## 428                                                                                                                                                                                                                                                             The lady in the car with glasses and a gun / | $c: Sébastien Japrisot ; translated from the French by Helen Weaver.
## 429                                                                                                                                                                                                                                                                                                                                               Sheikh of lovers / | $c: Ali Tal.
## 430                                                                                                                                                                                                                                     Weird tales from northern seas : | Norwegian legends / | $c: by Jonas Lie ; illustrations by Laurence Housman ; [preface by R.Nisbet Bain].
## 431                                                                                                                                                                                                                                                     Russian adult humor : | naughty folktales of old Russia / | $c: compiled by Aleksandr Afanasiev ; translated by G. Perkoff.
## 432                                                                                                                                 The rainbow flute : | a collection of short stories translated from indigenous languages to reflect the spectrum of Black experience in Southern Africa / | $c: M.S. Magagula ... [et al.] ; compiled by D.B.Z. Ntuli ; edited by R. Finlayson.
## 433                                                                                                                                                                                                                                                                        Watunna : | an Orinoco creation cycle / | $c: Marc de Civrieux ; edited and translated by David M. Guss.
## 434                                                                                                                                                                                                                                                                 Return to the château ; | preceded by, A girl in love / | $c: by Pauline Réage ; translated by Sabine d'Estrée.
## 435                                                                                                                                                                                                                                                                                                                                   The Spaniard. | $c: Translated by W. G. Corp.
## 436                                                                                                                                                                                                                                                                                                                                                                        Lao She.
## 437                                                                                                                                                                                                                                                                                                                            North star conspiracy / | $c: Miriam Grace Monfredo.
## 438                                                                                                                                                                                                                                                                                                                                                   Maori myths & tribal legends,
## 439                                                                                                                                                                                                                                                                                                             Shadowlight / | $c: Pierre Mertens ; translated by Edmund Jephcott.
## 440                                                                                                                                                                                                                                                                                                                                  The chin kiss king / | $c: Ana Veciana-Suarez.
## 441                                                                                                                                                                                                                                                                                                                                                     Six novels / | $c: Colette.
## 442                                                                                                                                                                                                                                                                                                                                          Twice twenty-two / | $c: Ray Bradbury.
## 443                                                                                                                                                                                                                                                                                                       Baroque at dawn / | $c: Nicole Brossard ; translated by Patricia Claxton.
## 444                                                                                                                                                                                                                                                                     Cousin Bette : | part one of Poor relations / | $c: Honoré de Balzac ; translated by Marion Ayton Crawford.
## 445                                                                                                                                                                                                                                                                                                                                    Moonbay : | short stories / | $c: by Ty Pak.
## 446                                                                                                                                                                                                                                                                                                              The gates of Kunarja; | an Ogilvie novel, | $c: by Duncan MacNeil.
## 447                                                                                                                                                                                                                                                                                                                                             The strollers / | $c: Lesley Beake.
## 448                                                                                                                                                                                                                                                                                                                                    The night of the hunter / | $c: Davis Grubb.
## 449                                                                                                                                                                                                                                                                                         The veil of Veronica, | $c: by Gertrud von Le Fort. Translated by Conrad M.R. Bonacina.
## 450                                                                                                                                                                                                                                                                                                                                  The sundering flood / | $c: by William Morris.
## 451                                                                                                                                                                                                                                                                                                                                                 Tamsin / | $c: Peter S. Beagle.
## 452                                                                                                                                                                                             Roubles in words, kopeks in figures and other stories / | $c: Vasily Shukshin ; translated from the Russian by Natasha Ward and David Iliffe ; introduction by Yevgeny Yevtushenko.
## 453                                                                                                                                                                                                                                                                                                                                 The teardrop story woman / | $c: Catherine Lim.
## 454                                                                                                                                                                                                                                                                                                                                 The happy hunting grounds / | $c: Nanne Tepper.
## 455                                                                                                                                                                                                                                                                                     The stone raft / | $c: José Saramago ; translated from the Portuguese by Giovanni Pontiero.
## 456                                                                                                                                                                                                                                                       Snowbound : | the record of a theatrical touring company / | $c: by Bram Stoker ; annotated and edited by Bruce Wightman.
## 457                                                                                                                                                                                                                                                    Down there (Là bas); | a study in satanism, | $c: by J. K. Huysmans. Translated by Keene Wallis.  Introd. by Robert Baldick.
## 458                                                                                                                                                                                                                                                                                                                                   The lostness of Alice / | $c: John Conyngham.
## 459                                                                                                                                                                                                                                                      Adventures of Huckleberry Finn / | $c: Mark Twain ; introduction by Justin Kaplan ; foreword and addendum by Victor Doyno.
## 460                                                                                                                                                                                                                                                        A victim of circumstances : | E.S. Madima's celebrated novel / | $c: translated from the original Venda by Tenda Madima.
## 461                                                                                                                                                                                                                                                                                                                                          Because I love him / | $c: Usen Smith.
## 462                                                                                                                                                                                                                                                                                                                                             The quiet land / | $c: Brian Leung.
## 463                                                                                                                                                                                                                Psyche / | $c: Louis Couperus ; translated from the Dutch by B.S. Berrington. Cupid and Psyche / Lucius Apuleius ; translated [from the Latin] by Robert Graves.
## 464                                                                                                                                                                                                                                                                                   The three-arched bridge / | $c: Ismail Kadare ; translated from the Albanian by John Hodgson.
## 465                                                                                                                                                                                                                                                                  The realist / | $c: Hermann Broch : translated by Willa and Edwin Muir,with a biographical note by John White.
## 466                                                                                                                                                                                                                                                                                                                                          Mpuonzi's dream / | $c: Joseph Situma.
## 467                                                                                                                                                                                                                                                                                                   The novels of Ivan Turgenev; | $c: tr. from the Russian by Constance Garnett.
## 468                                                                                                                                                                                                                                                                                                   The novels of Ivan Turgenev; | $c: tr. from the Russian by Constance Garnett.
## 469                                                                                                                                                                                                                                                                                                   The novels of Ivan Turgenev; | $c: tr. from the Russian by Constance Garnett.
## 470                                                                                                                                                                                                                                                                             Fabulya's wives and other stories / | $c: Ivan Mandy ; translated from the Hungarian by John Batki.
## 471                                                                                                                                                                                                                                                                                       The melancholy of resistance / | $c: László Krasznahorkai ; translated by George Szirtes.
## 472                                                                                                                                                                                                                                                                                                           My brother's gun / | $c: Ray Loriga ; translated by Kristina Cordero.
## 473                                                                                                                                                                                                                                                                                                                                      The twelfth dialogue / | $c: Tom Petsinis.
## 474                                                                                                                                                                                                                                                                                                       The Vintage Turgenev; | $c: translated from the Russian by Harry Stevens.
## 475                                                                                                                                                                                                                                                                  Creation myths of primitive America / | $c: Jeremiah Curtin ; edited and with an introduction by Karl Kroeber.
## 476                                                                                                                                                                                                                                                                                              Grendel : | past prime / | $c: written by Greg Rucka ; illustrated by Matt Wagner.
## 477                                                                                                                                                                                                                                                                                           One minute stories / | $c: István Örkény ; selected and translated by Judith Sollosy.
## 478                                                                                                                                                                                                                                                        Colours and years / | $c: Margit Kaffka ; English translation by George F. Cushing ; introduction by Charlotte Franklin.
## 479                                                                                                                                                                                                                                                                                                        The sun worshiper / | $c: István Gáll ; translated by Thomas DeKornfeld.
## 480                                                                                                                                                                                                                                                                                    The new life : | a novel / | $c: by Orhan Pamuk ; translated from the Turkish by Güneli Gün.
## 481                                                                                                                                                                                                                                                                                   Breathing space / | $c: Marita van der Vyver ; translated from the Afrikaans by Isobel Dixon.
## 482                                                                                                                                                                                                                                                                                     Prayers of a young man / | $c: Roch Carrier ; translated from the French by Sheila Fischman
## 483                                                                                                                                                                                                                                                                                  The merciful women / | $c: Federico Andahazi ; translated from the Spanish by Alberto Manguel.
## 484                                                                                                                                                                                                                                                                                                                               Brown lord of the mountain / | $c: Walter Macken.
## 485                                                                                                                                                                                                                                                                   Traditional Slovak folktales / | $c: collected by Pavol Dobsinsky ; edited and translated by David L. Cooper.
## 486                                                                                                                                                                                                                                                                                                                                                         Like / | $c: Ali Smith.
## 487                                                                                                                                                                                                                                                                                                                                        The white life / | $c: by Michael Stein.
## 488                                                                                                                                                                                                                                                                                                                     God made Sunday, | and other stories / | $c: Walter Macken.
## 489                                                                                                                                                                                                                                                                                     My name is Alzheimer / | $c: Tania Lovinescu ; translated from Hebrew by Mariana Balotescu.
## 490                                                                                                                                                                                                                                                                                                   The queen of trouble / | $c: Maria Marian ; translaled [sic] by Laura Scurtu.
## 491                                                                                                                                                                                                                                                                                                                Les misérables / | $c: Victor Hugo ; translated by Norman Denny.
## 492                                                                                                                                                                                                                                                               The winter garden : | a novel / | $c: by Johanna Verweerd ; [translated into English by Helen Richardson-Hewitt].
## 493                                                                                                                                                                                                                                                                                             Silent extras / | $c: by Arnon Grunberg ; translated from the Dutch by Sam Garrett.
## 494                                                                                                                                                                                                                                                                                                                                       People of heaven / | $c: Beverley Harper.
## 495                                                                                                                                                                                                                                                                                      All men are brothers | (Shui hu chuan) | $c: Translated from the Chinese by Pearl S. Buck.
## 496                                                                                                                                                                                                                                                                                                                    The garden of tortures; | $c: translated by Raymond Rudorff.
## 497                                                                                                                                                                                                                         Lowland tales : | short stories from Friesland / | $c: [Hylkje Gon̐ga, Hylke Speerstra, Rink van der Velde ; translated into English by Henry J. Baron].
## 498                                                                                                                                                                                                                                                                          The tattoo hunter : | a novel / | $c: Juvenal Acosta ; translated from the Spanish by Janet Casaverde.
## 499                                                                                                                                                                                                                                                                           The Flanders panel / | $c: Arturo Pérez-Reverte ; translated from the Spanish by Margaret Jull Costa.
## 500                                                                                                                                                                                                                                                                                                                                          A vase of shrubs / | $c: Victor Bruce.
## 501                                                                                                                                                                                                                                                                                                                                        The Stone diaries / | $c: Carol Shields.
## 502                                                                                                                                                                                                                                         The Queen of Spades | [and], The captain's daughter, | $c: by A. S. Pushkin; translated by Gillon R. Aitken, etchings by Clarke Hutton.
## 503                                                                                                                                                                                                                                                                                                                                                            The way we live now.
## 504                                                                                                                                                                                                                                                                                                                                                Suttree / | $c: Cormac McCarthy.
## 505                                                                                                                                                                                                                                                                                        The Dumas club / | $c: Arturo Pérez-Reverte ; translated from the Spanish by Sonia Soto.
## 506                                                                                                                                                                                                                                                                                                                                What makes Sammy run? / | $c: by Budd Schulberg.
## 507                                                                                                                                                                                                                                                 The white guard / | $c: Mikhail Bulgakov ; translated from the Russian by Michael Glenny ; with an epilogue by Viktor Nekrasov.
## 508                                                                                                                                                                                                                       The transformations of Lucius; | otherwise known as The golden ass, | $c: by Lucius Apuleius. Translated by Robert Graves. Lithographs by Michael Ayrton.
## 509                                                                                                                                                                                                                                                                        Who's afraid of Agatha Christie? : | and other stories / | $c: Ahmed Fagih ; translated from the Arabic.
## 510                                                                                                                                                                                                                                                                                      Cephalonian tales / | $c: by Spyridon Skiadaressi ; translated by Maki Razi and Alec Reid.
## 511                                                                                                                                                                                                                                                                                       Charles, Diana and me and other stories / | $c: Ahmed Fagih ; translated from the Arabic.
## 512                                                                                                                                                                                                                                                                                             Mongolian folktales and legends / | $c: [translated into English by D. Altangerel].
## 513                                                                                                                                                                                                                                                                                                                                  The circle of reason  / | $c: by Amitav Ghosh.
## 514                                                                                                                                                                                                                                                                 Selected short stories of Franz Kafka / | $c: translated by Willa and Edwin Muir ; introduction by Philip Rahv.
## 515                                                                                                                                                                                                                                                                                                    A ghost at noon / | $c: [by] Alberto Moravia ; translated by Angus Davidson.
## 516                                                                                                                                                                                                                                                                                                        Buridan's ass / | $c: by G&#xfc;nter de Bruyn ; translated by John Peet.
## 517                                                                                                                                                                                                                                                                Tales of two countries. | $c: Translated from the Norwegian by William Archer. With an introd. by H. H. Boyesen.
## 518                                                                                                                                                                                                                                                                                                                                     The secret of my face / | $c: Karen Ardiff.
## 519                                                                                                                                                                                                                                                                                                         The German lesson. | $c: Translated by Ernst Kaiser and Eithne Wilkins.
## 520                                                                                                                                                                                                                                                                                                     As far as my feet will carry me. | $c: Translated by Lawrence P. R. Wilson.
## 521                                                                                                                                                                                                                                                                                                           Selected Russian short stories, chosen and translated by A.E. Chamot.
## 522                                                                                                                                                                                                                                                                                       John Christopher: Journey's end / | $c: by Romain Rolland ; translated by Gilbert Cannan.
## 523                                                                                                                                                                                                                                                                                            Other side; | a fantastic novel. | $c: Translated from the German by Denver Lindley.
## 524                                                                                                                                                                                                                                                                                     The Sardinian hostage / | $c: Antonio Cossu ; translated from the Italian by Isabel Quigly.
## 525                                                                                                                                                                                                      The answers | of Ernst von Salomon to the 131 questions in the Allied Military Government "Fragebogen"; | $c: translated by Costantine Fitzgibbon.  Pref. by Goronwy Rees.
## 526                                                                                                                                                                                                                                                                                                      A crime of honour, | $c: Translated from the Italian by Raymond Rosenthal.
## 527                                                                                                                                                                                                                                                                  The story of Adan-Wade : | a Tiv classic / | $c: Suemo Chia ; translated with introduction by Tyohdzuah Akosu.
## 528                                                                                                                                                                                                                                                                                                            Sleepless days / | $c: Jurek Becker ; translated by Leila Vennewitz.
## 529                                                                                                                                                                                                                                                                                         A servant of slaves : | the life of Henriette Delille : a novel / | $c: William Kelley.
## 530                                                                                                                                                                                                                                                                                                        The Book of Amuwapi / | $c: Christopher Lord ; illustrated by Petr Nikl.
## 531                                                                                                                                                                                                                                                                                                                                   Night work : | a novel / | $c: Nelson George.
## 532                                                                                                                                                                                                                                                                                                                                    A catch of consequence / | $c: Diana Norman.
## 533                                                                                                                                                                                                                                                                                                                                    Ruslan : | a novel / | $c: Barbara Scrupski.
## 534                                                                                                                                                                                                                                       Icelandic folk tales and fairy stories / | $c: selected, translated and edited by Holmes Boynton ; cover and ill. by Peter Magnus Wengel.
## 535                                                                                                                                                                                                                                                                                                           My husband, Bar Kokhba : | a historical novel / | $c: Andrew Sanders.
## 536                                                                                                                                                                                                                                                                                                                                                   Pig island / | $c: Mo Hayder.
## 537                                                                                                                                                                                                                                                                                                                                         No god in sight / | $c: Altaf Tyrewala.
## 538                                                                                                                                                                                                                                                                                                                                             Wound Licker / | $c: Jason Johnson.
## 539                                                                                                                                                                                                                                                                                             Tear down the mountain : | an Appalachian love story / | $c: by Roger Alan Skipper.
## 540                                                                                                                                                                                                                                                                                                                  Settling accounts. | $c: Harry Turtledove. | $p: The grapple /
## 541                                                                                                                                                                                                                                                                                                                                 From the listening hills / | $c: Louis L'Amour.
## 542                                                                                                                                                                                                                                                                                                                                                   Red zone / | $c: Mike Lupica.
## 543                                                                                                                                                                                                                                                                                                                       In the presence of mine enemies / | $c: Harry Turtledove.
## 544                                                                                                                                                                                                                                                                                                                                               Nothing simple / | $c: Lia Mills.
## 545                                                                                                                                                                                                                     Moroccan folktales / | $c: Jilali El Koudia ; translated from the Arabic by Jilali El Koudia and Roger Allen ; with critical analysis by Hasan M. El-Shamy.
## 546                                                                                                                                                                                                                                                                                                                Thérèse / | $c: François Mauriac ; translated by Gerard Hopkins.
## 547                                                                                                                                                                                                                                                                                                              Wings of stone / | $c: Robert Menasse ; translated by David Bryer.
## 548                                                                                                                                                                                                                                                                                                                            The fairy flag, and other stories / | $c: Jim Savio.
## 549                                                                                                                                                                                                                                                                                                                                      The white lioness / | $c: Henning Mankell.
## 550                                                                                                                                                                                                 Sparrow, Temptation and Cavalleria Rusticana / | $c: Giovanni Verga ; translated by Christine Donougher and D. H. Lawrence ; and with an afterword and chronology by Eric Lane.
## 551                                                                                                                                                                                                                                                                                                                                             Call me Kick! / | $c: John Osander.
## 552                                                                                                                                                                                                                                                                                                                                                     Baggage / | $c: Emily Barr.
## 553                                                                                                                                                                                                                                                                     The 13 culprits = | Les 13 coupables / | $c: Georges Simenon ; first English translation by Peter Schulman.
## 554                                                                                                                                                                                                                                                                                            The silent prophet / | $c: Joseph Roth ; translated from the German by David Le Vay.
## 555                                                                                                                                                                                                                                                                   The other shore : | a novel / | $c: Mohammed Gebril ; translated by Gamel Abdel Nasser ; revised by M. Enani.
## 556                                                                                                                                                                                                                                                                   Mawardi cafe / | $c: Mohammed Galal ; translated by Marlyn Iskandar ; revised and edited by Mursi Saad Eddin.
## 557                                                                                                                                                                                                                                                                            Short stories / | $c: Abdul-Al El-Hamamsi ; translated by Hala El-Borollosy ; revised by M.M. Enani.
## 558                                                                                                                                                                                                                                                        The language of pain and other stories / | $c: Yusuf Idris ; translated by Nawal Nagib with an introduction by M. Enani.
## 559                                                                                                                                                                                                                                                                                          Uncertain glory / | $c: by Joan Sales ; translated from Catalan by David H. Rosenthal.
## 560                                                                                                                                                                                                                                                                                                     Lucca / | $c: Jens Christian Grn̜dahl ; translated from Danish by Anne Born.
## 561                                                                                                                                                                                                                                                                                                                                Riding with the queen / | $c: Jennie Shortridge.
## 562                                                                                                                                                                                                                                                                                                                The lovers / | $c: Alice Ferney ; translated by Helen Stevenson.
## 563                                                                                                                                                                                                                                                            Confession of a murderer : | told in one night / | $c: Joseph Roth ; translated from the German by Desmond I. Vesey.
## 564                                                                                                                                                                                                                                                                                                                                       The Fu-Manchu omnibus / | $c: Sax Rohmer.
## 565                                                                                                                                                                                                                                                                                        Brother Bill's bait bites back and other tales from the Raton / | $c: Ricardo L García. 
## 566                                                                                                                                                                                                                                                                                      Lovesick / | $c: Angeles Mastretta ; translated from the Spanish by Margaret Sayers Peden.
## 567                                                                                                                                                                                                                                                                                                                                 The madman of Bergerac / | $c: Georges Simenon.
## 568                                                                                                                                                                                                                                                                                                                 African myths and legends / | $c: Jay Heale and Dianne Stewart.
## 569                                                                                                                                                                                                                                                                                                Maigret and the ghost / | $c: Georges Simenon ; translated by Eileen Ellenbogen.
## 570                                                                                                                                                                                                                                                                                                                                         The anatomy of truth / | $c: Kate Wild.
## 571                                                                                                                                                                                                                                                                                                                                             The secret cure / | $c: Sue Woolfe.
## 572                                                                                                                                                                                                                                                                                                                                            The piano teacher / | $c: Lynn York.
## 573                                                                                                                                                                                                                                                                                                                                  Separate rooms / | $c: Pier Vittorio Tondelli.
## 574                                                                                                                                                                                                                                                                        Others' paradise / | $c: Paul Leppin ; translated from the German by Stephanie Howard and Amy R. Nestor.
## 575                                                                                                                                                                                                                                                                                                                                      The ultimate Havana / | $c: John Lantigua.
## 576                                                                                                                                                                                                                                                                                                                             The love queen of the Amazon / | $c: Cecile Pineda.
## 577                                                                                                                                                                                                                  A hunger most cruel : | selected prose fiction / | $c: Anatoliy Dimarov, Yevhen Hutsalo, Olena Zvychayna ; translated by Roma Franko ; edited by Sonia Morris.
## 578                                                                                                                                                                                                                                                       Broken wings : | selected prose fiction / | $c: by Anatoliy Dimarov ; translated by Roma Franko ; edited by Sonia Morris.
## 579                                                                                                                                                                                                                                                                                                                                         Parting of the clouds / | $c: John Fry.
## 580                                                                                                                                                                                                                                                                                                                                        An Irish solution / | $c: Cormac Millar.
## 581                                                                                                                                                                                                                                  Stormy isles : | an Azorean tale / | $c: Vitonio Nemésio ; edited, translated, annotated, and with an Introduction by Francisco Cota Fagundes.
## 582                                                                                                                                                                                                                                                                                                                     Waltzes I have not forgotten / | $c: Bernadette Gabay Dyer.
## 583                                                                                                                                                                                                                                                                                          Texas ghost stories : | fifty favorites for the telling / | $c: Tim Tingle, Doc Moore.
## 584                                                                                                                                                                                                                                The prince and other modern fables / | $c: Rabindranath Tagore ; translated from the Bengali by Sreejata Guha ; illustrations by Rosy Rodrigues.
## 585                                                                                                                                                                                                                                                                           Of gods and giants: | Norse mythology. | $c: Translated by Pat Shaw Iversen. Illustrated by Kai Övre.
## 586                                                                                                                                                                                               The mysterious island / | $c: Jules Verne ; translated by Jordan Stump ; introduction by Caleb Carr ; with illustrations from the original 1875 edition by Jules-Descartes Ferat.
## 587                                                                                                                                                                                                                                                             The staircase / | $c: Alexander Zhitinsky ; translated from the Russian by Clare Burstall and Vladimir Kisselnikov.
## 588                                                                                                                                                                                                                                                                                                                                                           Balthazar, | a novel.
## 589                                                                                                                                                                                                                                                                                                                                                          The climate of belief.
## 590                                                                                                                                                                                                                                                                           Stories / | $c: Fyodor Dostoyevsky ; [translated from the Russian ; illustrated by Andrei Goncharov].
## 591                                                                                                                                                                                                                                                                                                                                    Cry, the beloved country / | $c: Alan Paton.
## 592                                                                                                                                                                                                                                                                                                                                       The pistol poets / | $c: Victor Gischler.
## 593                                                                                                                                                                                                                                                                                                                                              An adoration / | $c: Nancy Huston.
## 594                                                                                                                                                                                                                                                                                                                       The city of churches : | a novel / | $c: Kenneth Robbins.
## 595                                                                                                                                                                                                                                                                                                         Wuthering Heights / | $c: Emily Bront ͡; lithographs by Charles Keeping.
## 596                                                                                                                                                                                                                                                                               The distant horizon / | $c: Taha Wadi ; translated by Hala Al-Borollosy ; edited by Hilary Press.
## 597                                                                                                                                                                                                                                                                             The river : | a tetralogy : part one / | $c: Abdallah Al Tokhy ; translated by Yussreya Abou Hadid.
## 598                                                                                                                                                                                                                 The lion and the throne / | $c: prose rendition by Ehsan Yarshater ; translated from the Persian by Dick Davis ; illustrating a Shahnameh by Stuart Cary Welch.
## 599                                                                                                                                                                                                         Notes from underground / | $c: Fyodor Dostoevsky ; translated from the Russian by Richard Pevear and Larissa Volkhonsky [sic] ; with an introduction by Richard Pevear.
## 600                                                                                                                                                                                                                                                                                                                                                God's work / | $c: William Orem.
## 601                                                                                                                                                                                                                                                                                                                                  Descent : | short stories / | $c: Danit Brown.
## 602                                                                                                                                                                                                                                                                             The astonished man : | a novel / | $c: Blaise Cendrars ; translated from the French by Nina Rootes.
## 603                                                                                                                                                                                                                                                                                                                 Meritocracy : | a love story, a novel / | $c: by Jeffrey Lewis.
## 604                                                                                                                                                                                                                                                                                                                                                 Japantown / | $c: Roberta Kwok.
## 605                                                                                                                                                                                                                                                                                                                                           Unbroken, | the story of a submarine.
## 606                                                                                                                                                                                                                                                                                                                                           Out of the blue / | $c: Daniel Peltz.
## 607                                                                                                                                                                                                                                                                                                             Thistle soup : | a ladleful of Scottish life / | $c: by Peter Kerr.
## 608                                                                                                                                                                                                                                        Without pain, or, the search for the gene culprits / | $c: R&#xfc;diger Opelt ; translated and with an afterword by Lowell A. Bangerter.
## 609                                                                                                                                                                                                                                                                                                                                       The turquoise ring / | $c: Grace Tiffany.
## 610                                                                                                                                                                                                                                                                                                                                 The boys in the brownstone / | $c: Kevin Scott.
## 611                                                                                                                                                                                                                                                                                                                     The complete Aubrey/Maturin novels / | $c: Patrick O'Brian.
## 612                                                                                                                                                                                                                                                                                                                                Mary, after all : | a novel / | $c: Bill Gordon.
## 613                                                                                                                                                                                       Wonder tales : | [six french stories of enchantment] / | $c: edited and introduced by Marina Warner ; with illustrations by Sophie Herxheimer ; [translated by Gilbert Adair ... et al.].
## 614                                                                                                                                                                                                                                                                                                                                    The same sweet girls / | $c: Cassandra King.
## 615                                                                                                                                                                                                                                                                                                                                           Brother Fish / | $c: Bryce Courtenay.
## 616                                                                                                                                                                                                                                                                                                                                   The vendor of sweets, | $c: by R. K. Narayan.
## 617                                                                                                                                                                                                                                                                                                                          Ruahine : | mythic women / | $c: Ngahuia Te Awekotuku.
## 618                                                                                                                                                                                                                                                                                                                                          Township tales / | $c: Anita Marshall.
## 619                                                                                                                                                                                                                                                                                                                 Lovers' knots : | a hundred-year novel / | $c: Marion Halligan.
## 620                                                                                                                                                                                                                                                                                                                                                       Paint / | $c: John Honey.
## 621                                                                                                                                                                                                                                                                                                                                         Guru cigarettes / | $c: Patricia Geary.
## 622                                                                                                                                                                                                                                                                                                                                            Pink Palace / | $c: by Rachel Sheer.
## 623                                                                                                                                                                                                            Maria Chapdelaine : | a tale of French Canada / | $c: Louis Hémon ; originally translated by W.H. Blake ; introduction, bibliography and notes by Michael Gnarowski.
## 624                                                                                                                                                                                                                                                            Lithuanian mythological tales / | $c: [compiled by Norbertas Vėlius] ; translated from Lithuanian by Birutė Kiškytė.
## 625                                                                                                                                                                                                                                                           The mandarins / | $c: Simone de Beauvoir ; translated by Leonard M. Friedman ; with an introduction by Doris Lessing.
## 626                                                                                                                                                                                                                                                                                                                                           In Nueva York / | $c: Nicholasa Mohr.
## 627                                                                                                                                                                                                                                                                                                          Murder in memoriam / | $c: Didier Daeninckx ; translated by Liz Heron.
## 628                                                                                                                                                                                                                                                                                                 Berlin | $c: [by] Theodor Plievier; [translated from the German by Louis Hagen]
## 629                                                                                                                                                                                                                                                             Short stories / | $c: Mona Ragab ; translated from Arabic by M. Enani & A. Gafari ; with a preface by Samir Sarhan.
## 630                                                                                                                                                                                                                                                                                                                                         A touch of the sun / | $c: David Evans.
## 631                                                                                                                                                                                                                                                                                                                                     The reluctant Tuscan / | $c: by Phil Doran.
## 632                                                                                                                                                                                                                                                                                                                                                  The club / | $c: Richard Eyre.
## 633                                                                                                                                                                                                                                                                                                                                           Homesick creek / | $c: Diane Hammond.
## 634                                                                                                                                                                                                                                                                                                The sundial / | $c: Maarten 't Hart ; translated from the Dutch by Michiel Horn.
## 635                                                                                                                                                                                                                                                                                                In Lucia's eyes / | $c: Arthur Japin, translated from the Dutch by David Colmer.
## 636                                                                                                                                                                                                                                                                       Engineer Garin and his death ray / | $c:  Alexei Tolstoy ; [translated from the Russian by George Hanna].
## 637                                                                                                                                                                                                                                                                            Tales of protection / | $c: Erik Fosnes Hansen ; translated from the Norwegian by Nadia Christensen.
## 638                                                                                                                                                                                                                                                                 The resthouse / | $c: Ahmad Nadeem Qasimi stories ; translated by Faruq Hassan ; edited by Muhammad Umar Memon.
## 639                                                                                                                                                                                                                                                                                                                               Bridge of the Separator / | $c: Harry Turtledove.
## 640                                                                                                                                                                                                                                                                                                                                                Nappy rash / | $c: Mark Kotting.
## 641                                                                                                                                                                                                                                                                        The other side of the mountain / | $c: Erendiz Atasü ; translated by Erendiz Atasü and Elizabeth Maslen.
## 642                                                                                                                                                                                                                                                                                                                                                           Bulfinch's mythology.
## 643                                                                                                                                             More stories from the Arabian nights / | $c: as translated from the Arabic by Sir Richard Burton ; edited and arranged with an introduction by Julian Franklyn and a glossary by Eric Partridge ; illustrated by McDonald Sinclair.
## 644                                                                                                                                                                                                                                                                    The lost first edition of Upton Sinclair's the Jungle / | $c: edited with an introduction by Gene De Gruson.
## 645                                                                                                                                                                                                                                                                                                    Fiasco / | $c: Stanislaw Lem ; translated from the Polish by Michael Kandel.
## 646                                                                                                                                                                                                                                                                                          Bawdy tales of the Middle Ages; | $c: translated from the French by Robert Eglesfield.
## 647                                                                                                                                                                                                                                                                                                                     Great suspense stories. | $c: Illustrated by Raymond Burns.
## 648                                                                                                                                                                                                                                                                   Chinese wit & humor / | $c: edited by George Kao ; introd. by Lin Yutang ; incl. a translation by Pearl Buck.
## 649                                                                                                                                                                                                                                                                                                        Mark Brown's wife : | a tale of the gold-fields / | $c: Charles De Boos.
## 650                                                                                                                                                                                                                                                                                                                                             Cry to heaven / | $c: by Anne Rice.
## 651                                                                                                                                                                                                                                                                                                                                        Border country / | $c: Raymond Williams.
## 652                                                                                                                                                                                                                                                                                       My father's notebook / | $c: Kader Adbolah ; translated from the Dutch by Susan Massotty.
## 653                                                                                                                                                                                                                                                                                                                                  I am not Jackson Pollock / | $c: John Haskell.
## 654                                                                                                                                                                                                                                                                                                                          Afternoon sun, | $c: translated by Sir Wyndham Deedes.
## 655                                                                                                                                                                                                                                                 Dog tails : | and other stories / | $c: by Aziz Nesin ; translator and publisher Joseph S. Jacobson ; Viola N. Jacobson editor.
## 656                                                                                                                                                                                                                                                                                                 The messenger boy murders / | $c: Perihan Mağden ; translated by Richard Hamer.
## 657                                                                                                                                                                                                                                                    Hayri the barber : | Surnâmé / | $c: by Aziz Nesin ; translator and publisher Joseph S. Jacobson ; editor Viola N. Jacobson.
## 658                                                                                                                                                                                                                                                 Socialism is coming, stand aside / | $c: Aziz Nesin ; translator and publisher, Joseph S. Jacobson ; editor, Viola N. Jacobson.
## 659                                                                                                                                                                                                                                                                              Fifty years ago : | an Australian tale / | $c: by Charles de Boos ; introduction by Laurie Clancy.
## 660                                                                                                                                                                                                                                                                                                                                        A perfect match / | $c: Sinéad Moriarty.
## 661                                                                                                                                                                                                                                                                                                                                                               Arctic submarine.
## 662                                                                                                                                                                                                                                                                                                                         The stars of Axuncanny : | a novel / | $c: David Simms.
## 663                                                                                                                                                                                                                                                                                                                                          Stars are stars / | $c: Kevin Sampson.
## 664                                                                                                                                                                                                                                                                                             A late divorce / | $c: A.B. Yehoshua ; translated from the Hebrew by Hillel Halkin.
## 665                                                                                                                                                                                                                                                                                            The garlic ballads / | $c: Mo Yan ; translated from the Chinese by Howard Goldblatt.
## 666                                                                                                                                                                                                                                                                                               Lao folktales / | $c: Steven Jay Epstein ; [illustrated by Anoulom Souvandouane].
## 667                                                                                                                                                                                                                                                                                                                                   Viking myths & legends / | $c: K.E. Sullivan.
## 668                                                                                                                                                                                                                                                                                       Tarantula / | $c: Thierry Jonquet ; translated from the French by Donald Nicholson-Smith.
## 669                                                                                                                                                                                                                                                                                                                                       Hollywood nocturnes / | $c: James Ellroy.
## 670                                                                                                                                                                                                                                                                      The Dedalus book of Finnish fantasy / | $c: edited by Johanna Sinisalo ; and translated by David Hackston.
## 671                                                                                                                                                                                                                                                                                                                                                Levin's god / | $c: Roger Wells.
## 672                                                                                                                                                                                                                                                                                Romance of the desert / | $c: Silvana Pimentel Batista ; [editor and translator: Manuel Araújo].
## 673                                                                                                                                                                                                                                                                                                                            Lost in the garden : | a novel / | $c: Philip Beard.
## 674                                                                                                                                                                                                                                                                                                                                               Monkey man / | $c: Stephen Price.
## 675                                                                                                                                                                                                                                                                    Folktales of Iraq / | $c: edited and translated by E.S. Stevens ; with an introduction by Sir Arnold Wilson.
## 676                                                                                                                                                                                                      Red star under the Baltic : | a Soviet submariner's personal account 1941-1945 / | $c: Victor Yemelianovich Korzh ; translated by Clare Burstall and Vladimir Kisselnikov.
## 677                                                                                                                                                                                                                                                                                                            Gemilé : | a novel / | $c: Orhan Kemal ; translated by Cengiz Lugal.
## 678                                                                                                                                                                                                                                                                                                    The idle years : | a novel / | $c: Orhan Kemal ; tranlsated by Cengiz Lugal.
## 679                                                                                                                                                                                                                                                                                                                                         This man and me / | $c: Alison Jameson.
## 680                                                                                                                                                                                                                                                                                                                                Instant love : | fiction / | $c: Jami Attenberg.
## 681                                                                                                                                                                                                                                                                        The confessions of Arsène Lupin / | $c: by Maurice Leblanc ; translated by Alexander Teixeira de Mattos.
## 682                                                                                                                                                                                                                                                                                                                                      Love comes tumbling / | $c: Denise Deegan.
## 683                                                                                                                                                                                                                                                                                                  Lilah : | a forbidden love, a people's destiny : a novel / | $c: Marek Halter.
## 684                                                                                                                                                                                                                                                                                                                                           Resurrection / | $c: Tucker Malarkey.
## 685                                                                                                                                                                                                                                                                    Elite squad / | $c: Luiz Eduardo Soares, Andr ̌Batista, Rodrigo Pimentel ; translated by Clifford E. Landers.
## 686                                                                                                                                                                                                                                                                                                                       Shakespeare's sonnets : | a novel / | $c: by Samuel Park.
## 687                                                                                                                                                                                                                                                                                Fatso / | $c: Lars Ramslie ; translated from the Norwegian by Deborah Dawkin and Erik Skuggevik.
## 688                                                                                                                                                                                                                                                                                                                                                 Locked in / | $c: Peter Conway.
## 689                                                                                                                                                                                                                                                                                                              Blood and circumstance : | a novel / | $c: by Frank Turner Hollon.
## 690                                                                                                                                                                                                                                                                        Folktales from Iraq / | $c: edited and translated by C.G. Campbell, illustrated by John Buckland Wright.
## 691                                                                                                                                                                                                                                                                                               The ripening seed / | $c: Colette ; translated from the French by Roger Senhouse.
## 692                                                                                                                                                                                                                                                                                         Redeeming love : | a novel / | $c: Francine Rivers ; [study guide written by P. Lynch].
## 693                                                                                                                                                                                                                                                                                                                                                               Anybody's spring.
## 694                                                                                                                                                                                                                                                          The works of Elizabeth Gaskell / | $c: general editor: Joanne Shattock ; volume editors: Linda K. Hughes ... [et al.].
## 695                                                                                                                                                                                                                                             Alberta and freedom / | $c: Cora Sandel ; translated from the Norwegian by Elizabeth Rokkan and with a foreword by Tracy Chevalier.
## 696                                                                                                                                                                                                                                                                                                                                         A mile of river / | $c: Judith Allnatt.
## 697                                                                                                                                                                                                                                                                                       Madwoman on the bridge / | $c: by Su Tong ; translated from the Chinese by Josh Stenberg.
## 698                                                                                                                                                                                                                                                                                     What we are made of / | $c: Thomas Hettche ; translated from the German by Shaun Whiteside.
## 699                                                                                                                                                                                                                                                                                                           The scarlet plague / | $c: Jack London ; [foreword by Tony Robinson].
## 700                                                                                                                                                                                                                                                                              The dear green place ; | & Fur Sadie / | $c: Archie Hind ; edited and introduced by Alasdair Gray.
## 701                                                                                                                                                                                                                                                                                            Where three roads meet : | the myth of Oedipus / | $c: Sally [i.e., Salley] Vickers.
## 702                                                                                                                                                                                                                                                                                              Emma's luck / | $c: Claudia Schreiber ; translated from the German by Anthea Bell.
## 703                                                                                                                                                                                                                                                                                  The free negress Elisabeth / | $c: Cynthia Mc Leod ; translated from the Dutch by Brian Doyle.
## 704                                                                                                                                                                                                                                                                                            Gentlemen : | a novel / | $c: by Klas &#xd6;stergren ; translated by Tiina Nunnally.
## 705                                                                                                                                                                                                                                                                                                                                           Four stories / | $c: by Alan Bennett.
## 706                                                                                                                                                                                                                                                                                      The lost musicians / | $c: William Heinesen ; translated from the Danish by W. Glyn Jones.
## 707                                                                                                                                                                                                                                                                                               Three dreams on Mount Meru / | $c: François Devenne ; translated by Lauren Yoder.
## 708                                                                                                                                                                                                                                                                                Honey tongues : | a novel / | $c: by Helene Uri ; translated from the Norwegian by Kari Dickson.
## 709                                                                                                                                                                                                                                                                                                                           Hector's talent  for miracles / | $c: by Kitty Harri.
## 710                                                                                                                                                                                                                                                                                                                                            The love book / | $c: Catriona Ross.
## 711                                                                                                                                                                                                                                                                                                                               The diaries of Jane Somers / | $c: Doris Lessing.
## 712                                                                                                                                                                                                                                             The girl who made stars and other Bushman stories / | $c: collected by Wilhelm Bleek and Lucy C. Lloyd ; edited by Gregory McNamee.
## 713                                                                                                                                                                                                                                                                                                                                 Daffodils before swallows / | $c: Daniel Peltz.
## 714                                                                                                                                                                                                                                           Wonder-tales of South Asia : | translated from Hindi, Urdu, Nepali and Persian / | $c: [by] Simon Digby ; [edited by Leonard Harrow].
## 715                                                                                                                                                                                                                                                                                                 Umrao Jan Ada / | $c: Mirza Muhammad Hadi Rusva ; translated by David Matthews.
## 716                                                                                                                                                                                                                                                                                                                                                      The lady of the Aroostook.
## 717                                                                                                                                                                                                                                                                                                                                The left hand of God / | $c: William E. Barrett.
## 718                                                                                                                                                                                                                                                                                                                                                               Fire in the wind.
## 719                                                                                                                                                                                                                                                                                                                                   Bennett's welcome / | $c: by Inglis Fletcher.
## 720                                                                                                                                                                                                                                                                        The White Leopard : | a tale of the African bush / | $c: by Inglis Fletcher ; illustrated by Kurt Wiese.
## 721                                                                                                                                                                                                                                                                                Aleck Maury, sportsman : | a novel / | $c: by Caroline Gordon ; with an afterword by the author.
## 722                                                                                                                                                                                                                                                                                                                                                Where am I now - when I need me?
## 723                                                                                                                                                                                                                                                                                                                                             Plain & fancy cats, | a collection.
## 724                                                                                                                                                                                                                                                                                                                              Hello sweet baby / | $c: by Bruce & Carol Britten.
## 725                                                                                                                                                                                                                                                                                                                                                                    Condottiere.
## 726                                                                                                                                                                                                                                                                                                                                                                          UNIAD.
## 727                                                                                                                                                                                                                                                                                                                                 The murderer invisible / | $c: by Philip Wylie.
## 728                                                                                                                                                                                                                                                                                                             Moved by love : | a novel of remembrance / | $c: by William Gellin.
## 729                                                                                                                                                                                                                                                                                                                                              This suitcase is going to explode.
## 730                                                                                                                                                                                                                                                                                           The enemy's country; | a novel of the American Revolution, | $c: by Robert H. Gamble.
## 731                                                                                                                                                                                                                                                                                                                                             Star probe / | $c: by Joseph Green.
## 732                                                                                                                                                                                                                                                                                                                                          Amazing grace / | $c: by Judith Davis.
## 733                                                                                                                                                                                                                                                                                                                      The witch of Watergate: | a novel / | $c: by Warren Adler.
## 734                                                                                                                                                                                                                                                                                                                                    The 13th District; | a story of a candidate.
## 735                                                                                                                                                                                                                                                                                                                         Listen for the whisperer | $c: [by] Phyllis A. Whitney.
## 736                                                                                                                                                                                                                                                                                                                                    Further adventures / | $c: Jon Stephen Fink.
## 737                                                                                                                                                                                                                                                           In answer to the play, For colored girls-- : | virtue of the black female sex / | $c: written by James A. Fisher, Jr.
## 738                                                                                                                                                                                                                                                                                                                                         Sins of omission / | $c: Candace Flynt.
## 739                                                                                                                                                                                                                                                                                                                              Big Ben Hood : | a novel / | $c: by Emanuel Fried.
## 740                                                                                                                                                                                                                                                                                                                                       Tanaquil; | or, The hardest thing of all.
## 741                                                                                                                                                                                                                                                                                                                                         The shootist / | $c: Glendon Swarthout.
## 742                                                                                                                                                                                                                                                                                                                                                               Image of a lover.
## 743                                                                                                                                                                                                                                                                                                                                                                 Fool, be still.
## 744                                                                                                                                                                                                                                                                                                       Lummox / | $c: by Fannie Hurst ; with an introduction by Alice Childress.
## 745                                                                                                                                                                                                                                                                                                                                    Walk-in / | $c: Virgil Scott, Dominic Koski.
## 746                                                                                                                                                                                                                                                                                                      A yellow Napoleon; | a romance of West Africa, | $c: by Arthur E. Southon.
## 747                                                                                                                                                                                                                                                                                                                           The story of a whim / | $c: by Grace Livingston Hill.
## 748                                                                                                                                                                                                                                                                                                                                                                A place to meet.
## 749                                                                                                                                                                                                                                                                                                                                                    Float / | $c: by David Eyre.
## 750                                                                                                                                                                                                                                                                                                                        Greengroundtown : | stories / | $c: by Christopher Fahy.
## 751                                                                                                                                                                                                                                                                                                                               Through glass : | a novel / | $c: by Henry Allen.
## 752                                                                                                                                                                                                                                                                                                                                                       Morning red; | a romance.
## 753                                                                                                                                                                                                                                                                                                       Through one administration. | $c: With a new introd. by Robert Lee White.
## 754                                                                                                                                                                                                                                                                                                                                    Bylow Hill. | $c: With illus. by F. C. Yohn.
## 755                                                                                                                                                                                                                                                                                                                              Paper moon : | a novel / | $c: by Joe David Brown.
## 756                                                                                                                                                                                                                                                                                                                                           The garden book / | $c: Brian Castro.
## 757                                                                                                                                                                                                                                                                                                                                              Grand opening / | $c: Jon Hassler.
## 758                                                                                                                                                                                                                                                                                     Hunting and gathering / | $c: Anna Gavalda ; translated from the French by Alison Anderson.
## 759                                                                                                                                                                                                                                                                                                    The calligraphers' night / | $c: Yasmine Ghata ; translated by Andrew Brown.
## 760                                                                                                                                                                                                                                                                                                                                          Safety / | $c: Tegan Bennett Daylight.
## 761                                                                                                                                                                                                                                                                                I, city / | $c: Pavel Brycz ; translated from the Czech by Joshua Cohen & Markéta Hofmeisterová.
## 762                                                                                                                                                                                                                                                                                      The model / | $c: Lars Saabye Christensen ; translated from the Norwegian by Don Bartlett.
## 763                                                                                                                                                                                                                                                                                                                     A push and a shove : | [a novel] / | $c: Christopher Kelly.
## 764                                                                                                                                                                                                                                                                                                                          The fire-raisers : | a novel / | $c: by Marris Murray.
## 765                                                                                                                                                                                                                                                                                         Lies : | a novel / | $c: Enrique de Hériz ; translated from the Spanish by John Cullen.
## 766                                                                                                                                                                                                                                                                                                                       Bunty / | $c: Mannu Bhandari ; [translated by Jai Ratan].
## 767                                                                                                                                                                                                                                                                 Nothing to do, nowhere to go : | waking up to who you are / | $c: Thich Nhat Hanh ; [edited by Rachel Neumann].
## 768                                                                                                                                                                                                                                                                                              The unforeseen : | a novel / | $c: Christian Oster ; translated by Adriana Hunter.
## 769                                                                                                                                                                                                                                                                                                   The 42nd parallel / | $c: by John Dos Passos ; illustrated by Reginald Marsh.
## 770                                                                                                                                                                                                           The House of the dead / | $c: Fyodor Dostoevsky ; translated from the Russian by Constance Garnett ; forewrod by Boris Shragin ; wood engravings by Fritz Eichenberg.
## 771                                                                                                                                                                                                                                                                                                             Who stole the funny? : | a novel of Hollywood / | $c: Robby Benson.
## 772                                                                                                                                                                                                                                                                                                             The works of Charlotte Smith / | $c: general editor, Stuart Curran.
## 773                                                                                                                                                                                                                                                                                                             The works of Charlotte Smith / | $c: general editor, Stuart Curran.
## 774                                                                                                                                                                                                                                                                                  Bruin sings the blues / | $c: Dušan Kovačević ; translated from the Serbian by Timothy Byford.
## 775                                                                                                                                                                                                                                                                                                                                              The shoe queen / | $c: Anna Davis.
## 776                                                                                                                                                                                                                                                 The fortunes and misfortunes of the famous Moll Flanders / | $c: by Daniel Defoe ; illustrated with drawings by Reginald Marsh.
## 777                                                                                                                                                                                                                                                                                             The scarlet letter / | $c: by Nathaniel Hawthorne ; [illustrated by W.A. Dwiggins].
## 778                                                                                                                                                                                                                                        The master of Ballantrae / | $c: by Robert Louis Stevenson ; with an introduction by G.B. Stern and with color lithographs by Lynd Ward.
## 779                                                                                                                                                                                                                                                Quo vadis? / | $c: translated from the Polish by Jeremiah Curtin ; with an introd. by Harold Lamb and illus. by Salvatore Fiume.
## 780                                                                                                                                                                                                                                                                  Barchester towers / | $c: Anthony Trollope ; an introduction by Angela Thirkell ; illustrated by Fritz Kredel.
## 781                                                                                                                                        The possessed. | $c: Translated from the Russian by Constance Garnett, with an introd. by Marc Slonim and including the suppressed chapter, "Stavrogin's confession," translated by Avrahm Yarmolinsky. Illustrated by Fritz Eichenberg.
## 782                                                                                                                                                                                                                      The prisoner of Zenda / | $c: Anthony Hope ; with an introd. by S.C. Roberts ; illustrated by Donald Spencer for the members of the Limited Editions Club.
## 783                                                                                                                                                                                                          Fathers and sons; | $c: translated from the Russian by Constance Garnett, with a pref. by John T. Winterich, and illustrated with wood engravings by Fritz Eichenberg.
## 784                                                                                                                                                                                                               Doctor Zhivago / | $c: Boris Pasternak ; [translated from the Russian by Max Hayward and Manya Harari. "The poems of Yurii Zhivago" by Bernard Guilbert Guerney].
## 785                                                                                                                                                                                                                                                                           Aesop's Fables : | a new version / | $c: written by Munro Leaf ; with illustrations by Robert Lawson.
## 786                                                                                                                                                                                                                                                                                                                                            East of Eden / | $c: John Steinbeck.
## 787                                                                                                                                                                                                                                                                                                           Andersonville / | $c: MacKinlay Kantor ; illustrated by Joseph Smith.
## 788                                                                                                                                                                                                                                                                                                      A death in the family / | $c: James Agee ; illustrated by Ben F. Wohlberg.
## 789                                                                                                                                            The Brothers Karamazov : | a novel in four parts & epilog / | $c: by Fyodor Dostoevsky ; the translation by Constance Garnett revised, with an introduction by Avrahm Yarmolinsky, illustrated with lithographs by Fritz Eichenberg.
## 790                                                                                                                                                               Anna Karenina / | $c: by Leo Tolstoy ; translated by Constance Garnett ; the text edited and revised by Gustavus Spett ; and the translation revised by Bernard Guilbert Guerney ; introduced by Lionel Trilling.
## 791                                                                                                                                                                                                                                                             The Alhambra / | $c: Washington Irving ; with an introduction by Angel Flores ; and illustrated by Lima de Freitas.
## 792                                                                                                                                                                                                                                            The Short stories of Oscar Wilde / | $c: with an introduction by Robert Gorham Davis and illustrations from paintings by James Hill.
## 793                                                                                                                                                                     Vanity fair : | a novel without a hero / | $c: by William Makepeace Thackeray ; illustrated with two hundred drawings made by the author for the first edition ; with an introduction by John T. Winterich.
## 794                                                                                                                                                                                                                                                                           Tales of mystery & imagination / | $c: by Edgar Allan Poe ; with an introduction by Vincent Starrett.
## 795                                                                                                                                                                                                    Uncle Tom's cabin ; or, Life among the lowly / | $c: by Harriet Beecher Stowe ; with an introduction by Raymond Weaver ; illustrated with lithographs by Miguel Covarrubias.
## 796                                                                                                                                                                                                                                                                                                          On the marble cliffs; | $c: translated from the German by Stuart Hood.
## 797                                                                                                                                                                                                                                       On the high uplands : | sagas, songs, tales and legends of the Carpathians / | $f: translated by H.C. Stevens; illus. by Z. Czermanski. -
## 798                                                                                                                                                                                                                                                                                                       Folk tales of Nepal : | First series / | $c: Edited by Karuna Kar Vaidya.
## 799                                                                                                                                                                                                                                                                                                                         Folktales of Hungary. | $c: Translated by Judit Halász.
## 800                                                                                                                                                                                                                                                                           The children of the wind. | $c: Selected and translated by Gwen Marsh.  Illustrated by William Papas.
## 801                                                                                                                                                                                                                                                                                                                                                            No crown of laurels.
## 802                                                                                                                                                                                                                                                                                    The small town in American literature, | $c: edited by David M. Cook [and] Craig G. Swauger.
## 803                                                                                                                                                                                                                                                                                                                                           A green flash / | $c: Winston Graham.
## 804                                                                                                                                                                                                                                                                                                                            Injury time : | a novel / | $c: by Beryl Bainbridge.
## 805                                                                                                                                                                                                                                                                                                                                                    Oh Lily / | $c: Mary Hobson.
## 806                                                                                                                                                                                                                                                                Heloise : | a story of love, sex, and metaphysics in with wild and marvelous sixties / | $c: William R. Neblett.
## 807                                                                                                                                                                                                                                                                                                                                         The Sligo Piper / | $c: Michael Bowery.
## 808                                                                                                                                                                                                                                                                                                 The Succubus / | $c: Vlado Žabot ; translated by Rawley Grau and Nikolai Jeffs.
## 809                                                                                                                                                                                                                                                              Memorandum : | a story with paintings / | $c: Marlene van Niekerk & Adriaan van Zyl ; translated by Michiel Heyns.
## 810                                                                                                                                                                                                                                                                          Scarred hearts / | $c: Max Blecher ; translated by Henry Howard ; with an introduction by Paul Bailey.
## 811                                                                                                                                                                                                                                                                 Gazelle tracks : | a modern Arabic novel from Egypt / | $c: Miral al-Tahawy ; translated by Anthony Calderbank.
## 812                                                                                                                                                                                                                                                                                                          The long knives are crying : | a novel / | $c: Joseph M. Marshall III.
## 813                                                                                                                                                                                                                                                                 Breaking Knees : | modern Arabic short stories from Syria / | $c: Zakaria Tamer ; translated by Ibrahim Muhawi.
## 814                                                                                                                                                                                                                                        Folktales from the Japanese countryside / | $c: as told by Hiroko Fujita ; edited by Fran Stallings with Harold Wright and Miki Sakurai.
## 815                                                                                                                                                                                                                                                                                                  Guard of honor / | $c: James Gould Cozzens ; illustrated by Charles McVickers.
## 816                                                                                                                                                                                                                                                                                                              Arrowsmith / | $c: by Sinclair Lewis; illustrated by Ben F. Stahl.
## 817                                                                                                                                                                                                                                                                                                       Advise and consent / | $c: Allen Drury ; illustrated by Franz Altschuler.
## 818                                                                                                                                                                                                                                                  The age of innocence / | $c: Edith Wharton ; with an introduction by R.W.B. Lewis ; and illustrations by Lawrence Beall Smith.
## 819                                                                                                                                                                                                                                                       Andersen's Fairy tales and stories / | $c: translated from the Danish by Jean Hersholt ; and illustrated by Fritz Kredel.
## 820                                                                                                                         Resurrection : | a novel in three parts / | $c: by Leo Tolstoy ; the translation by Leo Wiener, revised and edited for this edition by F.D. Reeve ; with an introduction by Ernest J. Simmons and illustrated with wood engravings by Fritz Eichenberg.
## 821                                                                                                                                                                                                                                                               The Tales of Hoffmann : | stories / | $c: by E.T.A. Hoffmann ; illustrated with lithographs by Hugo Steiner-Prag.
## 822                                                                                                                                                                                                                                                                                                    Lincoln : | a novel / | $c: Gore Vidal ; special introduction by Gore Vidal.
## 823                                                                                                                      The seven voyages of Sindbad the sailor / | $c: literally rendered from the Arabic into French by J.C. Mardrus, and then translated into modern English by E. Powys Mathers ; with an introduction by C.S. Forester and illustrations by Edward A. Wilson.
## 824                                                                                                                                                                                                          The torrents of spring / | $c: by Ivan Turgenev ; translated from the Russian by Constance Garnett ; with an introduction by Alec Waugh ; illustrated by Lajos Szalay.
## 825                                                                                                                                                                                                                                                                                                     Journey in the dark / | $c: Martin Flavin ; illustrated by Charles Hamrick.
## 826                                                                                                                                                                                                                                                                                    The confessions of Nat Turner / | $c: William Styron ; illustrated by Kenneth Francis Dewey.
## 827                                                                                                                                                                                                                                                                                                   Years of grace / | $c: Margaret Ayer Barnes ; illustrated by Ben S. Wohlberg.
## 828                                                                                                                                                                                                                                                       Andersen's Fairy tales and stories / | $c: translated from the Danish by Jean Hersholt ; and illustrated by Fritz Kredel.
## 829                                                                                                                                                                                                                                                                                                                                     Feathers like leather / | $c: by Chris Leo.
## 830                                                                                                                                                                                                                                                                                                                 Grace, Tamar & Laszlo the beautiful / | $c: Deborah Kay Davies.
## 831                                                                                                                                                                                                                                                  The magic goblet : | a Swedish tale / | $c: by Emilie Flygare-Carlň ; edited with an introduction and notes by Amy H. Sturgis.
## 832                                                                                                                                                                                                                                                                                                                                        Murder at midnight / | $c: by John Ukah.
## 833                                                                                                                                                                                                               Doctor Zhivago / | $c: Boris Pasternak ; [translated from the Russian by Max Hayward and Manya Harari. "The poems of Yurii Zhivago" by Bernard Guilbert Guerney].
## 834                                                                                                                                                                                                                                                                                                 The way of the women / | $c: Marlene van Niekerk ; translated by Michiel Heyns.
## 835                                                                                                                                                                                                                                                                                                                                               The big one / | $c: Stuart Slade.
## 836                                                                                                                                                                                                                                                                                                                                                    Showdown / | $c: Ted Dekker.
## 837                                                                                                                                                                                                                                                                                           Pieternella, daughter of Eva / | $c: Dalene Matthee ; translated by Malcolm Hacksley.
## 838                                                                                                                                                                                                                                                                                                                                     Hypatia; | $c: introduction by Ernest Rhys.
## 839                                                                                                                                                                                                              Folk tales from a Persian tribe : | forty-five tales from Sisakht in Luri and English / | $c: collected, transcribed, translated and commented on by Erika Friedl.
## 840                                                                                                                                                                                                                                                                                             The angel maker / | $c: Stefan Brijs ; translated from the Dutch by Hester Velmans.
## 841                                                                                                                                                                                                                                                                                                                                                                    Retribution.
## 842                                                                                                                                                                                                                                                                                                                             The burning bush. | $c: Translated by David Hohnen.
## 843                                                                                                                                                                                                                 Norway's best stories; | an introduction to modern Norwegian fiction. | $c: Translations by Anders Orbeck. A selection of short stories by Bjr̲nson [and others]
## 844                                                                                                                                                                                                               Farmor's house : | a portrait of an epoch / | $c: by Soya ; translated by Agnes Camilla Hansen ; [English translation revised and edited by Alan Moray Williams].
## 845                                                                                                                                                                                                                                                                                                            Rachel Jackson, Tennessee girl. | $c: Illustrated by Robert Doremus.
## 846                                                                                                                                                                                                                                                                                                                              Hester and gnomes. | $c: Pictures by Jean Charlot.
## 847                                                                                                                                                                                                             Zane Grey: outdoorsman; | Zane Grey's best hunting and fishing tales published in commemoration of his centennial year. | $c: Selected and edited by George Reiger.
## 848                                                                                                                                                                                                                                                                                             Debauched Hospodar, | and Memoirs of a young rakehell.  Translated from the French.
## 849                                                                                                                                                                                                                                                                                                                                                               Tales and novels.
## 850                                                                                                                                                                                                                                                                                   The novels:  Love's cross-currents. | Lesbia Brandon. | $c: With an introd. by Edmund Wilson.
## 851                                                                                                                                                                                                                                                                                                                                          Shadow of wealth / | $c: Asare Konadu.
## 852                                                                                                                                                                                                                                                                                           The Bodley Head Jack London. / | $c: Edited and introduced by Arthur Calder-Marshall.
## 853                                                                                                                                                                                                                                                                                                                                     Framley parsonage / | $c: Anthony Trollope.
## 854                                                                                                                                                                                                                                                                                                                                      Doctor Thorne / | $c: by Anthony Trollope.
## 855                                                                                                                                                                                                                                                                      The beach of Falesá  / | $c:  Robert Louis Stevenson ; introd. by H. E. Bates ; drawings by Clarke Hutton.
## 856                                                                                                                                                                                                                                                                                                                     The master of Ballantrae / | $c: by Robert Louis Stevenson.
## 857                                                                                                                                                                                                                            Kidnapped, being the memoirs of the adventures of David Balfour in the year MDCCLI / | $c: Robert Louis Stevenson ; illustrated by Victor G. Ambrus.
## 858                                                                                                                                                                                                                                                                                                              The turn of the screw; | The Aspern papers | $c: [by] Henry James.
## 859                                                                                                                                                                                                                                                                                                             Quo vadis? / | $c: Henryk Sienkiewicz ; translated by C.J. Hogarth.
## 860                                                                                                                                                                                                                                                                                                             One hundred favorite folktales. | $c: Drawings by Franz Altschuler.
## 861                                                                                                                                                                                                                                                                                                                                                                       Orchards.
## 862                                                                                                                                                                                                                                                             Threepenny novel. | $c: Translated from the German by Desmond I. Vesey; verses translated by Christopher Isherwood.
## 863                                                                                                                                                                                                                                                                                                       Doctor Thorne | $c: [by] Anthony Trollope; introd. by Kathleen Tillotson.
## 864                                                                                                                                                                                                                                                                                                         Michael Kohlhaas; and the Marquise of O -- / | $c: Heinrich von Kleist.
## 865                                                                                                                                                                                                                                                                                          The day's work / | $c: Rudyard Kipling ; edited with an introduction by Thomas Pinney.
## 866                                                                                                                                                                                                                                                       Sir Gawain and the Green Knight. | $c: Translated into modern English by M. R. Ridley. Illustrated by John G. Galsworthy.
## 867                                                                                                                                                                                                                                                                                               Mozart's journey to Prague. | $c: Translated by Leopold von Loewenstein-Wertheim.
## 868                                                                                                                                                                                                                                                                                     The magic mountain. | Der Zauberberg. | $c: Translated from the German by H.T. Lowe-Porter.
## 869                                                                                                                                                                                                                                                                                                                                                               My cousin Rachel.
## 870                                                                                                                                                                                                                                                                       Fro and other stories / | $c: Andrei Platonov ; [translated from the Russian ; designed by B. Markevich].
## 871                                                                                                                                                                                                                                                                                                                                   The sibyl. | $c: Translated by Naomi Walford.
## 872                                                                                                                                                                                                                                                                                      Mastro Don Gesualdo / | $c: Giovanni Verga ; translated from the Italian by D.H. Lawrence.
## 873                                                                                                                                                                                                                                                                                   The notebooks of Malte Laurids Brigge / | $c: Rainer Maria Rilke ; translated by John Linton.
## 874                                                                                                                                                                                                                                                    The nun / | $c: [by] Denis Diderot ; translated and with an introduction by Leonard Tancock ; lithographs by Charles Mozley.
## 875                                                                                                                                                                                                                                                                                               The forsaken army; | a novel. | $c: Translated from the German by Richard Graves.
## 876                                                                                                                                                                                                                                                                                                                  Conjugal love / | $c: Alberto Moravia ; tr. by Angus Davidson.
## 877                                                                                                                                                                                                                                                                                                                                         My enemy's enemy / | $c: Kingsley Amis.
## 878                                                                                                                                                                                                                                                                    Nightmares of an ether-drinker / | $c: Jean Lorrain ; [translation, notes and introduction Brian Stableford]
## 879                                                                                                                                                                                                                                                                                          Selected shorter writings of Mark Twain. | $c: Edited with an introd. by Walter Blair.
## 880                                                                                                                                                                                                                                                                                             The tin drum / | $c: by Günter Grass ; translated from the German by Ralph Manheim.
## 881                                                                                                                                                                                                                                                                                                                                                             This sporting life.
## 882                                                                                                                                                                                                                                                                                                                                 Mark Lambert's supper, | $c: by J.I.M. Stewart.
## 883                                                                                                                                                                                                                                                                                                                                        The foxglove saga / | $c: Auberon Waugh.
## 884                                                                                                                                                                                                                                                                                                                                        Path of dalliance / | $c: Auberon Waugh.
## 885                                                                                                                                                                                                                                                                                                                                     Helena : | a novel / | $c: by Evelyn Waugh.
## 886                                                                                                                                                                                                                                                                                                   The bender; | pictures from an exhibition of middle class portraits, a novel.
## 887                                                                                                                                                                                                                                                                                                                                       The birds of paradise / | $c: Paul Scott.
## 888                                                                                                                                                                                                                                                                                          The cocotte (Boule de suif) and three other stories; | $c: illustrated by Howard Baer.
## 889                                                                                                                                                                                                                                                                                                                                                                    Jungle Green
## 890                                                                                                                                                                                                                                                                                                Georgian folk tales. | $c: Translated by Marjory Wardrop. London, D. Nutt, 1894.
## 891                                                                                                                                                                                                                                                                                                        Passion and pain. | $c: Translated from the German by Eden & Cedar Paul.
## 892                                                                                                                                                                                                                                                          Roberte ce soir and The revocation of the edict of Nantes / | $c: Pierre Klossowski ; translated by Austryn Wainhouse.
## 893                                                                                                                                                                                                                                                            The abyss / | $c: Marguerite Yourcenar ; translated from the French by Grace Frick in collaboration with the author.
## 894                                                                                                                                                                                                                                                                                                       The seven that were hanged : | and other stories / | $c: Leonid Andreyev.
## 895                                                                                                                                                                                                                                                                         Maggie: a girl of the streets; | $c: edited by Herbert Van Thal with an introduction by William Sansom.
## 896                                                                                                                                                                                                                               Les liaisons dangereuses | [Dangerous acquaintances] | $c: Translated with an introd. by Richard Aldington.  Wood-engravings by Raymond Hawthorn.
## 897                                                                                                                                                                                                                                                                                                                                                                        Warlock.
## 898                                                                                                                                                                                                                                                                                                                                                   A passion in Rome; | a novel.
## 899                                                                                                                                                                                                                                                                                                                                                                       The city.
## 900                                                                                                                                                                                                                                                                                              We are God's Utopia / | $c: Stefan P. Andres ; translated by Elita Walker Caspari.
## 901                                                                                                                                                                                                                                                                            And quiet flows the Don / | $c: by Mikhail Sholokhov ; translated from the Russian by Stephen Garry.
## 902                                                                                                                                                                                                                                                                                                                                                                 African genesis
## 903                                                                                                                                                                                                                                       Pierre ; Israel Potter ; The piazza tales ; The confidence-man ; Uncollected prose ; and Billy Budd, sailor / | $c: Herman Meville [sic].
## 904                                                                                                                                                                                                                                                                                                    David Copperfield / | $c: Charles Dickens ; with an introd. by Angus Wilson.
## 905                                                                                                                                                                                                                                                                                                                                                                   Odd girl out.
## 906                                                                                                                                                                                                                                                                                                                                   The sea change / | $c: Elizabeth Jane Howard.
## 907                                                                                                                                                                                                                                                                                                                                                                    Black Midas.
## 908                                                                                                                                                                                                                                                                                                             Yoshe Kalb, | $c: by I.J. Singer. [Intro. by Isaac Bashevis Singer]
## 909                                                                                                                                 Twelve stories / | $c: by Steen Steensen Blicher ; translated from the Danish by Hanna Astrup Larsen, with an introduction by Sigrid Undset.  Princeton : Princeton University Press, for the American-Scandinavian Foundation, New York, 1945.
## 910                                                                                                                                                                                                                                                                                                 My father's house : | a novel / | $c: Orhan Kemal ; tranlsated by Cengiz Lugal.
## 911                                                                                                                                                                                                                                                                                                                             Gabriela : | clove and cinnamon / | $c: Jorge Amado
## 912                                                                                                                                                                                                                                                                              Devil in the flesh / | $c: Raymond Radiguet ; translated, with an introduction, by Robert Baldick.
## 913                                                                                                                                                                                                                                                                                                                                                    The man who started the war.
## 914                                                                                                                                                                                                                                                                                                        War and peace. | $c: Translated and with an introd. by Rosemary Edmonds.
## 915                                                                                                                                                                                                                                                                                                 The history of Tom Jones / | $c: Henry Fielding ; engravings by Derrick Harris.
## 916                                                                                                                                                                                                                                                                      The sentimental education. | $c: Newly translated by Perdita Burlingame. With an afterword by F. W. Dupee.
## 917                                                                                                                                                                                                                                                                                Drunkard; | $c: translated from the French by Arthur Symons; with an introduction by Alec Brown.
## 918                                                                                                                                                                                                                                                                                                                                 The ship. | $c: Translated by Catherine Hutter.
## 919                                                                                                                                                                                                                                                                      Stories and legends / | $c: Stefan Zweig ; translations by Eden and Cedar Paul and Constantine FitzGibbon.
## 920                                                                                                                                                                                                                                                                                               The last of Chéri / | $c: Colette ; translated from the French by Roger Senhouse.
## 921                                                                                                                                                                                                                                                                                                                                                           His Majesty's U-boat.
## 922                                                                                                                                                                                                                                                                                                                The tangled web; | $c: translated from the French by Len Ortzen.
## 923                                                                                                                                                                                                                                                                                                                                     Pamela. | $c: Introd. by M. Kinkead-Weekes.
## 924                                                                                                                                                                                                                                                                                                                                       Path of the storm / | $c: Douglas Reeman.
## 925                                                                                                                                                                                                                  Sweden's best stories; | an introduction to Swedish fiction. | $c: Translation by Charles Wharton Stork. A selection of short stories by Topelius [and others]
## 926                                                                                                                                                                                                                                                                                        Peter Freuchen's Book of the Eskimos / | $c: edited and with a pref. by Dagmar Freuchen.
## 927                                                                                                                                                                                                                                                                                                                        A romance of two worlds. | $c: Introd. by Paul M. Allen.
## 928                                                                                                                                                                                                                                                                                                                   Arab folktales / | $c: translated and edited by Inea Bushnaq.
## 929                                                                                                                                                                                                                                                                                                                                  The path of thunder / | $c: by Peter Abrahams.
## 930                                                                                                                                                                                                                                                                                                                                        Swami and friends, | a novel of Malgudi.
## 931                                                                                                                                                                                                                                                            New Chinese stories; | twelve short stories by contemporary Chinese writers. | $c: Edited & translated by Lucian Wu.
## 932                                                                                                                                                                                                                                                             The explosion; | the uprising behind the Iron Curtain. | $c: Translated by E. B. Ashton. Introd. by Norbert Muhlen.
## 933                                                                                                                                                                                                                                                                                                                       Mrs Betsey; or, Widowed and wed / | $c: Francesca Marton.
## 934                                                                                                                                                                                                                                                                                                    A voyage to Arcturus / | $c: by David Lindsay ; with a note by E. H. Visiak.
## 935                                                                                                                                                                                                                                                                     Auto-da-fé. | $c: Translated from the German under the personal supervision of the author by C.V. Wedgwood.
## 936                                                                                                                                                                                                                                                                                                         The Holy Sinner; | $c: translated from the German by H. T. Lowe-Porter.
## 937                                                                                                                                                                                                                                                                                                                                                                   The Minister.
## 938                                                                                                                                                                                                                                                                                                          The beast in man. | $c: Translated by R.G. Goodyear and P.J.R. Wright.
## 939                                                                                                                                                                                                                                                                                  They fell from God's hand / | $c: [by] Hans Werner Richter ; translated by Geoffrey Sainsbury.
## 940                                                                                                                                                                                                                                                                                                                                          The charioteer. | $c: By Mary Renault.
## 941                                                                                                                                                                                                                                                                                                                                                                      The hotel.
## 942                                                                                                                                                                                                                                                                                                                      Anglo-Saxon attitudes : | a novel / | $c: by Angus Wilson.
## 943                                                                                                                                                                                                                                                                                                              Account unsettled; | $c: translated from the French by Tony White.
## 944                                                                                                                                                                                                                                                                                                                       The adventures of Huckleberry Finn | $c: [by] Mark Twain.
## 945                                                                                                                                                                                                                                                                                                                                         Player piano / | $c: Kurt Vonnegut, Jr.
## 946                                                                                                                                                                                                                                                                                                The other Alexander. | $c: Translated by Willis and Helle Tzalopoulou Barnstone.
## 947                                                                                                                                                                                                                                                                    The torrents of spring / | $c: Ivan Turgenev ; translated by David Magarshack ; illustrated by Faith Jaques.
## 948                                                                                                                                                                                                                                                                                                                  The patient; | $c: translated from the French by Jean Stewart.
## 949                                                                                                                                                                                                                                                                                                           Henry James: | seven stories and studies. | $c: Edward Stone, editor.
## 950                                                                                                                                                                                                                                                                                                       The mission; | or, scenes in Africa; | $c: introduction by Tony Harrison.
## 951                                                                                                                                                                                                                                                                                                                                        One for the road / | $c: by W. J. White.
## 952                                                                                                                                                                                                                                                                                                     Saturday lunch with the Brownings : | stories / | $c: by Penelope Mortimer.
## 953                                                                                                                                                                                                                                                                                                                                                                    The oracles.
## 954                                                                                                                                                                                                                                                                                                                                The Schirmer inheritance / | $c: by Eric Ambler.
## 955                                                                                                                                                                                                                                                                                                         The eyes of Max Carrados / | $c: [by] Ernest Bramah [i.e. E. B. Smith].
## 956                                                                                                                                                                                                                                                                                                                                     Don't point that thing at me; | a thriller.
## 957                                                                                                                                                                                                                                                                                                                    Human voices : | science fiction stories / | $c: James Gunn.
## 958                                                                                                                                                                                                                                                                                                                      The adventures of one Yitzchok | $c: [by] Yitzchok Perlov.
## 959                                                                                                                                                                                                                                                                                                                            The Promised Land : | a novel / | $c: by Grace Ogot.
## 960                                                                                                                                                                                                                                                                                                                                                      The last exile, | a novel.
## 961                                                                                                                                                                                                                                                                                                                                                    Prose works of Henry Lawson.
## 962                                                                                                                                                                                                                                                                                                                                                           The King's grey mare.
## 963                                                                                                                                                                                                                                                                                                                      The woman who got on at Jasper Station, and other stories.
## 964                                                                                                                                                                                                                                                                                                                                  The strike : | a novel / | $c: Yvonne Burgess.
## 965                                                                                                                                                                                                                                                                                                                                                          The world of violence.
## 966                                                                                                                                                                                                                                                                                                                                         Sincerity divorced | $c: [by] E. Hinga.
## 967                                                                                                                                                                                                                                                                               Selected short stories | $c: [by] Ilia Volen. Translated [from the Bulgarian] by Elena Mladenova.
## 968                                                                                                                                                                                                                                                                                                                                Get ready for battle / | $c: R. Prawer Jhabvala.
## 969                                                                                                                                                                                                                                                                                                                                                              Ten thousand eyes.
## 970                                                                                                                                                                                                                                                                                                                                                    Shield and sword | [a novel.
## 971                                                                                                                                                                                                                                                                                                                                                    Shield and sword | [a novel.
## 972                                                                                                                                                                                                                                                                                                Seven great British short novels / | $c: edited, with an introd. by Philip Rahv.
## 973                                                                                                                                                                                                                                                                                           The Bodley Head Jack London. / | $c: Edited and introduced by Arthur Calder-Marshall.
## 974                                                                                                                                                                                                                                                                                                                                         Singing winds; | stories of gipsy life.
## 975                                                                                                                                                                                                                                                                                                              Afghan adventure / | $c: by John Fox, as told to Roland Goodchild.
## 976                                                                                                                                                                                                                                                                                                                       The greatest gamble. | $c: Translated by Maurice Michael.
## 977                                                                                                                                                                                                                                                                                                        Scorched crop : | a novel / | $c: translated from the Czech by E. Osers.
## 978                                                                                                                                                                                                                                                                                    Castle Rackrent ; The absentee / | $c: Maria Edgeworth ; [introduction by Brander Matthews].
## 979                                                                                                                                                                                                                                                                          Two novelettes : | Revolt of the fishermen of Santa Barbara, A price on his head / | $c: Anna Seghers.
## 980                                                                                                                                                                                                                                                                                                     The odds against us / | $c: Hans Werner Richter ; translated by Robert Kee.
## 981                                                                                                                                                                                                                                                                          Beatrice; | a novel. | $c: Translated from the German by Agnes Jacques. [New York] Simon and Schuster.
## 982                                                                                                                                                                                                                                                                                                                             A day no pigs would die / | $c: Robert Newton Peck.
## 983                                                                                                                                                                                                                                                                                                                                                                    Witch world.
## 984                                                                                                                                                                                                                                                                                                        Japanese tales / | $c: selected, edited, and translated by Royall Tyler.
## 985                                                                                                                                                                                                                                                                    The cat walk : | a translation into English of Hermann Sudermann's Der katzensteg / | $c: William Eickhorst.
## 986                                                                                                                                                                                                                                                                                                   War / | $c: Ludwig Renn ; translated from the German by Willa and Edwin Muir.
## 987                                                                                                                                                                                                                                                 The white guard / | $c: Mikhail Bulgakov ; translated from the Russian by Michael Glenny ; with an epilogue by Viktor Nekrasov.
## 988                                                                                                                                                                                                                                                                                                                           The king of the fields / | $c: Isaac Bashevis Singer.
## 989                                                                                                                                                                                                                                                                                                            The lonely sea : | collected short stories / | $c: Alistair MacLean.
## 990                                                                                                                                                                                                                                                                                                      The pledge. | $c: Translated from the German by Richard and Clara Winston.
## 991                                                                                                                                                                                                                                                     Mary : | a novel / | $c: Vladimir Nabokov ; translated from the Russian by Michael Glenny in collaboration with the author.
## 992                                                                                                                                                                                                                                                                                                                             Homecoming : | three novellas / | $c: John Clanchy.
## 993                                                                                                                                                                                                                                                                                                                                     The mulberry forest / | $c: Dalene Matthee.
## 994                                                                                                                                                                                                                                                                                                                                             Southtrap / | $c: Geoffrey Jenkins.
## 995                                                                                                                                                                                                                                                                                          The spectacle at the tower / | $c: Gert Hofmann ; translated by Christopher Middleton.
## 996                                                                                                                                                                                                                                                                                                                                                           Farewell to the King.
## 997                                                                                                                                                                                                                                                                                                                                                         The confidential agent.
## 998                                                                                                                                                                                                                                                                                                      The history of Tom Jones / | $c: Henry Fielding ; edited by R.P.C. Mutter.
## 999                                                                                                                                                                                                                                                                            Like a tear in the ocean : | a trilogy / | $c: Manès Sperber ; translated by Constantine Fitzgibbon.
## 1000                                                                                                                                                                                                                                                                                Pope Joan / | $c: Lawrence Durrell ; translated and adapted from the Greek of Emmanuel Royidis.
## 1001                                                                                                                                                                                                                                                                                           Riceyman steps, | and Elsie and the child. | $c: With an introd. by Michael Sadleir.
## 1002                                                                                                                                                                                                                                                                                                                        The night visitor, and other stories / | $c: B. Traven.
## 1003                                                                                                                                                                                                                                                                                                                                               Far cry / | $c: Michael Stewart.
## 1004                                                                                                                                                                                                                                                                         A woman of the Pharisees : | (La Pharisienne) / | $c: François Mauriac ; translated by Gerard Hopkins.
## 1005                                                                                                                                                                                                                                                                                                                                       Living together / | $c: Michael Wilding.
## 1006                                                                                                                                                                                                                                                                                                                                      Wolf Solent / | $c: by John Cowper Powys.
## 1007                                                                                                                                                                                                                                                                                                                      A man and two women : | stories / | $c: by Doris Lessing.
## 1008                                                                                                                                                                                                                                                                                        The witch and other stories / | $c: by Anton Chekhov ; translated by Constance Garnett.
## 1009                                                                                                                                                                                                                                                                                                                                        The rat-pit / | $c: by Patrick MacGill.
## 1010                                                                                                                                                                                                                                                         The Radetzky march / | $c: Joseph Roth ; translated by Eva Tucker, based on an earlier translation by Geoffrey Dunlop.
## 1011                                                                                                                                                                                                                                                                                                                                  The Penguin complete novels of George Orwell.
## 1012                                                                                                                                                                                                                                                                                        Spark of life / | $c: Erich Maria Remarque ; translated from the German by James Stern.
## 1013                                                                                                                                                                                                                                                                                                                                        Searching for Caleb / | $c: Anne Tyler.
## 1014                                                                                                                                                                                                                                                                                                               Moon country / | $c: Denys Chabot ; translated by David Lobdell.
## 1015                                                                                                                                                                                                                                                                                                                                     UFO's in South Africa / | $c: Frank Sante.
## 1016                                                                                                                                                                                                                                                                   My sweet-orange tree / | $c: José Mauro de Vasconcelos ; translated  from the Portuguese by Edgar H. Miller.
## 1017                                                                                                                                                                                                                                                                    A night of serious drinking / | $c: René Daumal ; translated from the French by David Coward & E.A. Lovatt.
## 1018                                                                                                                                                                                                                                                                        The desert of love = | (Le désert de l'amour) / | $c: François Maurice  ; translated by Gerard Hopkins.
## 1019                                                                                                                                                                                                                                                                                   The still storm / | $c: Françoise Sagan ; translated from the French by Christine Donougher.
## 1020                                                                                                                                                                                                                                                                                                                                        Collected stories of Guy de Maupassant.
## 1021                                                                                                                                                                                                                                                                                                                                                The little disturbances of man.
## 1022                                                                                                                                                                                                                                                                                                   A pier and a band. | $c: With an introductory appreciation by David Garnett.
## 1023                                                                                                                                                                                                                                                                                   Young Henry of Navarre / | $c: by Heinrich Mann ; translated from the German by Eric Sutton.
## 1024                                                                                                                                                                                                                                                                                                           Monimbó : | a novel / | $c: by Robert Moss and Arnaud de Borchgrave.
## 1025                                                                                                                                                                                                                                                                                                Friday / | $c: by Michel Tournier ; translated from the French by Norman Denny.
## 1026                                                                                                                                                                                                                                                                                                                          Working bullocks / | $c: Katharine Susannah Prichard.
## 1027                                                                                                                                                                                                                                                                         A prayer for Kateřina Horovitzova / | $c: Arnošt Lustig ; translated from the Czech by Jeanne Němcová.
## 1028                                                                                                                                                                                                                                Short Sicilian novels / | $c: Giovanni Verga ; translated from the Italian by D.H. Lawrence ; with an introduction and chronology by Eric Lane.
## 1029                                                                                                                                                                                                                                                                                         The troll garden / | $c: by Willa Cather ; with an afterword by Katherine Anne Porter.
## 1030                                                                                                                                                                                                                                                                                                                                          Fiela's child / | $c: Dalene Matthee.
## 1031                                                                                                                                                                                                                                                                                              The sponger / | $c: by Jules Renard ; translated from the French by Edward Hyams.
## 1032                                                                                                                                                                                                                                                                                                    The oath / | $c: Elie Wiesel ; translated from the French by Marion Wiesel.
## 1033                                                                                                                                                                                                                                                                                                                                         The scapegoat / | $c: by Nkem Nwankwo.
## 1034                                                                                                                                                                                                                                                                                 Maigret and the pickpocket / | $c: Georges Simenon ; translated from the French by Nigel Ryan.
## 1035                                                                                                                                                                                                                                                                                                                    Wild Saturday, and other stories / | $c: Joyce Carol Oates.
## 1036                                                                                                                                                                                                                                                                                                                                                   Swallow / | $c: D.M. Thomas.
## 1037                                                                                                                                                                                                                                                                                                                                     Audition for murder / | $c: P. M. Carlson.
## 1038                                                                                                                                                                                                                                                                                                       The Penguin Kenneth Grahame / | $c: with an introduction by Naomi Lewis.
## 1039                                                                                                                                                                                                                                                     Cruel tales / | $c: Villiers de L'Isle-Adam ; translated by Robert Boldick ; with an introduction and notes by A.W. Raitt.
## 1040                                                                                                                                                                                                                                                                                                                   The mind-body problem : | a novel / | $c: Rebecca Goldstein.
## 1041                                                                                                                                                                                                                                                                          Babi Yar : | a document in the form of a novel / | $c: Anatoli Kuznetsov ; translated by David Floyd.
## 1042                                                                                                                                                                                                                                                                                                                                The four great novels / | $c: Dashiell Hammett.
## 1043                                                                                                                                                                                                                                                                                  Hide my eyes / | $c: Margery Allingham ; new introduction by Mary Cadogan and Patricia Craig.
## 1044                                                                                                                                                                                                                                                                                                           The conquerors / | $c: André Malraux ; translated by Stephen Becker.
## 1045                                                                                                                                                                                                                                                       Three Russian masters : | passages from the works of Turgenev, Leskov and Chekhov / | $c: [translated by] S.D.P. Clough.
## 1046                                                                                                                                                                                                        At the foot of blue mountains : | stories by Tajik authors / | $c: Sadriddin Aini ... [et al. ; translated into English ; compiler and author of notes Shavkat Niyazi].
## 1047                                                                                                                                                                                                                          That awful mess on via Merulana / | $c: Carlo Emilio Gadda / | translated from the Italian by William Weaver ; with an introduction by Italo Calvino.
## 1048                                                                                                                                                                                                                                                                             The Master and Margarita / | $c: Mikhail Bulgakov ; translated from the Russian by Michael Glenny.
## 1049                                                                                                                                                                                                                                                                                                                    The law / | $c: Roger Vailland ; translated by Peter Wiles.
## 1050                                                                                                                                                                                                                                                                                                                                                   Smoke / | $c: Ivan Turgenev.
## 1051                                                                                                                                                                                                                                                                                                                                        A bed of flowers / | $c: Auberon Waugh.
## 1052                                                                                                                                                                                                                                                         The bachelors / | $c: Henry de Montherlant ; translated from the French and with an introduction by Terence Kilmartin.
## 1053                                                                                                                                                                                                                                          The sleepwalkers / | $c: Hermann Broch ; translated from the German by Willa and Edwin Muir ; with an introduction by Michael Tanner.
## 1054                                                                                                                                                                                                                                                                                                                          The black monk & other stories / | $c: Anton Chekhov.
## 1055                                                                                                                                                                                                                                                                                                                                                   Triptych / | $c: Joyce Cary.
## 1056                                                                                                                                                                                                                                           The blue bird ; and, The betrothal / | $c: by Maurice Maeterlinck ; annotated by Paul P. Ricchio ; illustrated by Michael Goscinsky.
## 1057                                                                                                                                                                                                                                                                                         Honey on bread : | short stories : [translated from the Russian] / | $c: V. Soloukhin.
## 1058                                                                                                                                                                                                                          Shoot! (Si gira); | the notebooks of Serafino Gubbio, cinematograph operator. | $c: Authorised translation from the Italian by C. K. Scott Moncrieff.
## 1059                                                                                                                                                                                                                                                         A light in the distance : | stories about Lenin / | $c: Sergei Antonov ; [translated from the Russian by Tracy Kuehn].
## 1060                                                                                                                                                                                                                                                                                                                         Wives at war and other stories / | $c: by Flora Nwapa.
## 1061                                                                                                                                                                                                                                                                                                    The house in Paris / | $c: Elizabeth Bowen ; with an introd. by A.S. Byatt.
## 1062                                                                                                                                                                                                                                                                                                                                                    Tart is the apple; a novel.
## 1063                                                                                                                                                                                                                                                                                           The investigation / | $c: Stanisław Lem ; translated from the Polish by Adele Milch.
## 1064                                                                                                                                                                                                                                                                                      Novel with cocaine / | $c: M. Ageyev ; translated from the Russian by Michael Henry Heim.
## 1065                                                                                                                                                                                                                                                                            Memoirs found in a bathtub / | $c: Stanisław Lem ; translated by Michael Kandel and Christine Rose.
## 1066                                                                                                                                                                                                                     The storyteller of Marrakesh : | based on traditional tales from Morocco / | $c: told by Ahmed Benchaga to Tony Barton ; illustrations by Helen Backhouse.
## 1067                                                                                                                                                                                                                                                                                            The casualty / | $c: Heinrich Böll ; translated from the German by Leila Vennewitz.
## 1068                                                                                                                                                                                                                                                                                                                     Stabilization of Guadalupe Ruin / | $c: by Larry L. Baker.
## 1069                                                                                                                                                                                                                                                                                                                                        The wild dogs / | $c: Peter Skrzynecki.
## 1070                                                                                                                                                                                                                                                                                              The outlaw / | $c: Georges Simenon ; translated from the French by Howard Curtis.
## 1071                                                                                                                                                                                                                                    The late Mattia Pascal / | $c: Luigi Pirandello ; translated from the Italian with an introduction and chronology by Nicoletta Simborowski.
## 1072                                                                                                                                                                                                     The engineer of human souls : | an entertainment on the old themes of life, women, fate, dreams, the working class, secret agents, love and death / | $c: Josef Skvorecky.
## 1073                                                                                                                                                                                                                                                                                 The schoolmaster and other stories / | $c: by Anton Chekhov ; translated by Constance Garnett.
## 1074                                                                                                                                                                                                                                                                                                               The wind / | $c: by Claude Simon ; translated by Richard Howard.
## 1075                                                                                                                                                                                                                                                                                                                              The house that was Eureka / | $c: Nadia Wheatley.
## 1076                                                                                                                                                                                                                                                                                                                                     Call of the heart / | $c: Sharaf Rashidov.
## 1077                                                                                                                                                                                                                                                                                                                                     Fire on the mountain / | $c: Edward Abbey.
## 1078                                                                                                                                                                                                                                                                                                The beast in man / | $c: Emile Zola ; translated from the French by Alec Brown.
## 1079                                                                                                                                                                                                                                                                                            Another life / | $c: Yuri Trifonov ; translated from the Russian by Michael Glenny.
## 1080                                                                                                                                                                                                                                                                                                                                      A city solitary / | $c: Nicolas Freeling.
## 1081                                                                                                                                                                                                                                                                                                                                      The last castle / | $c: George MacDonald.
## 1082                                                                                                                                                                                                                                                                                           Seraphita / | $c: Honoré de Balzac ; afterword/foreword by Patricia Wertheim Abrams.
## 1083                                                                                                                                                                                                                                                                                                                                       Two strange tales / | $c: Mircea Eliade.
## 1084                                                                                                                                                                                                                                                                                   El Angel's last conquest / | $c: Elvira Orphée ; translated from the Spanish by Magda Bogin.
## 1085                                                                                                                                                                                                                                                                                                                                    Robbery under arms / | $c: Rolf Boldrewood.
## 1086                                                                                                                                                                                                                                                                                                                                        Farai's girls / | $c: Shimmer Chinodya.
## 1087                                                                                                                                                                                                                                                                                                       The painted lady / | $c: Françoise Sagan ; translated by Lee Fahnestock.
## 1088                                                                                                                                                                                                                                          The Bram Stoker bedside companion : | 10 stories by the author of Dracula / | $c: edited and with an introduction by Charles Osborne.
## 1089                                                                                                                                                                                                                                                                                            Bukhara : | reminiscences / | $c: S. Aini ; translated into English by Holly Smith.
## 1090                                                                                                                                                                                                                                                                                         Gilles & Jeanne / | $c: Michel Tournier ; translated from the French by Alan Sheridan.
## 1091                                                                                                                                                                                                                                                                     The harvester / | $c: Gene Stratton-Porter ; introduction by Mary E. Gaither ; illustrated by W.L. Jacobs.
## 1092                                                                                                                                                                                                                                                                                                                                               Shoot! / | $c: Luigi Pirandello.
## 1093                                                                                                                                                                                                                                                                          Doctor Zhivago / | $c: Boris Pasternak ; translated from the Russian by Max Hayward and Manya Harari.
## 1094                                                                                                                                                                                                                                                                                                                            Moving out / | $c: Helen Garner and Jennifer Giles.
## 1095                                                                                                                                                                                                                                                                                                                                       Women are different / | $c: Flora Nwapa.
## 1096                                                                                                                                                                                                                                                                                    The Star Chernobyl / | $c: Julia Voznesenskaya ; translated from the Russian by Alan Myers.
## 1097                                                                                                                                                                                                                                                                                                       Water margin / | $c: written by Shi Nai'an ; translated by J.H. Jackson.
## 1098                                                                                                                                                                                                                                                                  Ukrainian folk tales / | $c: [translated from the Ukrainian by Irina Zheleznova ; illustrated by Yuli Kryha].
## 1099                                                                                                                                                                                                                                                                                               Yellow fever / | $c: Jean Lartéguy ; translated from the French by Xan Fielding.
## 1100                                                                                                                                                                                                                                                                                Henry Lawson : | stories for senior students / | $c: selected and introduced by Colin Roderick.
## 1101                                                                                                                                                                                                                                                       Out of the fire / | $c: Ales Adamovich, Yanka Bryl, Vladimir Kolesnik ; [translated by Angelia Graf and Nina Belenkaya].
## 1102                                                                                                                                                                                                  Tales from the Malay quarter / | $c: recorded and retold by I. D. Du Plessis ; english version by Bernard and Elize D. Lewis ; book design and decorations by Nerine Desmond.
## 1103                                                                                                                                                                                                                                                                                                           Maigret has doubts / | $c: Georges Simenon ; translated by Lyn Moir.
## 1104                                                                                                                                                                                                                                                                          The sacrament of the present moment / | $c: Jean-Pierre de Caussade ; translated by Kitty Muggeridge.
## 1105                                                                                                                                                                                                                                                                                                                                   The James Joyce murder / | $c: Amanda Cross.
## 1106                                                                                                                                                                                                                                                                                                                            North and South / | $c: Elizabeth Cleghorn Gaskell.
## 1107                                                                                                                                                                                                                                                                                                         The spider's house / | $c: Paul Bowles ; with a preface by the author.
## 1108                                                                                                                                                                                                                                                                                                                                An item from the late news / | $c: Thea Astley.
## 1109                                                                                                                                                                                                                                                                           War and peace / | $c: Leo Tolstoy ; translated by Louise and Aylmer Maude ; edited by Henry Gifford.
## 1110                                                                                                                                                                                                                                                                                                                                                    The works of Joseph Conrad.
## 1111                                                                                                                                                                                                                                                                                                                                                    The works of Joseph Conrad.
## 1112                                                                                                                                                                                                                    The tower at the edge of the world : | a poetic mosaic novel about my earliest youth / | $c: William Heinesen ; translated from the Danish by Maja Jackson.
## 1113                                                                                                                                                                                                    Blood brothers : | the adventures of two cossacks on land, sea and under water / | $c: Vasyl Shevchuk ; translated from Ukrainian by Yuri Tkach ; woodcuts by Vasyl Lopata.
## 1114                                                                                                                                                                                                                                                          Resurrection : | a novel / | $c: L. Tolstoy ; [translated from the Russian by Louise Maude ; edited by L. Kolesnikov]
## 1115                                                                                                                                                                                                                                                                                                                                                                 The bystander.
## 1116                                                                                                                                                                                                                             Pelle the Conqueror / | $c: Martin Andersen Nex ̜; translated from the Danish by Steven T. Murray ; edited and with an afterword by Tiina Nunnally.
## 1117                                                                                                                                                                                                                                                                               Behind the curtain / | $c: Borys Antonenko-Davydovych ; translated from Ukrainian by Yuri Tkach.
## 1118                                                                                                                                                                                                                                               Tales from Mauritius / | $c: by Ramesh Ramdoyal ; edited by Rodney Phillips ; cover design and illustrations by Nazal Rosunally.
## 1119                                                                                                                                                                                                                                                                                                      Göngu-Hrolfs saga / | $c: translated by Hermann Pálsson and Paul Edwards.
## 1120                                                                                                                                                                                                                                                                                                                                               The acolyte / | $c: Thea Astley.
## 1121                                                                                                                                                                                                                                                                                                                                The man-eater of Malgudi / | $c: R. K. Narayan.
## 1122                                                                                                                                                                                                                                                                            One day in the life of Ivan Denisovich / | $c: Alexander Solzhenitsyn ; translated by Ralph Parker.
## 1123                                                                                                                                                                                                                                                                                                                                                               The demon lover,
## 1124                                                                                                                                                                               A madman's defense = | Le plaidoyer d'un fou / | $c: by August Strindberg ; translation based on Ellie Schleussner's version, The confession of a fool ; revised and edited by Evert Sprinchorn.
## 1125                                                                                                                                                                                                                                                                               The first circle / | $c: Alexander Solzhenitsyn ; translated from the Russian by Michael Guybon.
## 1126                                                                                                                                                                                                                                                                                                                                               The graduate / | $c: Grace Ogot.
## 1127                                                                                                                                                                                                                                                                                                             Stories / | $c: Arkhip Teslenko ; [translated from the Ukrainian].
## 1128                                                                                                                                                                                                                                                                                       The fable and the flesh / | $c: Marcel Aymé ; translated from the French by Eric Sutton.
## 1129                                                                                                                                                                                                                           Fairy tales of the Slav peasants and herdsmen, | $c: from the French of Alex. Chodsko.  Tr. and illus. by Emily J. Harding.  London, G. Allen, 1896.
## 1130                                                                                                                                                                                                                                                                                                                                       John Ruskin's wife / | $c: Eva McDonald.
## 1131                                                                                                                                                                                                                                                                                                                       Not into clean hands. | $c: Translated by Bernard Miall.
## 1132                                                                                                                                                                                                                                                                                                                                         Without mannerisms / | $c: John Kolia.
## 1133                                                                                                                                                                                                                                                                                                                         Lifeboat / | $c: Harry Harrison and Gordon R. Dickson.
## 1134                                                                                                                                                                                                                                                                                                                                          The cotton-pickers / | $c: B. Traven.
## 1135                                                                                                                                                                                                                                                                                                                                                 The hunted / | Elmore Leonard.
## 1136                                                                                                                                                                                                                                                                                       The square / | $c: Marguerite Duras ; translated by Sonia Pitt-Rivers and Irina Morduch.
## 1137                                                                                                                                                                                                                                                                                                                                    The garden of weapons / | $c: John Gardner.
## 1138                                                                                                                                                                                                                                                                                                   The ward of our lady of mercy / | $c: by Ivan Cankar ; tr. by Henry Leeming.
## 1139                                                                                                                                                                                                        Now the volcano : | an anthology of Latin American gay literature / | $c: edited by Winston Leyland ; translated by Erskine Lane, Franklin D. Blanton, Simon Karlinsky.
## 1140                                                                                                                                                                                                                                                                                       Claude's confession / | $c: by Émile Zola ; translated from the French by George D. Cox.
## 1141                                                                                                                                                                                                                                                                                                                                                            It's a battlefield.
## 1142                                                                                                                                                                                                                               The school for wives ; Robert ; Geneviève : | or, The unfinished confidence / | $c: by André Gide ; translated from the French by Dorothy Bussy.
## 1143                                                                                                                                                                                                                                                                     Strait is the gate = | La porte étroite / | $c: translated from the French of André Gide by Dorothy Bussy.
## 1144                                                                                                                                                                                                                                                                                                                                 Mt. Taesong | (legendary) / | $c: Li Yong Gyu.
## 1145                                                                                                                                                                                                                                                         King William the Wanderer : | an old British saga, from Old French versions / | $c: [translated] by W. G. Collingwood.
## 1146                                                                                                                                                                                                                                                                             Malice aforethought : | the story of a commonplace crime / | $c: by Francis Iles [i.e. A. B. Cox].
## 1147                                                                                                                                                                                                                                                                                 Virgin soil upturned / | $c: Mikhail Sholokhov ; translated from the Russian by Stephen Garry.
## 1148                                                                                                                                                                                                                                                                                                                               Underground out of Holland / | $c: S. E. Hanson.
## 1149                                                                                                                                                                                                                                                                                                                           The temptation of Jack Orkney / | $c: Doris Lessing.
## 1150                                                                                                                                                                                                                                                                     The mayor of Casterbridge / | $c: Thomas Hardy ; edited with an introd. and notes by Martin Seymour-Smith.
## 1151                                                                                                                                                                                                                                                                                                          Rise up in anger. | $c: Translated by Sigrid Rock and Michael Roloff.
## 1152                                                                                                                                                                                                          Robbery under arms : | a story of life and adventure in the bush and in the goldfields of Australia / | $c: by Rolf Boldrewood ; with an introduction by Thomas Wood.
## 1153                                                                                                                                                                                                                                                                                                                            A mixture of frailties / | $c: by Robertson Davies.
## 1154                                                                                                                                                                                                                                                                                 The rainy season / | $c: Leonid Pochivalov ; [translated from the Russian by Cynthia Carlile].
## 1155                                                                                                                                                                                                                                                                                                                                       The precipice / | $c: by Ivan Goncharov.
## 1156                                                                                                                                                                                                                                                                     A common story : | a novel / | $c: by Ivan Gontcharoff ; translated from the Russian by Constance Garnett.
## 1157                                                                                                                                                                                                                                                                                                                                The deathless and the dead / | $c: Anna Clarke.
## 1158                                                                                                                                                                                                                                                                                  Trooper Peter Halket of Mashonaland / | $c: Olive Schreiner ; introduced by Marion Friedmann.
## 1159                                                                                                                                                                                                                                                                                                                    The fallen curtain, and other stories / | $c: Ruth Rendell.
## 1160                                                                                                                                                                                                                                                                                                                        The tenth Simenon omnibus / | $c: [by] Georges Simenon.
## 1161                                                                                                                                                                                                                                                                                                                 The other woman : | selected short stories / | $c: Grace Ogot.
## 1162                                                                                                                                                                                                                                                                                                                             Kolera kolej : | a novel / | $c: by Femi Osofisan.
## 1163                                                                                                                                                                                                                                                  The fiery angel : | a sixteenth century romance / | $c: by Valeri Briussov ; translated by Ivor Montagu and Sergei Nalbandov.
## 1164                                                                                                                                                                                                                                                                                                                                                              Beyond the glass.
## 1165                                                                                                                                                                                                                                                                                                                                           Ikael Torass / | $c: N. D. Williams.
## 1166                                                                                                                                                                                                                                               The best of Roald Dahl : | stories from Over to you, Someone like you, Kiss kiss, Switch bitch / | $c: introd. by James Cameron.
## 1167                                                                                                                                                                                                                                                                                                                                         A dirge too soon / | $c: Peggy Appiah.
## 1168                                                                                                                                                                                                                                                        The diary of a madman, and other tales of horror / | $c: Guy de Maupassant ; selected and translated by Arnold Kellett.
## 1169                                                                                                                                                                                                                                         Giovanni Boccaccio's Il filocolo : | or, The labors of love / | $c: translated, annotated, and with an introd. by Rocco Carmelo Blasi.
## 1170                                                                                                                                                                                                                                                                     The virility factor : | a novel / | $c: by Robert Merle ; translated from the French by Martin Sokolinsky.
## 1171                                                                                                The book of Dene : | containing the traditions and beliefs of Chipewyan, Dogrib, Slavey, and Loucheux peoples / | $c: translated from French and compared with versions in the original tongues by Programme Development Division, Department of Education, Yellowknife, N.W.T.
## 1172                                                                                                                                                                                                                                                                                                                                              Agatha / | $c: by Kathleen Tynan.
## 1173                                                                                                                                                                                                                                                                                                                                                                A haunted land.
## 1174                                                                                                                                                                                                                                                                                                           But the dead are many : | a novel in fugue form / | $c: Frank Hardy.
## 1175                                                                                                                                                                                                                                                                                                                 Utopia / | $c: Saint Thomas More ; introd. by John Warrington.
## 1176                                                                                                                                                                                                                                                                                                                                            The cornermen / | $c: John Gardner.
## 1177                                                                                                                                                                                                                                                                                                                                           Lover in the sky / | $c: Sam Kahiga.
## 1178                                                                                                                                                                                                                                                      Greeks bearing gifts : | the epics of Achilles and Ulysses / | $c: by Bernard Evslin ; illustrated by Lucy Martin Bitzer.
## 1179                                                                                                                                                                                                                                                                                                                                          Highland fling / | $c: Nancy Mitford.
## 1180                                                                                                                                                                                                                                                                                                                                   My mother's people / | $c: by Barry Gifford.
## 1181                                                                                                                                                                                                                                                                              Jenny Treibel / | $c: Theodor Fontane : translated with introduction and notes by Ulf Zimmermann.
## 1182                                                                                                                                                                       Les Onze mille verges : | or, The amorous adventures of Prince Mony Vibescu / | $c: [by] Guillaume Apollinaire ; translated from the French by Nina Rootes ; and with an introduction by Richard N. Coe.
## 1183                                                                                                                                                                                              Hallucinations : | being an account of the life and adventures of Friar Servando Teresa de Mier / | $c: [by] Reinaldo Arenas ; translated from the Spanish by Gordon Brotherston.
## 1184                                                                                                                                                                                                                                                                                                                                                                City of Spades.
## 1185                                                                                                                                                                                                                                                                                                             Contemporary portraits and other stories / | $c: [by] Murray Bail.
## 1186                                                                                                                                                                   The fifth pestilence, together with The history of the tinkling cymbal and sounding brass, Ivan Semyonovitch Stratilatov / | $c: by Alexei Remizov ; translated from the Russian with a pref. by Alec Brown.
## 1187                                                                                                                                                                                                                                                                                                               The martyrs / | $c: M. de Chateaubriand ; edited by O. W. Wight.
## 1188                                                                                                                                                                                                                                                                                                                                                                    April lady.
## 1189                                                                                                                                                                                                                                                                                                                                  The men from Pretoria / | $c: Hilary Ngʼweno.
## 1190                                                                                                                                                                                                                                              Confessions of Zeno / | $c: Italo Svevo ; translated from the Italian by Beryl de Zoete ; with a note on Svevo by Edouard Roditi.
## 1191                                                                                                                                                                                                                                                                                      Altneuland = | Old-new land : novel / | $c: by Theodor Herzl ; translated by Paul Arnold.
## 1192                                                                                                                                                                                                                                                                                                                         The soul of the robot / | $c: by Barrington J. Bayley.
## 1193                                                                                                                                                                                                                                                                          The diary of a country priest / | $c: Georges Bernanos ; translated from the French by Pamela Morris.
## 1194                                                                                                                                                                                                                                 The portable Saul Bellow / | $c: with a critical introd. by Gabriel Josipovici ; compiled under the supervision of the author by Edith Tarcov.
## 1195                                                                                                                                                                                                                                                          Merry tales and three Shrovetide plays / | $c: by Hans Sachs ; now first done into English verse by William Leighton.
## 1196                                                                                                                                                                                                                                                                Tales from Sacchetti / | $c: translated from the Italian by Mary G. Steegmann ; with an introd. by Guido Biagi.
## 1197                                                                                                                                                                                                                                                                                                                                                                      The aloe.
## 1198                                                                                                                                                                                                                                                                  Ilona. | $c: Translated from the German by Michael Bullock. Adapted for the American ed. by Catherine Hutter.
## 1199                                                                                                                                                                                                                                                                                                                                             Livingstone's companions: stories.
## 1200                                                                                                                                                                                                                                                                                                                              Voices of Africa / | $c: edited by Barbara Nolen.
## 1201                                                                                                                                                                                                                                                                                                   Mansfield Park / | $c: Jane Austen ; edited, with an introd. by Tony Tanner.
## 1202                                                                                                                                                                                                                                                                                                                                        A burnt-out case / | $c: Graham Greene.
## 1203                                                                                                                                                                                                                                                                                                                                                               The householder.
## 1204                                                                                                                                                                                                                                                                                                                                                       Hickory, dickory, death.
## 1205                                                                                                                                                                                                                                                                                                                                        The chalk giants / | $c: Keith Roberts.
## 1206                                                                                                                                                                                                                                                                                                                      The stone bridal bed. | $c: Translated by Adrienne Dixon.
## 1207                                                                                                                                                                                                                                                                                                                                                            A summer to decide.
## 1208                                                                                                                                                                                                                                                                                                                                                              A kind of loving.
## 1209                                                                                                                                                                                                                                                                                                    Kim / | $c: Rudyard Kipling ; edited with an introduction by Alan Sandison.
## 1210                                                                                                                                                                                                                                                                                                                                  The song of the lark / | $c: by Willa Cather.
## 1211                                                                                                                                                                                                                                                       God's pauper : | St. Francis of Assisi : a novel / | $c: by Nikos Kazantzakis ; [translated from the Greek by P.A. Bien]
## 1212                                                                                                                                                                                                                                                                                                                    The acceptance world : | a novel / | $c: by Anthony Powell.
## 1213                                                                                                                                                                                                                                                   Synnv̲ ̌Solbakken. | $c: Given in English by Julie Sutter. A new ed. with an essay on the writings of Bjr̲nson by Edmund Gosse.
## 1214                                                                                                                                                                                                                                                                                                                              Inside Mr. Enderby | $c: [by] Joseph Kell, pseud.
## 1215                                                                                                                                                                                                                                                                                                                                                        The rouge of the north.
## 1216                                                                                                                                                                                                                                                                                                                                                   Prose works of Henry Lawson.
## 1217                                                                                                                                                                                                                                                                                                                         Futility and other animals | $c: [by] Frank Moorhouse.
## 1218                                                                                                                                                                                                                                                                                                                            Villette. | $c: With an introd. by Phyllis Bentley.
## 1219                                                                                                                                                                                                                                                                                                                                 Death in the clouds, | $c: by Agatha Christie.
## 1220                                                                                                                                                                                                                                                                                     Man without a shadow : | the diary of an existentialist : a novel / | $c: by Colin Wilson.
## 1221                                                                                                                                                                                                                                                                                                                               To every birth its blood / | $c: Mongane Serote.
## 1222                                                                                                                                                                                                                                                                                            Anatolian tales / | $c: Yashar Kemal ; translated from the Turkish by Thilda Kemal.
## 1223                                                                                                                                                                                                                                                                                                                                     The madness of Didi / | $c: Obi B. Egbuna.
## 1224                                                                                                                                                                                                                                                                                               Prayer for an assassin / | $c: Igor Sentjurc ; translated by Cornelia Schaeffer.
## 1225                                                                                                                                                                                                                                                                         War and peace / | $c: a novel by count Leo Tolstoy ; translated from the Russian by Constance Garnett.
## 1226                                                                                                                                                                                                                                                                                                                                    Twenty years after / | $c: Alexander Dumas.
## 1227                                                                                                                                                                                                                                                              A dreambook for our time/ | $c: Tadeusz Konwicki ; translated by David Welsh ; introduction by Leszek Kołakowski.
## 1228                                                                                                                                                                                                                                                                                                                                       On the black hill / | $c: Bruce Chatwin.
## 1229                                                                                                                                                                                                                                                                                                     During the reign of the Queen of Persia : | a novel / | $c: by Joan Chase.
## 1230                                                                                                                                                                                                                                       The Love that was : | stories of Estonian writers / | $c: [translated into English ; designed by A. Moiseev ; compiled by Elvina Moroz].
## 1231                                                                                                                                                                                                                                                                                        Caleb Williams / | $c: William Godwin ; edited with an introduction by David McCracken.
## 1232                                                                                                                                                                                                                                                                                                           Axël / | $c: Villiers de L'Isle-Adam ; translated by M. Gaddis Rose.
## 1233                                                                                                                                                                                                                                                                                                      Moonfleet / | $c: by J. Meade Falkner ; illustrated by Geoffrey Fletcher.
## 1234                                                                                                                                                                                                                                                                                              The marble dance / | $c: Lygia Fagundes Telles ; translated by Margaret A. Neves.
## 1235                                                                                                                                                                                                                                                                                           Maigret and the Calame report / | $c: Georges Simenon ; translated by Moura Budberg.
## 1236                                                                                                                                                                                                                                                                                                                                    The Pegasus man / | $c: by Peter Armstrong.
## 1237                                                                                                                                                                                                                                                                                                                                              Real lies / | $c: Craig McGregor.
## 1238                                                                                                                                                                                                                                                       The fur country : | a romance of the high Arctic / | $c: Jules Verne ; in a new English translation by J. Edward Baxter.
## 1239                                                                                                                                                                                                                                                                                                                                         Lilian's story / | $c: Kate Grenville.
## 1240                                                                                                                                                                                                                                                                                                                                             Bloodfather / | $c: David Ireland.
## 1241                                                                                                                                                                                                                                              The imposters : | the truth and the lies about their travels through the Amazon / | $c: Pablo Vierci ; translated by Sara Nelson.
## 1242                                                                                                                                                                                                                                                                        TASS is authorized to announce-- : | a novel / | $c: by Julian Semyonov ; translated by Charles Buxton.
## 1243                                                                                                                                                                                                                                           The sorrows of the young Werther : | (and other stories) / | $c: Wolfgang Goethe ; with an introduction and chronology by Eric Lane.
## 1244                                                                                                                                                                                                                                                                                   The kaiser's coolies / | $c: Theodor Plivier ; translated from the German by Margaret Green.
## 1245                                                                                                                                                                                                                                                                                                        The thunderers / | $c: Victor Stepanov ; [translated from the Russian].
## 1246                                                                                                                                                                                                                                                                                                                                   Regards to the czar / | $c: Margaret Coombs.
## 1247                                                                                                                                                                                                                                                               Talks with a devil / | $c: P.D. Ouspensky ; translated by Katya Petroff ; edited and introduced by J.G. Bennett.
## 1248                                                                                                                                                                                                                                                                                                 The great fortune : | volume one of The Balkan trilogy / | $c: Olivia Manning.
## 1249                                                                                                                                                                                                                                                                                                                                               3 x Handke / | $c: Peter Handke.
## 1250                                                                                                                                                                                                                                                                                           Folk-tales from Igboland / | $c: collected and translated by Priscilla Ngozi Oguine.
## 1251                                                                                                                                                                                                                                                                        The complete stories / | $c: Franz Kafka ; edited by Nahum N. Glatzer ; with a foreword by John Updike.
## 1252                                                                                                                                                                                                                                                                                                                     Stamboul train : | an entertainment / | $c: Graham Greene.
## 1253                                                                                                                                                                                                                                                                                                           Red gas : | a novel / | $c: Edward Topol ; translated by Alan Myers.
## 1254                                                                                                                                                                                                                                                                             The keeper of antiquities / | $c: Yury Dombrovsky ; translated from the Russian by Michael Glenny.
## 1255                                                                                                                                                                                                                                                                                   Blue eyes, black hair / | $c: Marguerite Duras ; translated from the French by Barbara Bray.
## 1256                                                                                                                                                                                                                                                                                                               The winter of our discontent : | a novel / | $c: John Steinbeck.
## 1257                                                                                                                                                                                                                                                                                                                                                        The climate of courage.
## 1258                                                                                                                                                                                                                                                                                                                                    The day in shadow / | $c: Nayantara Sahgal.
## 1259                                                                                                                                                                                                                                                                                                                   The secret agent : | a simple tale / | $c: by Joseph Conrad.
## 1260                                                                                                                                                                                                                                                                                                                                       The pure land / | $c: [by] David Foster.
## 1261                                                                                                                                                                                                                                                                              The autumn ball : | scenes of city life / | $c: Mati Unt ; [translated from Estonian by Mart Aru]
## 1262                                                                                                                                                                                                                                                                                                                                              Redcoat / | $c: Bernard Cornwell.
## 1263                                                                                                                                                                                                                                                                                                Moby Dick / | $c: Herman Melville ; edited with an introduction by Tony Tanner.
## 1264                                                                                                                                                                                                                                                                     Conversations with Lord Byron on perversion, 163 years after His Lordship's death / | $c: Amanda Prantera.
## 1265                                                                                                                                                                                                                                                                                                               A love affair / | $c: Dino Buzzati ; translated by Joseph Green.
## 1266                                                                                                                                                                                                                                                                                                                                   The living hothouse / | $c: Marion Halligan.
## 1267                                                                                                                                                                                                                                                                                                                                 Man and arms : | a novel / | $c: Oles Honchar.
## 1268                                                                                                                                                                                                                                                        Possessed, or, The secret of Myslotch : | a Gothic novel / | $c: Witold Gombrowicz ; English version by J.A. Underwood.
## 1269                                                                                                                                                                                                                                                                                                   An introduction to the life and works of John Bunyan / | $c: David Marshall.
## 1270                                                                                                                                                                                                                                                                                                                                          The charmer / | $c: Patrick Hamilton.
## 1271                                                                                                                                                                                                                                          Darkness casts no shadow / | $c: Arnošt Lustig ; translated from the Czech by Jeanne Nĕmcová ; with an introduction by Anthony Blond.
## 1272                                                                                                                                                                                                                                                                                     The man in the monkey suit / | $c: Oswaldo França, Júnior ; translated by Gregory Rabassa.
## 1273                                                                                                                                                                                                                                          A tale of two cities / | $c: Charles Dickens ; edited with an introduction by George Woodcock, and illustrations by Hablot K. Browne.
## 1274                                                                                                                                                                                                                                                                                                     Narratives of the wreck of the whale-ship Essex / | $c: Owen Chase, et al.
## 1275                                                                                                                                                                                                                                                                History and legend in Romanian short stories and tales ; translated by Ana Cartianu ; foreword by Mihai Zamfir.
## 1276                                                                                                                                                                                                                                                                                              Legends from the Outback / | $c: Phyllis M. Power ; illustrated by Ida Outhwaite.
## 1277                                                                                                                                                                                                                                                                             Whispering in the reeds : | South African folk tales and legends / | $c: Rosalie Liguori-Reynolds.
## 1278                                                                                                                                                                                                                                          Favourite folktales of China / | $c: translated by John Minford ; illustrated by He Youzhi and others ; introduction by Zhong Jingwen
## 1279                                                                                                                                                                                                                         The golden bird : | folk tales from Slovenia / | $c: told by Vladimir Kavc̆ic̆ ; translated by Jan Dekker and Helen Lenc̆ek ; illustrated by Mae Gerhard.
## 1280                                                                                                                                                                                                                                                                                                              Beijing legends / | $c: Jin Shoushen ; translated by Gladys Yang.
## 1281                                                                                                                                                                                                                                                            The wonderful sea horse, | and other Persian tales. | $c: Translated by L.P. Elwell-Sutton; illus. by Neville Main.
## 1282                                                                                                                                                                                                                                      Celtic tales : | legends of tall warriors & old enchantments / | $c: retold by Barbara Leonie Picard ; illustrated by John G. Galsworthy.
## 1283                                                                                                                                                                                                                                         Arctic twilight : | old Finnish tales / | $c: by Samuli Paulaharju ; translated by Allan M. Pitkänen ; illustrations by Urpo Huhtanen.
## 1284                                                                                                                                                                                                                                       Fireside tales of the Traveller children : | twelve Scottish stories / | $c: told by Duncan Williamson ; illustrated by Alan B. Herriot.
## 1285                                                                                                                                                                                                                                                                 A Mountain of gems : | fairy tales of the peoples of the Soviet land / | $c: [translated by Irina Zheleznova].
## 1286                                                                                                                                                                                                                                                                                     Estonian fairy tales / | $c: illustrations by Vive Tolli ; [translated by Irina Železnova]
## 1287                                                                                                                                                                                                                                                    Ancient tales in modern Japan : | an anthology of Japanese folk tales / | $c: selected and translated by Fanny Hagin Mayer.
## 1288                                                                                                                                                                                                                                                                                       The long & the short & the tall : | a collection of Australian yarns / | $c: W.N. Scott.
## 1289                                                                                                                                                                                                                              The black cloth : | a collection of African folktales / | $c: Bernard Binlin Dadié ; foreword by Es'kia Mphahlele ; translated by Karen C. Hatch.
## 1290                                                                                                                                                                                                                                                                                   Fairy tales from Czechoslovakia / | $c: by Božena Něncová ; translated by Ludmila Ondrůjová.
## 1291                                                                                                                                                                                                                                                                                   Fairy tales from Czechoslovakia / | $c: by Božena Něncová ; translated by Ludmila Ondrůjová.
## 1292                                                                                                                                                                                                                                                       Folk tales from Roumania, | $c: translated from the Roumanian by Mabel Nandris; illustrated by Iza Constantinovici-Hein.
## 1293                                                                                                                                                                                                                                                    The trials and tribulations of Little Red Riding Hood : | versions of the tale in sociocultural context / | $c: Jack Zipes.
## 1294                                                                                                                                                                                                                                                                                                Welsh legends and folk-tales, retold. | $c: Illustrated by Joan Kiddell-Monroe.
## 1295                                                                                                                                                                                                                                                            Noli me tangere / | $c: Jose Rizal ; a completely new translation for the contemporary reader by Leon Ma. Guerrero.
## 1296                                                                                                                                                                                                                                                                                                                                                    Tales from the Arab tribes.
## 1297                                                                                                                                                                                                                                                                    The Oral literature of the Banyakyusa / | $c: collected, translated, and compiled by Christon S. Mwakasaka.
## 1298                                                                                                                                                                                                                                                               Kalila and Dimna : | selected fables of Bidpai / | $c: retold by Ramsay Wood ; illustrated by Margaret Kilrenny.
## 1299                                                                                                                                                                                                                                                                                               Folk tales of the borders / | $c: Winifred M. Petrie ; drawings by Barbara Gray.
## 1300                                                                                                                                                                                                                                                                              Elves, trolls and elemental beings : | Icelandic folktales II / | $c: translated by Alan Boucher.
## 1301                                                                                                                                                                                                                                                                           Adventures, outlaws and past events : | Icelandic folktales III  / | $c: translated by Alan Boucher.
## 1302                                                                                                                                                                                                                            Once upon a time; | forty Hungarian folk-tales. | $c: [Translated from the Hungarian by Barna Balogh and Susan Kun. Translated rev. by Ruth Sutter]
## 1303                                                                                                                                                                                                                                      Siamese tales old and new: | The four riddles and other stories, | $c: translated by Reginald le May, with some reflections on the tales.
## 1304                                                                                                                                                                                                                                                                                                    Rumanian bird and beast stories / | $c: rendered into English by M. Gaster.
## 1305                                                                                                                                                                                                                         The magic fiddler and other legends of French Canada, | $c: text by Claude Aubry, graphics by Saul Field. Translated from the French by Alice E. Kane.
## 1306                                                                                                                                                                                                                                   Rabbi Eizik : | Hasidic stories about the Zaddik of Kallo / | $c: translated from the Hungarian with an introd. and notes by Andrew Handler.
## 1307                                                                                                                                                       Traditional tales of old Korea : | a mixture of legend and history of Korea's colorful past / | $c: compiled by Park Yongjun ; translated by Kim, Yon Soo ... [et al.] ; prepared with assistance from John Ryan Heisse.
## 1308                                                                                                                                                       Traditional tales of old Korea : | a mixture of legend and history of Korea's colorful past / | $c: compiled by Park Yongjun ; translated by Kim, Yon Soo ... [et al.] ; prepared with assistance from John Ryan Heisse.
## 1309                                                                                                                                                                                                                                                                       The hunter's cave: | a book of stories based on African folk-tales. | $c: Illustrated by Sheila Hawkins.
## 1310                                                                                                                                                                                                                                                                                       Indonesian folk tales. | $c: Translated by Albert Koutsoukis. Illustrated by Jean Elder.
## 1311                                                                                                                                                                                                                                         Serbian folk-lore; | popular tales, | $c: selected and translated by Madam Csedomille Mijatovies. Edited with an introd. by W. Denton.
## 1312                                                                                                                                                                                                                   Heroes of folk tale and legend, | $c: by Vladimír Hulpach, Emanuel Frynta [and] Václav Cibula. Illustrated by Miloslav Troup. Translated by George Theiner. 
## 1313                                                                                                                                                                                                                                                            The story bag; | a collection of Korean folk tales. | $c: Translated by Setsu Higashi; illustrated by Kim Eui-hwan.
## 1314                                                                                                                                                                                                                                                                       The people of the sea; | a journey in search of the seal legend. | $c: With a foreword by Gavin Maxwell.
## 1315                                                                                                                                                                                                                                                                                                                     New Guinea folk-tales. | $c: Illustrated by Michael Brett.
## 1316                                                                                                                                                                                                                                                             Czech folk tales, | $c: selected and tr. by Josef Baudis.  With 8 illustrations.  London, G. Allen & Unwin [1917].
## 1317                                                                                                                                                                                                                                                            Russian popular tales / | $c: translated from the German version of Anton Dietrich; with an introd. by Jacob Grimm.
## 1318                                                                                                                                                                                                                                                           Stories from Babylon and Persia. | $c: Ed. and translated from the French by Barbara Whelpton. Illus. by Rene Peron.
## 1319                                                                                                                                                                                                                                                                                                                                                                 Mountain path.
## 1320                                                                                                                                                                                                                                                                                                           Across the land from ghost to ghost / | $c: Adi-Kent Thomas Jeffrey.
## 1321                                                                                                                                                                                                                                                                                                                                                                Zuni mythology.
## 1322                                                                                                                                                                        Hong Kong tale-spinners; | a collection of tales and ballads. | $c: Transcribed and translated from story-tellers in Hong Kong by Bertha Hensman, Mack Kwok-Ping, with illustrations by Hsieh Chung-Wu.
## 1323                                                                                                                                                                                                                                                                                Three Märchen of E. T. A. Hoffmann. | $c: Translated and with an introd. by Charles E. Passage.
## 1324                                                                                                                                                                                                                   The death-thorn; | magic, superstitions, and beliefs of urban Indians in Panama and Peru. | $c: Translated by Bernard Miall. London, G. Allen & Unwin, 1934.
## 1325                                                                                                                                                                                                                                                                                                           Persian folktales | $c: [translated from the German by Alfred Kurti.
## 1326                                                                                                                                                                                                                                                                                                        King Arthur; tales of the Round Table. | $c: Illustrated by H. J. Ford.
## 1327                                                                                                                                                                                                                                   The Northmen talk; | a choice of tales from Iceland. | $c: Translated and with an introd. by Jacqueline Simpson. Foreword by Eric Linklater.
## 1328                                                                                                                                                                                                                                                                                                                                       Told in the market place; | forty tales.
## 1329                                                                                                                                                                                                                                  Japanese tales of mystery & imagination, by Edogawa Rampo [pseud.] | $c: Translated by James B. Harris; [jacket design & illus. by M. Kuwada]
## 1330                                                                                                                                                                                                                                                           The African saga. | $c: Translated from L'Anthologie nègre by Margery Bianco. With an introd. by Arthur B. Spingarn.
## 1331                                                                                                                                                                                                                   Our children of the sun; | a suite of Inca legends from Peru. | $c: Authorized translation and introd. by Merritt Moore Thompson. Foreword by J. Cary Davis.
## 1332                                                                                                                                                                                                                                 The snow queen, and other tales. | A new selection and translation | $c: with an introd. by Pat Shaw Iversen. Illustrated by Sheila Greenwald.
## 1333                                                                                                                                                                                                         Yule-tide stories; | a collection of Scandinavian and north German popular tales and traditions, from the Swedish, Danish, and German. | $c: London, H. G. Bohn, 1853.
## 1334                                                                                                                                                                                                                                      Stories of the Middle Ages | $c: [by] Marcelle and Georges Huisman. Translated and adapted by Patricia Crampton. Illustrated by Beuville.
## 1335                                                                                                                                                                                                                                                                                    Bawdy tales from the courts of medieval France. | $c: Translated and edited by Paul Brians.
## 1336                                                                                                                                                                                                                                                                             Armenian folk-tales and fables; | $c: translated by Charles Downing, illustrated by William Papas.
## 1337                                                                                                                                                                                                                                     Tales from the Basotho. | $c: Translated from Afrikaans by Susie McDermid. Analytical notes, tale type and motif indexes by John M. Vlach.
## 1338                                                                                                                                                                                                                                                                                                                                                         Folk tales from Korea.
## 1339                                                                                                                                                                                                                                                     China's dirtiest trickster; | folklore about Hsü Wen-chʻang (1521-1593). | $c: Translated and described by Howard S. Levy.
## 1340                                                                                                                                                                                                                                                                                                                                                           Indaba, my children.
## 1341                                                                                                                                                                                                                                                         Mead Moondaughter, & other Icelandic folk tales | $c: [compiled by] Alan Boucher; illustrated by Karólína Lárusdóttir.
## 1342                                                                                                                                                                                                                                       Fables and fairy tales. | $c: A new translation by Ann Dunnigan. Illustrated by Sheila Greenwald.  With a foreword by Raymond Rosenthal.
## 1343                                                                                                                                                                                                                                                  Fables and fairy tales. | $c: Translated by Ann Dunnigan.  Illus. by Sheila Greenwald.  With a foreword by Raymond Rosenthal.
## 1344                                                                                                                                                                                                                                                                                         The life and opinions of Tristram Shandy, gentleman, | $c: edited by James Aiken Work.
## 1345                                                                                                                                                                                                  The simpleton of Naples and other Italian folktales / | $c: by Nonna Maria Scarpato ; translated and retold by her daughter, Camille Fattoross ; illustrations by Ted Guerin.
## 1346                                                                                                                                                                                                                                                                                                   Women in ancient Indian tales / | $c: Jagdishchandra Jain & Margaret Walter.
## 1347                                                                                                                                                                                                                                                                                  Italian folktales / | $c: selected and retold by Italo Calvino ; translated by George Martin.
## 1348                                                                                                                                                                                                                                              The twelve dancing princesses, and other fairy tales, | $c: selected and with an introd. by Alfred David and Mary Elizabeth Meek.
## 1349                                                                                                                                                                                                                                                          Beauties, beasts, and enchantment : | classic French fairy tales ; translated and with an introduction by Jack Zipes.
## 1350                                                                                                                                                                                                                                                                       Quiet flows the Don : | a novel in two volumes / | $c: Mikhail Sholokhov ; translated by Robert Daglish.
## 1351                                                                                                                                                                                                                                                                       Quiet flows the Don : | a novel in two volumes / | $c: Mikhail Sholokhov ; translated by Robert Daglish.
## 1352                                                                                                                                                                                                                                                                                                             Startide rising / | $c: David Brin ; frontispiece by David Cherry.
## 1353                                                                                                                                                                                                                                                                                                          Son of man, | $c: by Augusto Roa Bastos. Translated by Rachel Caffyn.
## 1354                                                                                                                                                                                                                                                                                                                                  Elisa. | $c: Translated by Margaret Crosland.
## 1355                                                                                                                                                                                                                                Alice of old Vincennes / | $c: Maurice Thompson ; illustrations by F.C. Yohn ; foreword by August Schultheis ; introduction by Mary E. Gaither.
## 1356                                                                                                                                                                                                                                                                                                                                       Monsignor Quixote / | $c: Graham Greene.
## 1357                                                                                                                                                                                                                                                                                                                                                                Roads to glory.
## 1358                                                                                                                                                                                                                                                                                                                         King Rother / | $c: translated by Robert Lichtenstein.
## 1359                                                                                                                                                                                                                                                                          El sen̄or presidente / | $c: Miguel Angel Asturias ; translated from the Spanish by Frances Partridge.
## 1360                                                                                                                                                                                                                                                      War and peace; | the Maude translation, backgrounds and sources [and] essays in criticism. | $c: Edited by George Gibian.
## 1361                                                                                                                                                                                                                                      Tales of times now past : | sixty-two stories from a medieval Japanese collection / | $c: [translated and with an introd. by] Marian Ury.
## 1362                                                                                                                                                                                                                                                                                                                                  Germinal. | $c: Translated by Havelock Ellis.
## 1363                                                                                                                                                                                                                                                                     The adventures of Hajji Baba of Ispahan / | $c: James Morier ; with an introduction by Richard D. Althick.
## 1364                                                                                                                                                                                                                                                                                                                 The house of mirth; | $c: with a foreword by Marcia Davenport.
## 1365                                                                                                                                                                                                                                                                                                                                          Ceremony / | $c: Leslie Marmon Silko.
## 1366                                                                                                                                                                                                        Bread givers : | a novel : a struggle between a father of the Old World and a daughter of the New / | $c: by Anzia Yezierska ; with an introd. by Alice Kessler Harris.
## 1367                                                                                                                                                                                                                                                                                                                                                  One arm, | and other stories.
## 1368                                                                                                                                                                                                                                              The complete fairy tales and stories. | $c: Translated from the Danish by Erik Christian Haugaard. Foreword by Virginia Haviland.
## 1369                                                                                                                                                                                                                                                                        All quiet on the western front / | $c: Erich Maria Remarque ; translated from the German by A.W. Wheen.
## 1370                                                                                                                                                                                                                                                              The man without qualities. | $c: Translated from the German and with a foreword by Eithne Wilkins & Ernst Kaiser.
## 1371                                                                                                                                                                                                                                                              The man without qualities. | $c: Translated from the German and with a foreword by Eithne Wilkins & Ernst Kaiser.
## 1372                                                                                                                                                                                                                                                                                                                                       Tolstoy's tales of courage and conflict.
## 1373                                                                                                                                                                                                                                                                                               Limestone, | and other stories. | $c: Translated and with introd. by David Luke.
## 1374                                                                                                                                                                                                                                                                                                                                   The Recluse; | $c: translated by David Luke.
## 1375                                                                                                                                                                                                                                                                                                             Life is elsewhere. | $c: Translated from the Czech by Peter Kussi.
## 1376                                                                                                                                                                                                                                                                                     Scenes from a marriage / | $c: Ingmar Bergman ; translated from the Swedish by Alan Blair.
## 1377                                                                                                                                                                                                                                                                                                                                    Heat and dust / | $c: Ruth Prawer Jhabvala.
## 1378                                                                                                                                                                                                                                                                                                               Symposium and other dialogues. | $c: Introd. by John Warrington.
## 1379                                                                                                                                                                                                                                                                                                                           Stories and episodes. | $c: Introd. by Erich Heller.
## 1380                                                                                                                                                                                                                                                               The radiance of the king. | $c: With an introd. by Albert S. Gérard. Translated from the French by James Kirkup.
## 1381                                                                                                                                                                                                                                                                                                              King Lazarus; | a novel. | $c: With an introd. by O. R. Dathorne.
## 1382                                                                                                                                                                                                                                                                 Gabriela, clove and cinnamon. | $c: Translated from the Portuguese by James L. Taylor and William L. Grossman.
## 1383                                                                                                                                                                                                                                                                                                                                                               Weep not, child.
## 1384                                                                                                                                                                                                                                                              The man without qualities. | $c: Translated from the German and with a foreword by Eithne Wilkins & Ernst Kaiser.
## 1385                                                                                                                                                                                                                                                                                                                                                                   Middlemarch.
## 1386                                                                                                                                                                                                                                                                                                                                                             The golden orchid.
## 1387                                                                                                                                                                                                                                                                                                Stories of three decades; | $c: translated from the German by H.T. Lowe-Porter.
## 1388                                                                                                                                                                                                                                                                                                                                        This immortal / | $c: by Roger Zelazny.
## 1389                                                                                                                                                                                                                                                                                      An American tragedy / | $c: illustrated by Grant Reynard ; introduction by H. L. Mencken.
## 1390                                                                                                                                                                                                                                                                                           Job, the story of a simple man / | $c: Joseph Roth ; translated by Dorothy Thompson.
## 1391                                                                                                                                                                                                                                                                          Maigret and the ghost / | $c: [by] Georges Simenon ; translated from the French by Eileen Ellenbogen.
## 1392                                                                                                                                                                                                                                                                                                                      The bleeding heart : | a novel / | $c: by Marilyn French.
## 1393                                                                                                                                                                                                                                                                                                                                Short stories, five decades / | $c: Irwin Shaw.
## 1394                                                                                                                                                                                                                                                                                                                               Too much flesh and Jabez / | $c: Coleman Dowell.
## 1395                                                                                                                                                                                                                                                                                                                             Dream children : | stories / | $c: by Gail Godwin.
## 1396                                                                                                                                                                                                                                                                                                Modern Korean short stories / | $c: translated by Hyon Joongshik & Han Hakjoon.
## 1397                                                                                                                                                                                                                                                                                                                                              The path to the nest of spiders /
## 1398                                                                                                                                                                                                                                                                                                      On heroes and tombs / | $c: Ernesto Sábato ; translated by Helen R. Lane.
## 1399                                                                                                                                                                                                                                                                                                                                    Loitering with intent / | $c: Muriel Spark.
## 1400                                                                                                                                                                                                                                                                                                                                               The return of Philip Latinovicz,
## 1401                                                                                                                                                                                                                                                  The diary of a young girl; | $c: translated from the Dutch by B. M. Mooyaart-Doubleday, with an introd. by Eleanor Roosevelt.
## 1402                                                                                                                                                                                                                                                                                                                                                The little disturbances of man.
## 1403                                                                                                                                                                                                                                                                                                                        The dean's December : | a novel / | $c: by Saul Bellow.
## 1404                                                                                                                                                                                                                                                                       Five women, | $c: Translated from the German by Eithne Wilkins and Ernst Kaiser. Pref. by Frank Kermode.
## 1405                                                                                                                                                                                                                                                                                                                                                                     The trial.
## 1406                                                                                                                                                                                                                               Two minutes of silence; | selected short stories. | $c: Translated from the Danish by Vera Lindholm Vance, with an introd. by Richard B. Vowles.
## 1407                                                                                                                                                                                                                                                                                                          Iron in the soul. | $c: Translated from the French by Gerard Hopkins.
## 1408                                                                                                                                                                                                                                                                                                                                                               The third ear. -
## 1409                                                                                                                                                                                                                                                                                                Time of silence / | $c: Luis Martin-Santos ; tr. from Spanish by George Leeson.
## 1410                                                                                                                                                                                                                                                                                   The lost steps / | $c: by Alejo Carpentier ; translated from the Spanish by Harriet de Onis.
## 1411                                                                                                                                                                                                                                                                                                                    A horse of another color / | $c: stories by Carolyn Osborn.
## 1412                                                                                                                                                                                                                                                                                                                            The captain's table / | $c: Richard Gordon [pseud.]
## 1413                                                                                                                                                                                                                                                                                                                                                        There goes Davey Cohen.
## 1414                                                                                                                                                                                                           A critical edition of Sir Richard Fanshawe's 1647 translation of Giovanni Battista Guarini's Il pastor fido / | $c: by Walter F. Staton, Jr. and William E. Simeone.
## 1415                                                                                                                                                                                                                                                                                                                                                                The big fellow.
## 1416                                                                                                                                                                                                                                                                                                                             The dance of the wild mouse / | $c: Daniel Panger.
## 1417                                                                                                                                                                                                                                                                                                                                                               Ol' prophet Nat.
## 1418                                                                                                                                                                                                                                                                                                                                                        The frost and the fire.
## 1419                                                                                                                                                                                                                                                                                                                                Pink flannel. | $c: Illustrated by Phil Taylor.
## 1420                                                                                                                                                                                                                                                                                                                                    Caro : | a novel / | $c: by Bernard Packer.
## 1421                                                                                                                                                                                                                                                                                                                                 Miss Brown / | $c: Vernon Lee [i.e. V. Paget].
## 1422                                                                                                                                                                                                                                                                                                                                                     Trumpet for a walled city.
## 1423                                                                                                                                                                                                                                                                                                                          The Bellamy saga : | a novel / | $c: by John Pearson.
## 1424                                                                                                                                                                                                                                                                                                                                   This company of men / | $c: William Pearson.
## 1425                                                                                                                                                                                                                                                                                                                                  Idols on the path | $c: [by] Tsewang Pemba. -
## 1426                                                                                                                                                                                                                                                                                                                                       A house in Peking | $c: by Robert Payne.
## 1427                                                                                                                                                                                                                                                                                                                                                                   Titus alone.
## 1428                                                                                                                                                                                                                                                                                                                                 Major Dane's garden | $c: [by] Margery Perham.
## 1429                                                                                                                                                                                                                                                                                                                       A man in charge : | a novel / | $c: by Morris Philipson.
## 1430                                                                                                                                                                                                                                                                                                                                                             The winter people.
## 1431                                                                                                                                                                                                                                                                                                                                                              The old believer.
## 1432                                                                                                                                                                                                                                                                                                                           The low roads : | a novel / | $c: by Gilbert Phelps.
## 1433                                                                                                                                                                                                                                                                                                                           Pericles on 31st Street / | $c: Harry Mark Petrakis.
## 1434                                                                                                                                                                                                                                                                                                                                      Vida : | a novel / | $c: by Marge Piercy.
## 1435                                                                                                                                                                                                                                                                                                                             Complete works. | $c: Edited by James A. Harrison.
## 1436                                                                                                                                                                                                                Prose romances: The murders in the Rue Morgue and The man that was used up. | $c: Photographic facsim. ed. prepared by George E. Hatvary and Thomas O. Mabbott.
## 1437                                                                                                                                                                                                                                                                                                                                                     The Frederik Pohl omnibus.
## 1438                                                                                                                                                                                                                                                                                                                                               Starburst / | $c: Frederik Pohl.
## 1439                                                                                                                                                                                                                                                                                                                                                    The age of the pussyfoot. -
## 1440                                                                                                                                                                                                                                                                                                                                 Alternating currents / | $c: by Frederik Pohl.
## 1441                                                                                                                                                                                                                                                                                                                                                            The lilywhite boys.
## 1442                                                                                                                                                                                                                                                                                                                  The enigma of Conrad Stone, | $c: by Claude Houghton [pseud.]
## 1443                                                                                                                                                                                                                                                                                                                             The instrument : | a novel / | $c: by John O'Hara.
## 1444                                                                                                                                                                                                                                                                                                      Lovey Childs, a Philadelphian's story : | a novel / | $c: by John O'Hara.
## 1445                                                                                                                                                                                                                                                                                                                                                  The Grand Portage, | a novel.
## 1446                                                                                                                                                                                                                                                                    As far as my feet will carry me / | $c: Josef Martin Bauer ; translated from the German by Lawrence Wilson.
## 1447                                                                                                                                                                                                                                                                                                                                                                 The long view.
## 1448                                                                                                                                                                                                                                                                                                                                                 The solid mandala : | a novel.
## 1449                                                                                                                                                                                                                                                                                           The holy terrors. | With illus. by the author. | $c: Translated by Rosamond Lehmann.
## 1450                                                                                                                                                                                                                                                                                                      Selected short stories. | $c: With an introductory essay by Stefan Zweig.
## 1451                                                                                                                                                                                                                                                                                                                                   Reincarnation in Venice / | $c: Max Ehrlich.
## 1452                                                                                                                                                                                                                                                                                                                      Day of judgment / | $c: Jack Higgins [i.e. H. Patterson].
## 1453                                                                                                                                                                                                                                                                                                           Malone dies, | $c: a novel translated from the French by the author.
## 1454                                                                                                                                                                                                                                                                                                                                             The loved and the lost, | a novel.
## 1455                                                                                                                                                                                                                                                                                                                            The masterpiece. | $c: Translated by Thomas Walton.
## 1456                                                                                                                                                                                                                                                                                                                                        Tombs of blue ice / | $c: by Ron Faust.
## 1457                                                                                                                                                                                            Notes from the underground and The grand inquititor. | $c: With relevant works by Chernyshevsky, Shchedrin, and Dostoevsky. Selection, translation, and introd. by Ralph E. Matlaw.
## 1458                                                                                                                                                                                                                                                                                             The whispering land / | $c: Gerald Durrell ; with illustrations by Ralph Thompson.
## 1459                                                                                                                                                                                                                                                                                                                                                                  The seraglio.
## 1460                                                                                                                                                                                                                                                                                                            The sunflowers, and other stories. | $c: Translated by George Bird.
## 1461                                                                                                                                                                                                                                                                                                                                                             Magnus: | a novel.
## 1462                                                                                                                                                                                                                                                                                                                               Despair : | a novel / | $c: by Vladimir Nabokov.
## 1463                                                                                                                                                                                                                                                                                                                                                   This day's death, | a novel.
## 1464                                                                                                                                                                                                                                                                   Maigret's pipe : | seventeen stories / | $c: by Georges Simenon, translated from the French by Jean Stewart.
## 1465                                                                                                                                                                                                                                                                                                                                                              The human season.
## 1466                                                                                                                                                                                                                                                                                                     Exile and the kingdom. | $c: Translated from the French by Justin O'Brien.
## 1467                                                                                                                                                                                                                                                                           Sri Sumarah, and other stories / | $c: Umar Kayam ; translated from the Indonesian by Harry Aveling.
## 1468                                                                                                                                                                                                                                                                                 One deadly summer / | $c: Sébastien Japrisot [i.e. J. B. Rossi] ; translated by Alan Sheridan.
## 1469                                                                                                                                                                                                                                                                                                                                                    Keep the aspidistra flying.
## 1470                                                                                                                                                                                                                                                                                                              Cosmicomics. | $c: Translated from the Italian by William Weaver.
## 1471                                                                                                                                                                                                                                                                                                                                       Ten North Frederick / | $c: John O'Hara.
## 1472                                                                                                                                                                                                                                                               Mountain standard time: | Main line west, Far from Cibola [and] The common heart. | $c: Introd. by D. W. Brogan.
## 1473                                                                                                                                                                                                                                                                                                                                                     The adventures; | a novel.
## 1474                                                                                                                                                                                                                                                                                                                                      The rich pay late / | $c: by Simon Raven.
## 1475                                                                                                                                                                                                                                                                                                                                                               The godfather. -
## 1476                                                                                                                                                                                                                                                                                                                                                                The dark arena.
## 1477                                                                                                                                                                                                                                                                                                           Land without justice. | $c: Introd. and notes by William Jovanovich.
## 1478                                                                                                                                                                                                                                                                                                                                                    The prisoners of Combine D.
## 1479                                                                                                                                                                                                                                                                                               Thyrza : | a tale / | $c: George Gissing ; edited with an introd. by Jacob Korg.
## 1480                                                                                                                                                                                                                                                                                              Isabel Clarendon; | $c: edited with a critical introduction by Pierre Coustillas.
## 1481                                                                                                                                                                                                                                                                                                                               The midnight plumber / | $c: by Maurice Proctor.
## 1482                                                                                                                                                                                                                                                                                                                                     An accomplished woman / | $c: Nancy Price.
## 1483                                                                                                                                                                                                                                                                                                         Fielding Gray: | the fourth novel of the 'Alms for oblivion' sequence.
## 1484                                                                                                                                                                                                                                                                                                                                                              Seasons of anomy.
## 1485                                                                                                                                                                                                                                                                                                                                              Ship Island, | and other stories.
## 1486                                                                                                                                                                                                                                                                                                                                                              The public image.
## 1487                                                                                                                                                                                                                                                                                                                                                           The tyranny of love.
## 1488                                                                                                                                                                                                                                                                                      The village in the jungle / | $c: Leonard Woolf ; with an introduction by E.F.C. Ludowyk.
## 1489                                                                                                                                                                                                                                                                                                                                               Why I am so beat, | $c: a novel.
## 1490                                                                                                                                                                                                                                                                                                                                           A canticle for Leibowitz: | a novel.
## 1491                                                                                                                                                                                                                                                                                                                      The sleep of reason : | a novel / | $c: by Warren Miller.
## 1492                                                                                                                                                                                                                                                                                                 The last mystery of Edgar Allan Poe : | the Troy dossier / | $c: Manny Meyers.
## 1493                                                                                                                                                                                                                                        Barozzi : | or, The Venetian sorceress : a romance of the sixteenth century / | $c: Catherine Smith ; new introd. by Devendra P. Varma.
## 1494                                                                                                                                                                                                                                                                                                                                             Forget Harry / | $c: Carrie Smith.
## 1495                                                                                                                                                                                                                                                                          The old manor house | $c: [by] Charlotte Smith; edited with an introduction by Anne Henry Ehrenpreis.
## 1496                                                                                                                                                                                                                                                                                                                          The story of the weasel / | $c: by Carolyn Slaughter.
## 1497                                                                                                                                                                                                                                                                                                                                        Lazarus in Vienna / | $c: Alfred Slote.
## 1498                                                                                                                                                                                                                                                                                                                                                             In fear of silence
## 1499                                                                                                                                                                                                                                                                                                                                                         A morning to remember.
## 1500                                                                                                                                                                                                                                                                                                                                                 Some parts in the single life.
## 1501                                                                                                                                                                                                                                                                                                                           The opportunity of a lifetime / | $c: by Emma Smith.
## 1502                                                                                                                                                                                                                                                                                                                                                       Looking for the general.
## 1503                                                                                                                                                                                                                                                                                                                                                    The death of the detective.
## 1504                                                                                                                                                                                                                                                                                                                                                                 The middleman.
## 1505                                                                                                                                                                                                                                                                                 Angel city : | a novel / | $c: by Patrick D. Smith ; ill. and cover design by F. David Hewitt.
## 1506                                                                                                                                                                                                                                                                                                                                                         The collected edition.
## 1507                                                                                                                                                                                                                                                        The lily in the valley. | $c: Translated by Lucienne Hill; with an introd. by Martin Turnell. London, Elek Books [1957]
## 1508                                                                                                                                                                                                                                                                                                                                                       The heart of the matter.
## 1509                                                                                                                                                                                                                                                                                                                                      It's a battlefield / | $c: Graham Greene.
## 1510                                                                                                                                                                                                                                                                                                                                                       The heart of the matter.
## 1511                                                                                                                                                                                                                                                                                                         Doctor Fischer of Geneva : | or, The bomb party / | $c: Graham Greene.
## 1512                                                                                                                                                                                                                                                                                                                                                         The collected edition.
## 1513                                                                                                                                                                                                                                                                                                                                                         The collected edition.
## 1514                                                                                                                                                                                                                                                                                                                                               Travels with my aunt; | a novel.
## 1515                                                                                                                                                                                                                                                                                                                                                     Slammer / | $c: Ben Greer.
## 1516                                                                                                                                                                                                                                                                                                                            The entity : | a novel / | $c: by Frank De Felitta.
## 1517                                                                                                                                                                                                                                                                                                                                                          Shadow of my brother.
## 1518                                                                                                                                                                                                                                                                                                                          Settlers of the marsh. | $c: Introd: Thomas Saunders.
## 1519                                                                                                                                                                                                                                                                                       A search for America; | the odyssey of an immigrant. | $c: Introd.: Stanley E. McMullin.
## 1520                                                                                                                                                                                                                                                                                                                               Fruits of the earth. | $c: Introd.: M. G. Parks.
## 1521                                                                                                                                                                                                                                                                                                                                            The Kiowa / | $c: Elgin Groseclose.
## 1522                                                                                                                                                                                                                                      Tales from the margin. | The selected short stories of Frederick Philip Grove. | $c: Edited, with an introd. and notes, by Desmond Pacey.
## 1523                                                                                                                                                                                       This is Moscow speaking, | and other stories | $c: [by] Yuli Daniel (Nikolai Arzhak); translations by Stuart Hood, Harold Shukman [and] John Richardson, with a foreword by Max Hayward.
## 1524                                                                                                                                                                                                                                                                                                                                             The treatment / | $c: Peter Kocan.
## 1525                                                                                                                                                                                                                                                                                                                                                        The paragon; | a novel.
## 1526                                                                                                                                                                                                                                                                                                                                           Star witness / | $c: Richard Kluger.
## 1527                                                                                                                                                                                                                                                                                                                   Le Mirliton, | a novel based on the life of Aristide Bruant.
## 1528                                                                                                                                                                                                                                                                                                                                                                      Vanished.
## 1529                                                                                                                                                                                                                                                                                         Three novels: Rule golden, Natural state, [and] The dying man | $c: [by] Damon Knight.
## 1530                                                                                                                                                                                                                                                                                                                        Nothing to do with love / | $c: Joyce Reiser Kornblatt.
## 1531                                                                                                                                                                                                                                                                                                                           Close to the village : | [novel] / | $c: John Kolia.
## 1532                                                                                                                                                                                                                                                                                                                                                    The whole world is outside.
## 1533                                                                                                                                                                                                                                                                                                                                                  The revolutionary; | a novel.
## 1534                                                                                                                                                                                                                                                                                                                           Save the whale : | a novel / | $c: by Michael Koepf.
## 1535                                                                                                                                                                                                                                                                                                                                                Mandragon / | $c: R. M. Koster.
## 1536                                                                                                                                                                                                                                                                                                                                                  The studhorse man; | a novel.
## 1537                                                                                                                                                                                                                                                                                                                                  Badlands : | a novel / | $c: Robert Kroetsch.
## 1538                                                                                                                                                                                                                                                                                                                                       The betrayal. | $c: Introd.: S. Warhaft.
## 1539                                                                                                                                                                                                                                                                                                                      But we are exiles : | a novel / | $c: by Robert Kroetsch.
## 1540                                                                                                                                                                                                                                                                        Christmas at Fontaine's : | a novel / | $c: by William Kotzwinkle ; with illustrations by Joe Servello.
## 1541                                                                                                                                                                                                                                                                                                                                                      The dream and the desert.
## 1542                                                                                                                                                                                                                                                                                                         The green house. | $c: Translated from the Spanish by Gregory Rabassa.
## 1543                                                                                                                                                                                                                                                                                                                                                               The pea-pickers.
## 1544                                                                                                                                                                                                                                                                                          Blanket boy, | $c: by Peter Lanham based on an original story by A.S. Mopelli-Paulus.
## 1545                                                                                                                                                                                                                                                                                                        Hurrish / | $c: by Emily Lawless ; with an introd. by Robert Lee Wolff.
## 1546                                                                                                                                                                                                                                                                                                                                                Happiness, | and other stories.
## 1547                                                                                                                                                                                                                                                                                                                                             The great wave, and other stories.
## 1548                                                                                                                                                                                                                                                                                                                                                              Selected stories.
## 1549                                                                                                                                                                                                                                                                                                                                    Envoy to new worlds, | $c: by Keith Laumer.
## 1550                                                                                                                                                                                                                                                                                                                              The house in November; | a science fiction novel.
## 1551                                                                                                                                                                                                                                                                                                                                                               The stone angel.
## 1552                                                                                                                                                                                                                                                                                                                                           Stories. | $c: Edited by Cecil Mann.
## 1553                                                                                                                                                                                                                                                                                            Fifteen stories | $c: [by] Henry Lawson. Selected and introduced by Colin Roderick.
## 1554                                                                                                                                                                                                                                                                                                                                                               The liberty lad.
## 1555                                                                                                                                                                                                                                                                                                                    The deserter / | $c: Douglas LePan ; introd. by F. W. Watt.
## 1556                                                                                                                                                                                                                                                                                                                                                         The great white queen.
## 1557                                                                                                                                                                                                                                                                                                                                             Love or whatever it is; | a novel.
## 1558                                                                                                                                                                                                                                                                                                                                       African stories, | $c: by Doris Lessing.
## 1559                                                                                                                                                                                                                                                                  The everything man; | being an unauthorised account of some incidents in the life of Glenville Rice Sherrard.
## 1560                                                                                                                                                                                                                                                                                                                 The primal yoke, | a novel. | $c: With drawings by the author.
## 1561                                                                                                                                                                                                                                                                                      The Purcell papers / | $c: Joseph Sheridan Le Fanu ; with an introd. by Robert Lee Wolff.
## 1562                                                                                                                                                                                                                                                                                                                                        The passion artist / | $c: John Hawkes.
## 1563                                                                                                                                                                                                                                                                                                                                                                 Small changes.
## 1564                                                                                                                                                                                                                                                                 Beyond recall (Unwiederbringlich) / | $c: Theodor Fontane ; translated with an introduction by Douglas Parmée.
## 1565                                                                                                                                                                                                                                                                                    By nature equal / | $c: Jose Maria Espinas ; translated from the Catalan by Anthony Bonner.
## 1566                                                                                                                                                                                                                                                                              The duke's children. | $c: With a preface by Chauncey B. Tinker. Illustrations by Charles Mozley.
## 1567                                                                                                                                                                                                                                                                                                                                                When Harlie was one; | a novel.
## 1568                                                                                                                                                                                                                                                                                                                                   The conservationist / | $c: Nadine Gordimer.
## 1569                                                                                                                                                                                                                                                                                                                                                           The habit of loving.
## 1570                                                                                                                                                                                                                                                                                                                          Fantastic stories. | $c: Translated from the Russian.
## 1571 Falstaff : | being the Acta domini Johannis Fastolfe, or Life and valiant deeds of Sir John Faustoff, or The hundred days war, as told by Sir John Fastolf, K. G., to his secretaries, William Worcester, Stephen Scrope, Fr Brackley, Christopher Hanson, Luke Nanton, John Bussard, and Peter Basset / | $c: transcribed, arr., and edited in modern spelling by Robert Nye.
## 1572                                                                                                                                                                                                                                                                                                                                                     Merlin / | $c: Robert Nye.
## 1573                                                                                                                                                                                                                                                                                                  Dangerous visions; 33 original stories. | $c: Illus. by Leo and Diane Dillon.
## 1574                                                                                                                                                                                                                                                                                                            Family : | a novel in the form of a memoir / | $c: by Herbert Gold.
## 1575                                                                                                                                                                                                                                                                                                                                    Towards the silver crests of the Himalayas.
## 1576                                                                                                                                                                                                                                                                                                                                     The serpent and the rope / | $c: Raja Rao.
## 1577                                                                                                                                                                                                                                                                                                                  Sadeq Hedayat, an anthology. | $c: edited by Ehsan Yarshater.
## 1578                                                                                                                                                                                                                                                                           The agunah / | $c: by Chaim Grade ; translated from the Yiddish and with an introd. by Curt Leviant.
## 1579                                                                                                                                                                                                                                                                                                                Mirgorod. | $c: Translated with an introd. by David Magarshack.
## 1580                                                                                                                                                                                                                                                                                                                           The well, | a novel. | $c: Translated by Ruth Wisse.
## 1581                                                                                                                                                                                                                                                                                                                           The shrine, and other stories / | $c: by Mary Lavin.
## 1582                                                                                                                                                                                                                                                                                                            Best short stories / | $c: edited with an introd. by Wayne Andrews.
## 1583                                                                                                                                                                                                                                                                                             Drought / | $c: Iwan Simatupang ; translated from the Indonesian by Harry Aveling.
## 1584                                                                                                                                                                                                                                                                                                                                                             Coming up for air.
## 1585                                                                                                                                                                                                                                                                                                                                     Death of a chieftain, | and other stories.
## 1586                                                                                                                                                                                                                                                                                                                                       Less than angels / | $c: by Barbara Pym.
## 1587                                                                                                                                                                                                                                                                                                                   Night at the Mocking Widow, | $c: by Carter Dickson [pseud.]
## 1588                                                                                                                                                                                                                                                                                         The investigation | $c: [by] Stanisław Lem. Translated from the Polish by Adele Milch.
## 1589                                                                                                                                                                                                                                                                     Phineas Redux / | $c: Anthony Trollope, with a preface by R.W. Chapman, illustrations by T.L.B. Huskinson.
## 1590                                                                                                                                                                                                                                                            Invitation to a beheading / | $c: Vladimir Nabokov ; translated by Dmitri Nabokov in collaboration with the author.
## 1591                                                                                                                                                                                                                                                                                                                                      We too are drifting / | $c: Gale Wilhelm.
## 1592                                                                                                                                                                                                                                                                                                                                                             The game of kings/
## 1593                                                                                                                                                                                                                                                                                                        First trilogy: Herself surprised. | To be a pilgrim. The horse's mouth.
## 1594                                                                                                                                                                                                                                                                                                                 The tree of dreams, and other stories / | $c: by Mika Waltari.
## 1595                                                                                                                                                                                                                                                                                            18 stories | $c: [by] Heinrich Böll. Translated from the German by Leila Vennewitz.
## 1596                                                                                                                                                                                                                                                                                                                                   The Mandelbaum gate / | $c: by Muriel Spark.
## 1597                                                                                                                                                                                                                                                                            The steel bird, and other stories / | $c: Vasily Aksenov ; translations by Rae Slonek ... [et al.].
## 1598                                                                                                                                                                                                                                                                                                        The death ship; | the story of an American sailor | $c: [by] B. Traven.
## 1599                                                                                                                                                                                                                                                                                                                                                         Twilight in Djakarta /
## 1600                                                                                                                                                                                                                                                                                                          Antonio in love. | $c: Translated from the Italian by William Weaver.
## 1601                                                                                                                                                                                                                                                                                                                           Lovey, a very special child / | $c: Mary MacCracken.
## 1602                                                                                                                                                                                                                                                                                Woman in two worlds; : | a personal story of psychological experience, / | $c: by Wanda Martin.
## 1603                                                                                                                                                                                                                Fathers and sons ; A nest of the gentry : | novels / | $c: Ivan Turgenev ; [translated from the Russian by Bernard Isaacs ; illustrated by Konstantin Rudakov].
## 1604                                                                                                                                                                                                                                                                                                                                             Masters of the modern short story.
## 1605                                                                                                                                                                                                                                                                                   The clansman; | an historical romance of the Ku Klux Klan. | $c: Introd. by Thomas D. Clark.
## 1606                                                                                                                                                                                                                                                                                                                                    Modern Japanese literature, | an anthology.
## 1607                                                                                                                                                                                                                                                                                                  Midnight / | $c: Mao Tun [i.e. Yen-ping Shên. Translation by Hsu Meng-hsiung]
## 1608                                                                                                                                                                                                                                                                                                                             Darkness at noon. | $c: Translated by Daphne Hardy
## 1609                                                                                                                                                                                                                                                                                                                                    The loneliness of the long-distance runner.
## 1610                                                                                                                                                                                                                                                                                      The portable Conrad. | $c: Edited, and with an introd. and notes, by Morton Dauwen Zabel.
## 1611                                                                                                                                                                                                                                                                                                                                    The iron heel. | $c: Introd. by Max Lerner.
## 1612                                                                                                                                                                                                                                                                                                                                                         Foundation and empire.
## 1613                                                                                                                                                                                                                                                                                        No country without grandfathers / | $c: by Roch Carrier; translated by Sheila Fischman.
## 1614                                                                                                                                                                                                                                                                                                                          One damn thing after another / | $c: Nicolas Freeling
## 1615                                                                                                                                                                                                                                                                                                                             The vengeance and other stories / | $c: Manoj Das.
## 1616                                                                                                                                                                                                                                                                                  The bleaching yard / | $c: Tarjei Vesaas ; translated from the Norwegian by Elizabeth Rokkan.
## 1617                                                                                                                                                                                                                          Threepenny novel / | $c: Bertolt Brecht ; translated by Desmond I. Vesey ; verses translated by Christopher Isherwood ; introduction by John Willett.
## 1618                                                                                                                                                                                                                                                                                              Short stories of Arefin Badal / | $c: translated & compiled by Shehabuddin Ahmad.
## 1619                                                                                                                                                                                                                            The broken sword / | $c: Tolegen Kassymbekov ; [translated from the Russian by David Foreman and Sergei Sosinsky ; illustrated by Nikolai Grishin].
## 1620                                                                                                                                                                                                                                                                                                           Maggie Muggins, or, Spring in Earl's court / | $c: Keith Waterhouse.
## 1621                                                                                                                                                                                                                                                                                                                 The cornet-player who betrayed Ireland / | $c: Frank O'Connor.
## 1622                                                                                                                                                                                                                                                                                                         The best short stories of John Buchan / | $c: edited by David Daniell.
## 1623                                                                                                                                                                                                                                                                                                                             Imago bird : | a novel / | $c: by Nicholas Mosley.
## 1624                                                                                                                                                                                                                                                                           Possessed, or, The secret of Myslotch / | $c: Witold Gombrowicz ; English version by J.A. Underwood.
## 1625                                                                                                                                                                                                                                                                                                                                           Lunatic villas / | $c: Marian Engel.
## 1626                                                                                                                                                                                                                                                                                 Gon̈gu-Hrolfs saga / | $c: translated [from the Icelandic] by Hermann Pálsson and Paul Edwards.
## 1627                                                                                                                                                                                                                                                                                                            I and you and she / | $c: Jara Ribnikar ; translated by Eva Tucker.
## 1628                                                                                                                                                                                                                                           Money for Maria and Borrowed time : | two village tales / | $c: Valentin Rasputin ; translated by Kevin Windle and Margaret Wettlin.
## 1629                                                                                                                                                                                                                                                   The Courtesan's jewel box : | Chinese stories of the Xth-XVIIth centuries / | $c: translated by Yang Xianyi and Gladys Yang.
## 1630                                                                                                                                                                                                                                                                                                                Crisis / | $c: Alias Ali ; translated by Barclay M. Newman, Jr.
## 1631                                                                                                                                                                                                                                                                                                                    Gemini / | $c: Michel Tournier ; translated by Anne Carter.
## 1632                                                                                                                                                                                                                                              Tales from the calendar / | $c: Bertolt Brecht ; the prose translated by Yvonne Kapp ; the verse translated by Michael Hamburger.
## 1633                                                                                                                                                                                                                                                                                                                The air cage. | $c: Translated from the Swedish by Thomas Teal.
## 1634                                                                                                                                                                                                                                                                                                          The price of glory. | $c: Translated and adapted by Willi Frischauer.
## 1635                                                                                                                                                                                                                                                                                        A handful of darkness / | $c: Philip K. Dick ; with a new introd. by Richard A. Lupoff.
## 1636                                                                                                                                                                                                                                                                                                                                                  Hue and cry; | short stories.
## 1637                                                                                                                                                                                                                                                                                                            Frontline report : | a journalist's notebook / | $c: John Burrowes.
## 1638                                                                                                                                                                                                                                                                           Chekhov, the early stories, 1883-88 / | $c: chosen and translated by Patrick Miles & Harvey Pitcher.
## 1639                                                                                                                                                                                                                                                  The king in the golden mask and other writings / | $c: by Marcel Schwob ; selected, translated, and introduced by Iain White.
## 1640                                                                                                                                                                                                                                                                                                                           The merry-go-round in the sea / | $c: Randolph Stow.
## 1641                                                                                                                                                                                                                                                                                                    The samurai : | a novel / | $c: Shusaku Endo ; translated by Van C. Gessel.
## 1642                                                                                                                                                                                                                                                                                                        A washed-out dream / | $c: [compiled and] translated by Kevin O'Rourke.
## 1643                                                                                                                                                                                                                                                  Oranges for the son of Alexander Levy / | $c: Nella Bielski ; translated from the French by John Berger and Lisa Appignanesi.
## 1644                                                                                                                                                                                                                                                                                                  Letter by letter / | $c: Louise Maheux-Forcier ; translated by David Lobdell.
## 1645                                                                                                                                                                                                                                                     Selected stories / | $c: Robert Walser ; with a foreword by Susan Sontag ; translated by Christopher Middleton and others.
## 1646                                                                                                                                                                                                                                                                                                What do you think yourself? : | Scottish short stories / | $c: Naomi Mitchison.
## 1647                                                                                                                                                                                                                                                                                                                                    Against the stream / | $c: by James Hanley.
## 1648                                                                                                                                                                                                                                                                                                         Ethan Frome / | $c: with a forward and a study guide by Helen T. Munn.
## 1649                                                                                                                                                                                                                                                                                                                  The custom of the country; | with an introd. by Blake Nevius.
## 1650                                                                                                                                                                                                                                                                                  The lily in the valley, | $c: translated by Lucienne Hill. With an introd. by Martin Turnell.
## 1651                                                                                                                                                                                                                                                          Complete fairy tales. | $c: Translated from the French by A. E. Johnson and others. With illus. by W. Heath Robinson.
## 1652                                                                                                                                                                                                                                                                                                                           Uncle Tom's cabin. | $c: Introd. by Van Wyck Brooks.
## 1653                                                                                                                                                                                                                                                                                                          The silent witness : | a polygraphist's casebook / | $c: Chris Gugas.
## 1654                                                                                                                                                                                                                   Radical Zen : | the sayings of Jōshū / | $c: translated with a commentary by Yoel Hoffmann ; pref. by Hirano Sōjō ; [cover ill. and design by Karen Becker].
## 1655                                                                                                                                                                                                                                                                                  War with the newts. | $c: Translated by M. & R. Weatherall. With an introd. by Lewis Gannett.
## 1656                                                                                                                                                                                Twenty thousand leagues under the sea. | $c: The English version made from the French by Mercier Lewis, with a new introd. by Fletcher Pratt, and with hand-colored illus. by Edward A. Wilson.
## 1657                                                                                                                                                                                                                                                                                                The portable Chekhov. | $c: Edited, and with an introd., by Avrahm Yarmolinsky.
## 1658                                                                                                                                                                                                                                                                                                      The ice people; | $c: translated from the French by Charles Lam Markmann.
## 1659                                                                                                                                                                                                                                                                                                                                                                A charmed life.
## 1660                                                                                                                                                                                                                                                                                                                       The red pony. | $c: With illustrations by Wesley Dennis.
## 1661                                                                                                                                                                                                                                                                                                  A man / | $c: Oriana Fallaci ; translated from the Italian by William Weaver.
## 1662                                                                                                                                                                                                                                       The islanders / | $c: Evgeny Zamyatin; translated by T.S. Berczynski. Armored-train 14-69 / Vsevolod Ivanov; translated by Frank Miller.
## 1663                                                                                                                                                                                                                                                                                                              The shipyard. | $c: Translated from the Spanish by Rachel Caffyn.
## 1664                                                                                                                                                                                                                                                                       Thirty seconds over New York. | $c: Translated from the French by June P. Wilson and Walter B. Michaels.
## 1665                                                                                                                                                                                                                                                                                                                                                         Spinsters in jeopardy.
## 1666                                                                                                                                                                                                                                                                                                                                                              Hellstrom's Hive.
## 1667                                                                                                                                                                                                                                                                                  Fortress besieged / | $c: by Chʻien Chung-shu ; translated by Jeanne Kelly and Nathan K. Mao.
## 1668                                                                                                                                                                                                                                                                                                                             The dice of war. | $c: Translated by Bernard Wall.
## 1669                                                                                                                                                                                                                                                                          The saint of the atom bomb / | $c: by Josef Schilliger ; translated from the German by David Heimann.
## 1670                                                                                                                                                                                                                                                                                                                                       No sweetness here / | $c: Ama Ata Aidoo.
## 1671                                                                                                                                                                                                                                                                                            Ten steps to hope, | $c: by Rémy [pseud.] Translated from the French by Len Ortzen.
## 1672                                                                                                                                                                                                                                                                                                                                              Eye of cat / | $c: Roger Zelazny.
## 1673                                                                                                                                                                                                                                                                                                                                 The non-existent knight & The cloven viscount.
## 1674                                                                                                                                                                                                                                                              The man without qualities. | $c: Translated from the German and with a foreword by Eithne Wilkins & Ernst Kaiser.
## 1675                                                                                                                                                                                                                                                                                                 Moscow / | $c: by Theodor Plievier; translated from the German by Stuart Hood.
## 1676                                                                                                                                                                                                             Vienna 1900 - games with love and death : | the stories which formed the basis of the TV serial devised and dramatized by Robert Muller / | $c: Arthur Schnitzler.
## 1677                                                                                                                                                                                                                                                                                                                                 Dancers in mourning / | $c: Margery Allingham.
## 1678                                                                                                                                                                                                                                                                                                                                                Players / | $c: by Don DeLillo.
## 1679                                                                                                                                                                                                                                                                                                                                                     The charterhouse of Parma,
## 1680                                                                                                                                                                                                                                                                                                                                       Posthumous pieces | $c: [by] Wei Wu Wei.
## 1681                                                                                                                                                                                                                                                        The travels of Lao Tsʻan / | $c: by Liu Tʻieh-yün (Liu E). Translated from the Chinese and annotated by Harold Shadick.
## 1682                                                                                                                                                                                                                             The new Atlantis and other novellas of science fiction / | $c: by Gene Wolfe, Ursula K. Le Guin, James Tiptree, Jr. ; edited by Robert Silverberg.
## 1683                                                                                                                                                                                                                                                                        Ulhwa, the shaman : | a novel of Korea and three stories / | $c: Kim Tongni; translated by Ahn Junghyo.
## 1684                                                                                                                                                                                                                                                                      Twenty four stories / | $c: by Premchand [i.e. D. R. Srivastava] ; translated by Nandini Nopany & P. Lal.
## 1685                                                                                                                                                                                                                                                                                                                                    Like birds, like fishes, and other stories.
## 1686                                                                                                                                                                                                                                                                                                                                                                   Full circle.
## 1687                                                                                                                                                                                                                                                                                                                      Return to laughter, | $c: by Elenore Smith Bowen [pseud.]
## 1688                                                                                                                                                                                                                                                                             The world of Dunnet Landing, | a Sarah Orne Jewett collection. | $c: Editedby David Bonnell Green.
## 1689                                                                                                                                                                                                                                                                  Remembrance of things past / | $c: Marcel Proust ; translated by C. K. Scott Moncrieff and Terence Kilmartin.
## 1690                                                                                                                                                                                                                                                                  Remembrance of things past / | $c: Marcel Proust ; translated by C. K. Scott Moncrieff and Terence Kilmartin.
## 1691                                                                                                                                                                                                                                                                                                                                       The burnt ones / | $c: by Patrick White.
## 1692                                                                                                                                                                                                                                                                                                                                                         Wonderland; | a novel.
## 1693                                                                                                                                                                                                                                                                                                                                                                  The mischief.
## 1694                                                                                                                                                                                                                                                                                                                                                The bride / | $c: Bapsi Sidhwa.
## 1695                                                                                                                                                                                                                                                                                                  Antar : | a Bedoueen romance (1819) / | $c: [translated] by Terrick Hamilton.
## 1696                                                                                                                                                                                                                                                                                                                                                               The olive grove.
## 1697                                                                                                                                                                                                                                                             The Body and the dream : | French erotic fiction, 1464-1900 / | $c: translated and introduced by Jennifer Birkett.
## 1698                                                                                                                                                                                                                                                                                                                  Scenes from later life : | a novel / | $c: by William Cooper.
## 1699                                                                                                                                                                                                                                                                  The special subunit : | two novellas / | $c: Vadim Kozhevnikov ; [translated from the Russian by Jan Butler].
## 1700                                                                                                                                                                                                                             The best of Roald Dahl : | stories from Over to you, Someone like you, Kiss kiss, Switch bitch / | $c: Roald Dahl ; introduction by James Cameron.
## 1701                                                                                                                                                                                                                                                                                                   Sweet prince : | a novel / | $c: Christer Kihlman ; translated by Joan Tate.
## 1702                                                                                                                                                                                                                                                                                                                                        A place to die / | $c: George Bowering.
## 1703                                                                                                                                                                                                                                                            The Last of the Empire : | a Senegalese novel / | $c: Sembene Ousmane ; translated from the French by Adrian Adams.
## 1704                                                                                                                                                                                                                                                                                                 The children / | $c: Henri Troyat ; translated from the French by Anthea Bell.
## 1705                                                                                                                                                                                                                                                                                           A rare cure / | $c: Benjamin Tammuz ; translated from the Hebrew by Joseph Shachter.
## 1706                                                                                                                                                                                                                                                                House visits : | a collection of short stories / | $c: Hennie Aucamp ; selected and translated by Ian Ferguson.
## 1707                                                                                                                                                                                                                                                                                                                                   The uncle & other stories / | $c: Joan Shaw.
## 1708                                                                                                                                                                                                                                The nightingale echo : | new Soviet stories / | $c: [translated from the Russian by K.M. Cook ; selection and biographical notes by A. Karlin].
## 1709                                                                                                                                                                                                                                                                                       The Stoletov dossier / | $c: Vil Lipatov ; [translated from the Russian by Alex Miller].
## 1710                                                                                                                                                                                                                                                                                       Batouala; | a true Black novel. | $c: [Translated by Barbara Beck and Alexandre Mboukou]
## 1711                                                                                                                                                                                                                                                                                                          The money-order; with, White genesis; | $c: translated by Clive Wake.
## 1712                                                                                                                                                                                                                                                                               Ring roads : | a novel / | $c: Patrick Modiano ; translated from the French by Caroline Hillier.
## 1713                                                                                                                                                                                                                                                                                                                    Mist : | Creature of darkness / | $c: M. T. Vasudevan Nair.
## 1714                                                                                                                                                                                                                                                                                                       Marthanda Varma / | $c: C.V. Raman Pillai ; translated by R. Leela Devi.
## 1715                                                                                                                                                                                                                                                                                                                                         Praxis : | a novel / | $c: Fay Weldon.
## 1716                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 1717                                                                                                                                                                                                                                                                                             Anna Karenina; translated by Constance Garnett, | with an introd. by Henri Troyat.
## 1718                                                                                                                                                                                                                                                                                                                                                             Unancestral voice.
## 1719                                                                                                                                                                                                                       Scenes from the bathhouse, | and other stories of Communist Russia. | $c: Translated, with an introd., by Sidney Monas. Stories selected by Marc Slonim.
## 1720                                                                                                                                                                                                                                                                                                  Tales of Pirx the pilot / | $c: Stanislaw Lem ; translated by Louis Iribarne.
## 1721                                                                                                                                                                                                                                                                                     Rabbits, crabs, etc. : | stories by Japanese women / | $c: translated by Phyllis Birnbaum.
## 1722                                                                                                                                                                                                                                                                                                            The Immoralist / | $c: translated from the French by Dorothy Bussy.
## 1723                                                                                                                                                                                                                                                                                                The moon and the bonfire. | $c: Translated from the Italian by Louise Sinclair.
## 1724                                                                                                                                                                                                                                                                                                                                          A sparrow falls / | $c: Wilbur Smith.
## 1725                                                                                                                                                                                                                                                                                                                              Cold river : | a novel / | $c: by William Judson.
## 1726                                                                                                                                                                                                                                                                                               The palace of shattered vessels / | $c: David Shahar ; translated by Dalya Bilu.
## 1727                                                                                                                                                                                                                                                                                                                                          A wayside tavern / | $c: Norah Lofts.
## 1728                                                                                                                                                                                                                      Twenty years a-growing. | $c: With an introductory note by E. M. Forster. [Translated from the original Irish by Moya Llewelyn Davies and George Thomson]
## 1729                                                                                                                                                                                                                                                                                                                                  The vendor of sweets, | $c: by R. K. Narayan.
## 1730                                                                                                                                                                                                                                                                                                                                             Godric / | $c: Frederick Buechner.
## 1731                                                                                                                                                                                                                                                                                                                     Cast the first stone : | a novel / | $c: by Chester Himes.
## 1732                                                                                                                                                                                                                                                                                           Selected stories of Lu Hsun pseud. | $c: Translated by Yang Hsien-yi and Gladys Yang
## 1733                                                                                                                                                                                                                                                                                                                     The shackle | $c: by Colette. Translated by Antonia White.
## 1734                                                                                                                                                                                                                                                                                                                           Claudine married. | $c: Translated by Antonia White.
## 1735                                                                                                                                                                                                                                                                                                                                    The painter of signs / | $c: R. K. Narayan.
## 1736                                                                                                                                                                                                                                                                                                                                The voyeur. | $f: Translated by Richard Howard.
## 1737                                                                                                                                                                                                                                                                                                                             Zorba the Greek; | $c: translated by Carl Wildman.
## 1738                                                                                                                                                                                                                                                                                                                                  In and out of Never-Never Land; | 22 stories.
## 1739                                                                                                                                                                                                                                                                                                               The tin drum. | $c: Translated from the German by Ralph Manheim.
## 1740                                                                                                                                                                                                                                                                                                                             The housebreaker of Shady Hill, and other stories.
## 1741                                                                                                                                                                                                                                                                                             The shroud and 20 other stories / | $c: [by] Premchand. Translated by Madan Gopal.
## 1742                                                                                                                                                                                                                                                                                                                                                         Stories of a lifetime.
## 1743                                                                                                                                                                                                                                                                                                                                                       The living and the dead.
## 1744                                                                                                                                                                                                                       Faithful Ruslan : | the story of a guard dog / | $c: Georgi Vladimov ; translated from the Russian by Michael Glenny ; with an introd. by Richard Adams.
## 1745                                                                                                                                                                                                                                                                                                                       The family Carnovsky. | $c: Translated by Joseph Singer.
## 1746                                                                                                                                                                                                                                                                                                                                                                Each man's son.
## 1747                                                                                                                                                                                                                                                                                                                              The ivory grin | $c: [by] Ross MacDonald [pseud.]
## 1748                                                                                                                                                                                                                                                                                                      Jeremy Poldark : | a novel of Cornwall, 1790-1791 / | $c: Winston Graham.
## 1749                                                                                                                                                                                                                                                                                                       Water margin. | $c: Written by Shih Nai-an. Translated by J. H. Jackson.
## 1750                                                                                                                                                                                                                                                                                                                             The changeling. | $c: Illustrated by Alton Raible.
## 1751                                                                                                                                                                                                                                                                                                                                   There will be time / | $c: by Poul Anderson.
## 1752                                                                                                                                                                                                                                                                                                                                The merman's children / | $c: by Poul Anderson.
## 1753                                                                                                                                                                                                                                                                                                                     The word for world is forest / | $c: by Ursula K. Le Guin.
## 1754                                                                                                                                                                                                                                                                                                                                    Proteus : | a novel / | $c: by Morris West.
## 1755                                                                                                                                                                                                                                                                                 Midaq Alley, Cairo | $c: [by] Naguib Mahfouz. Translated from the Arabic by Trevor Le Gassick.
## 1756                                                                                                                                                                                                                                                                                                          Cities of the interior / | $c: Anais Nin ; line drawings by Ian Hugo.
## 1757                                                                                                                                                                                                                                                                                                                                          Red dirt marijuana, and other tastes.
## 1758                                                                                                                                                                                                                                                                                                                                      Cock Robin; or A fight for male survival.
## 1759                                                                                                                                                                                                                                                                        A book of short stories, | $c: by Maxim Gorki. Edited by Avrahm Yarmolinsky and Baroness Moura Budberg.
## 1760                                                                                                                                                                                                                                                                                                                                    The middle ground / | $c: Margaret Drabble.
## 1761                                                                                                                                                                                                                                                                                                                                       Creation : | a novel / | $c: Gore Vidal.
## 1762                                                                                                                                                                                                                                                                                         The deeps of deliverance. | $c: Translated from the Netherlandic by Margaret Robinson.
## 1763                                                                                                                                                                                                           The trial. / | $c: Translated from the German by Willa and Edwin Muir; rev., and with additional materials translated by E. M. Butler. Illustrated by George Salter.
## 1764                                                                                                                                                                                                                                                                                                                            Hidden faces. | $c: Translated by Haakon Chevalier.
## 1765                                                                                                                                                                                                                                                                                                                                                                         Steps.
## 1766                                                                                                                                                                                                                                                                                                                                                               Ladders to fire.
## 1767                                                                                                                                                                                                                                                                                                                                                    A spy in the house of love.
## 1768                                                                                                                                                                                                                                                                                                                                                  Lord of the flies, | a novel.
## 1769                                                                                                                                                                                                                                                                                                        The red carnation / | $c: Elio Vittorini ; translated by Anthony Bower.
## 1770                                                                                                                                                                                                                                                                                                         Winter danger / | $c: William O. Steele ; illustrated by Paul Galdone.
## 1771                                                                                                                                                                                                                                                                                        Diary of a Russian schoolteacher; | $c: translated from the Russian by Rose Prokofieva.
## 1772                                                                                                                                                                                                                                                                              The leopard | $c: [by] Giuseppe di Lampedusa. Translated from the Italian by Archibald Colquhoun.
## 1773                                                                                                                                                                           The Russian garland of fairy tales : | being Russian folk legends : translated from a collection of chap-books made in Moscow / | $c: edited by Robert Steele ; illustrations by R. de Rosciszewski.
## 1774                                                                                                                                                                                                                        The death of Mr. Baltisberger, | $c: by Bohumil Hrabal. Translated from the Czech by Michael Heim. Introd. translated from the Czech by Kaca Polackova.
## 1775                                                                                                                                                                                                                                                                    The complete works of Count Tolstoy / | $c: [Translated from the original Russian and edited by Leo Wiener.
## 1776                                                                                                                                                                                                                                                                                 Short stories / | $c: Luigi Pirandello ; selected, translated and introduced by Frederick May.
## 1777                                                                                                                                                                                                                                                                                                                                                           The book of the sea.
## 1778                                                                                                                                                                                                                                                                                      The city and the pillar revised; | including an essay: Sex and the law, and An afterword.
## 1779                                                                                                                                                                                                 Chuckle with Chekhov : | a selection of comic stories / | $c: by Anton Chekhov ; chosen and translated from the Russian by Harvey Pitcher in collaboration with James Forsyth.
## 1780                                                                                                                                                                                                                                                                                                                                                              The wooden horse.
## 1781                                                                                                                                                                                                        Southern mail and | Night flight / Antoine de Saint-Exupéry ; | $c: translated from the French by Curtis Cate ; with acknowledgements to Stuart Gilbert's translations.
## 1782                                                                                                                                                                                                                                                                            The Yeshiva / | $c: by Chaim Grade ; translated from the Yiddish, with an introd., by Curt Leviant.
## 1783                                                                                                                                                                                                                                                                                                                              The magic striptease | $c: [by] George Garrett. -
## 1784                                                                                                                                                                                                                                                                                                                                                    Go tell it on the mountain.
## 1785                                                                                                                                                                                                                                                                                            Young Törless; | $c: translated from the German by Eithne Wilkins and Ernst Kaiser.
## 1786                                                                                                                                                                                                                                                                                                                                  The rice-sprout song / | $c: by Eileen Chang.
## 1787                                                                                                                                                                                                                                   Old-new land (Altneuland) | $c: Translated from the original German with rev. notes by Lotta Levensohn. With a new pref. by Emanuel Neumann.
## 1788                                                                                                                                                                                                                                                                                                                                     The Roman enigma / | $c: Walter F. Murphy.
## 1789                                                                                                                                                                                                                                                                                       Brave new world / | $c: with a foreword by the author and an introd. by Charles J. Rolo.
## 1790                                                                                                                                                                                                                                                                                                                                                               The onion field.
## 1791                                                                                                                                                                                                                                                                                                                                                                        Kokoro.
## 1792                                                                                                                                                                                                                                                                                                      Selected satires of Lucian. | $c: Edited and translated by Lionel Casson.
## 1793                                                                                                                                                                                                                                                             Ripening : | selected work, 1927-1980 / | $c: Meridel Le Sueur ; edited and with an introduction by Elaine Hedges.
## 1794                                                                                                                                                                                                                                                                                                  I am a cat / | $c: Sōseki Natsume ; translated by Aiko Itō and Graeme Wilson.
## 1795                                                                                                                                                                                                                                                                                                       To the end of the world. | $c: Translated from the French by Alan Brown.
## 1796                                                                                                                                                                                                                                                                                                                                                                     The magus.
## 1797                                                                                                                                                                                                                                                                                                         Moravagine: | a novel; | $c: translated from the French by Alan Brown.
## 1798                                                                                                                                                                                                                                                                                                                          Mine boy. | $c: With an introd. by Charles R. Larson.
## 1799                                                                                                                                                                                                                                                                                                                                        The dragon lord / | $c: by David Drake.
## 1800                                                                                                                                                                                                                                                                   São Bernardo : | a novel / | $c: Graciliano Ramos ; translated from the Portuguese by R. L. Scott-Buccleuch.
## 1801                                                                                                                                                                                                                                                                                                            Where the air is clear, | a novel. | $c: Translated by Sam Hileman.
## 1802                                                                                                                                                                                                                                                                                        In plain Russian : | stories / | $c: Vladimir Voinovich ; translated by Richard Lourie.
## 1803                                                                                                                                                                                                                                                                            Animal farm : | a fairy story / | $c: by George Orwell ; illustrated by Joy Batchelor & John Halas.
## 1804                                                                                                                                                                                                                                 Volsunga saga: | the story of the Volsungs and Niblungs. | $c: Translated by William Morris. With an introd. and glossary by Robert W. Gutman.
## 1805                                                                                                                                                                                                                                                               The life and adventures of Martin Chuzzlewit. | $c: With 40 illus. by 'Phiz' and an introd. by Geoffrey Russell.
## 1806                                                                                                                                                                                                                                                                     Widow, nun and courtesan; | three novelettes from the Chinese, | $c: translated and adapted by Lin Yutang.
## 1807                                                                                                                                                                                                                                                                                                                                           Old people and the things that pass.
## 1808                                                                                                                                                                                                                                                                                                                                          The lively anatomy of God; | stories.
## 1809                                                                                                                                                                                                                                                                                  Memoirs of a good-for-nothing | $c: [by] Joseph von Eichendorff; translated by Ronald Taylor.
## 1810                                                                                                                                                                                                                                                                                                                     Best short stories. | With an introd. by James T. Farrell.
## 1811                                                                                                                                                                                                                                                                                                                        The Knightly Quest: | a novella & twelve short stories.
## 1812                                                                                                                                                                                                                                                               The adventures of Gurudeva, and other stories / | $c: [by] Seepersad Naipaul ; with a foreword by V. S. Naipaul.
## 1813                                                                                                                                                                                                                                                                                                                                          Silver's city / | $c: Maurice Leitch.
## 1814                                                                                                                                                                                                                                                                     Catastrophe: | the strange stories of Dino Buzzati; | $c: translations by Judith Landry and Cynthia Jolly.
## 1815                                                                                                                                                                                                                                                                                                                                 The beginning place / | $c: Ursula K. Le Guin.
## 1816                                                                                                                                                                                                                                                                                                                                                  When the kissing had to stop.
## 1817                                                                                                                                                                                                                                                                                             Selected stories of Sholom Aleichem, pseud. | $c: With an introd. by Alfred Kazin.
## 1818                                                                                                                                                                                                                                                                                                        The woman who had two navels : | a Filipino novel / | $c: Nick Joaquim.
## 1819                                                                                                                                                                                                                                                                     Candide, Zadig, and selected stories / | $c: Voltaire ; translated and with an introd. by Donald M. Frame.
## 1820                                                                                                                                                                                                                                                                                                                                                           Casualties of peace.
## 1821                                                                                                                                                                                                                                                                                                                             Girls in their married bliss / | $c: Edna O'Brien.
## 1822                                                                                                                                                                                                                                                                                                                                           August is a wicked month, | a novel.
## 1823                                                                                                                                                                                                                                                                                Short novels and stories | $c: [by] A. P. Chekhov. Translated from the Russian by Ivy Litvinov.
## 1824                                                                                                                                                                                                                                                                          Selected prose; | $c: translated by Mary Hottinger and Tania & James Stern. Introd. by Hermann Broch.
## 1825                                                                                                                                                                                                                               The chronicle of the Cid. | $c: Translated from the Spanish by Robert Southey. With an introd. by V. S. Pritchett and illus. by René Ben Sussan.
## 1826                                                                                                                                                                                                                                                                                                                            Early in the summer of 1970 / | $c: A. B. Yehoshua.
## 1827                                                                                                                                                                                                                                                                                                                                    Stories. | $c: Translated by Antonia White.
## 1828                                                                                                                                                                                                                                                                                                            Coronation/ | $f: Translated from the Spanish by Jocasta Goodwin. -
## 1829                                                                                                                                                                                                                                                                                                                      Famous Chinese short stories, | $c: retold by Lin Yutang.
## 1830                                                                                                                                                                                                                                                                                                                                                         The collected edition.
## 1831                                                                                                                                                                                                                                                                                                              The thief / | $c: by Leonid Leonov ; translated by Hubert Butler.
## 1832                                                                                                                                                                                                                   The castle. | $c: Definitive ed. Translated from the German by Willa and Edwin Muir, with additional material translated by Eithne Wilkins and Ernst Kaiser.
## 1833                                                                                                                                                                                                                                                                                                                                                                         Works.
## 1834                                                                                                                                                                                                           Auschwitz inferno : | the testimony of a Sonderkommando / | $c: Filip Müller ; literary collaboration by Helmut Freitag ; edited and translated by Susanne Flatauer.
## 1835                                                                                                                                                                                                                                                                       The first circle | $c: [by] Aleksandr I. Solzhenit͡syn. Translated from the Russian by Thomas P. Whitney.
## 1836                                                                                                                                                                                                                                                                                                    The complete poetry. | $c: Translated, with an introd., by Frank O. Copley.
## 1837                                                                                                                                                                                                                                                            The tale of Genji : | a novel in six parts / | $c: by Lady Murasaki ; translated from the Japanese by Arthur Waley.
## 1838                                                                                                                                                                                                                                                                                                                                         Sinning with Annie, and other stories.
## 1839                                                                                                                                                                                                                                                                                                                    Malevil. | $c: Translated from the French by Derek Coltman.
## 1840                                                                                                                                                                                                                                                                                                                                                                    Hurry home.
## 1841                                                                                                                                                                                                                                                                       The centenary edition of the works of Nathaniel Hawthorne / | $c: [editors, William Charvat ... et al.].
## 1842                                                                                                                                                                                                                                                                       The centenary edition of the works of Nathaniel Hawthorne / | $c: [editors, William Charvat ... et al.].
## 1843                                                                                                                                                                                                                                                                                              The man of property / | $c: John Galsworthy ; with an introduction by Ivor Brown.
## 1844                                                                                                                                                                                                                                                                                         Leaf storm, and other stories. | $c: Translated from the Spanish by Gregory Rabassa. -
## 1845                                                                                                                                                                                                                                                                                                                                                                     Prisons. -
## 1846                                                                                                                                                                                                                                                                                                                                            St. Urbain's horseman; | a novel. -
## 1847                                                                                                                                                                                                  The castle. | $c: Translated from the German by Willa and Edwin Muir, with additional materials translated by Eithne Wilkins and Ernst Kaiser. With an homage by Thomas Mann.
## 1848                                                                                                                                                                                                                      The story of the seven princesses / | $c: [by] Nizami ; [translated from the Persian and edited by R. Gelpke ; English version by Elsie and George Hill].
## 1849                                                                                                                                                                                                                                                                                                          The pilgrim / | $c: by Iwan Simatupang ; translated by Harry Aveling.
## 1850                                                                                                                                                                                                                                                                                                                                      Fairoaks : | a novel / | $c: Frank Yerby.
## 1851                                                                                                                                                                                                                                                                                                                               Beasts of the southern wild | and other stories.
## 1852                                                                                                                                                                                                                                                                                                                          Claudine in Paris, | $c: translated by Antonia White.
## 1853                                                                                                                                                                                                                                                                                                                                                       A ripple from the storm.
## 1854                                                                                                                                                                                                                                                                                                                                                       A ripple from the storm.
## 1855                                                                                                                                                                                                                                                                                                                          The story of a non-marrying man, | and other stories.
## 1856                                                                                                                                                                                                                                                                               Satan, his psychotherapy and cure by the unfortunate Dr. Kassler, J.S.P.S. / | $c: Jeremy Leven.
## 1857                                                                                                                                                                                                                                                                                                                                                    Flight from a dark equator.
## 1858                                                                                                                                                                                                                                                                                                                                                    The tenth year of the ship.
## 1859                                                                                                                                                                                                                                                                                                                                                                           Eva.
## 1860                                                                                                                                                                                                                                                                                                                                                                     The limit.
## 1861                                                                                                                                                                                                                                                               The little Ottleys: | Love's shadow. Tenterhooks. Love at second sight. | $c: With a foreword by Celia MacInnes.
## 1862                                                                                                                                                                                                                                                                                                                                                    Eric | $c: [by] Doris Lund.
## 1863                                                                                                                                                                                                                                                                               The gambler, Bobok [and] A nasty story; | $c: translated with an introduction by Jessie Coulson.
## 1864                                                                                                                                                                                                                                                                            The master and Margarita, | $c: by Mikhail Bulgakov. Translated from the Russian by Mirra Ginsburg.
## 1865                                                                                                                                                                                                                                                                                                             The forgotten soldier. | Translated from the French by Lily Emmet.
## 1866                                                                                                                                                                                                                                                                                                       The Decameron. | $c: Introd. by Edward Hutton. [Translated by J.M. Rigg]
## 1867                                                                                                                                                                                                                                                                                                                                                               The malefactors.
## 1868                                                                                                                                                                                                                                            The moon and the bonfires / | $c: Cesare Pavese ; translated from the Italian by Marianne Ceconi ; with a foreword by Paolo Milano.
## 1869                                                                                                                                                                                                                                                                                                           Warleggan : | a novel of Cornwall, 1792-1793 / | $c: Winston Graham.
## 1870                                                                                                                                                                                                                                                                                               Ah Q and others; | selected stories of Lusin. | $c: Translated by Chi-chen Wang.
## 1871                                                                                                                                                                                                                                                                                                                        The greatest crime : | a novel / | $c: by Sloan Wilson.
## 1872                                                                                                                                                                                                                                                                                                                                                           The sirens of Titan.
## 1873                                                                                                                                                                                                                                                                                                                                                                      Madhouse.
## 1874                                                                                                                                                                                                                                                                                                     Ralph the heir / | $c: by Anthony Trollope ; with 12 ill. by F. A. Fraser.
## 1875                                                                                                                                                                                                                                                  The twelve chairs, | $c: by Ilf & Petrov. Translated from the Russian by John H. C. Richardson. Introd. by Maurice Friedberg.
## 1876                                                                                                                                                                                                                                                                                                                                                        Daughter of the legend.
## 1877                                                                                                                                                                                                                                                                                                                                                           Come, gentle spring.
## 1878                                                                                                                                                                                                                                                                                                                               Powers of attorney / | $c: by Louis Auchincloss.
## 1879                                                                                                                                                                                                                                                                                                    This Sunday. | $c: Translated from the Spanish by Lorraine O'Grady Freeman.
## 1880                                                                                                                                                                                                                                            Touch the water, touch the wind / | $c: Amos Oz ; translated from the Hebrew by Nicholas de Lange in collaboration with the author.
## 1881                                                                                                                                                                                                                                                                                                                The price of salt / | $c: by Claire Morgan [i.e. P. Highsmith].
## 1882                                                                                                                                                                                                                                                                                 More Roman tales, | $c: by Alberto Moravia [pseud.] Selected and translated by Angus Davidson.
## 1883                                                                                                                                                                                                                                                                        Lady Godiva, and other stories / | $c: Alberto Moravia ; translated from the Italian by Angus Davidson.
## 1884                                                                                                                                                                                                                                                                                                         Adam resurrected. | $c: Translated from the Hebrew by Seymour Simckes.
## 1885                                                                                                                                                                                                                                The "cultural revolution" : | a close-up : an eyewitness account / | $c: A. Zhelokhovtsev ; [translated from the Russian by Galina Sdobnikova].
## 1886                                                                                                                                                                                                                                                                                         The Issa Valley / | $c: Czeslaw Milosz ; translated from the Polish by Louis Iribarne.
## 1887                                                                                                                                                                                                                                        Crime and punishment / | $c: translated from the Russian by Constance Garnett ; introd. by Clefton Fadiman ; illus. by Benjamin Kopman.
## 1888                                                                                                                                                                                                                                                                                                                                                        More pricks than kicks.
## 1889                                                                                                                                                                                                                                                                                                       The Continental Op. | $c: Selected and with an introd. by Steven Marcus.
## 1890                                                                                                                                                                                                                                                                                                                                The war between the Tates / | $c: Alison Lurie.
## 1891                                                                                                                                                                                                                                                                                                                                       In iron years / | $c: Gordon R. Dickson.
## 1892                                                                                                                                                                                                                                                                                                                                                       Know nothing, | a novel.
## 1893                                                                                                                                                                                                                                                                                                                          Where late the sweet birds sang / | $c: Kate Wilhelm.
## 1894                                                                                                                                                                                                                                                                                                                                     The Megstone plot | $c: [by] Andrew Garve.
## 1895                                                                                                                                                                                                                                                                                                Jude the obscure. | $c: Introd. by Terry Eagleton, with notes by P. N. Furbank.
## 1896                                                                                                                                                                                                                                                                                                                                                   Oh! / | $c: by Mary Robison.
## 1897                                                                                                                                                                                 The counterfeiters; | with Journal of The counterfeiters. | $c: The novel translated from the French by Dorothy Bussy; the Journal translated from the French and annotated by Justin O'Brien.
## 1898                                                                                                  Buddenbrooks. | $c: Translated from the German by H. T. Lowe-Porter. Together with Lübeck as a way of life and thought; a lecture delivered by the author on June 5, 1926, on the 700th anniversary of its founding. Translated from the German by Richard and Clara Winston.
## 1899                                                                                                                                                                                                                                                                                                                                                                Home to Harlem.
## 1900                                                                                                                                                                                                                                                                                 Tara͡s Bulba, | the classic epic of the Ukrainian Cossacks. | $c: Edited by Andrew Gregorovich.
## 1901                                                                                                                                                                                                                                            Look homeward, angel; | a story of the buried life. | $c: Illustrated by Douglas W. Gorsline, with an intro. by Maxwell E. Perkins.
## 1902                                                                                                                                                                                                                                                                                  The sword of Aldones / | $c: Marion Zimmer Bradley ; with a new introd. by Richard A. Lupoff.
## 1903                                                                                                                                                                                                                     Hāji Āghā : | portrait of an Iranian confidence man / | $c: by Sādeq Hedāyat ; translated by G. M. Wickens ; introd. by Lois Beck ; [artwork by Eje Wray].
## 1904                                                                                                                                                                                                                                                                                                                                                                Scoop, a novel.
## 1905                                                                                                                                                                                                                                                                                                              The ugupu bird; | $c: translated from the Polish by Konrad Syrop.
## 1906                                                                                                                                                                                                                                                                                                                 Pornografia: | a novel; | $c: translated by Alastair Hamilton.
## 1907                                                                                                                                                                                                                                                                                                                                     The sowers, | $c: by Henry Seton Merriman.
## 1908                                                                                                                                                                                                                                                                                                                            The shipkiller : | a novel / | $c: by Justin Scott.
## 1909                                                                                                                                                                                                                                                                                                                                                      The corrida at San Feliu.
## 1910                                                                                                                                                                                                                                                                                                                    The clairvoyant goat, and other stories / | $c: Hal Porter.
## 1911                                                                                                                                                                                                                                                                                                                                                                 Maiden Castle.
## 1912                                                                                                                                                                                                                                                                                                                                                                   The inmates.
## 1913                                                                                                                                                                                                                                                                                                                                                                   Wolf Solent.
## 1914                                                                                                                                                                                                                                                                                                                                                       What's become of Waring.
## 1915                                                                                                                                                                                                                                                                                                                                                                     Venusberg.
## 1916                                                                                                                                                                                                                                                                                                                                                       What's become of Waring.
## 1917                                                                                                                                                                                                                                                                                                                                                            The thousand fires.
## 1918                                                                                                                                                                                                                                                                                                                                                                  Winged seeds.
## 1919                                                                                                                                                                                                                                                                                                                                                              Working bullocks.
## 1920                                                                                                                                                                                                                                                                            N'goola, and other stories / | $c: by Katharine Susannah Prichard ; illustrations by Noel Counihan.
## 1921                                                                                                                                                                                                                                                                                                                                                                  The pioneers.
## 1922                                                                                                                                                                                                                                                                                                                                                          The buffalo soldiers.
## 1923                                                                                                                                                                                                                                                                                                All that false instruction : | a novel of lesbian love / | $c: Elizabeth Riley.
## 1924                                                                                                                                                                                                                                                                                                                                                          Passages : | a novel.
## 1925                                                                                                                                                                                                                                                                                                                     Gargantua and Pantagruel ... | $c: [by] François Rabelais.
## 1926                                                                                                                                                                                                                                                                                                                             Tidefall : | a novel / | $c: by Thomas H. Raddall.
## 1927                                                                                                                                                                                                                               The Italian. | or, The confessional of the Black Penitents: a romance | $c: [by] Ann Radcliffe; edited with an introduction by Frederick Garber.
## 1928                                                                                                                                                                                                                                                                                                                                                   Reflex / | $c: Dick Francis.
## 1929                                                                                                                                                                                                                                                                                   The history of Sir Charles Grandison; | $c: edited with an introduction by Joselyn Harris. -
## 1930                                                                                                                                                                                                                                                                                                           Lives of short duration : | a novel / | $c: by David Adams Richards.
## 1931                                                                                                                                                                                                                                                                                                                                           Holy secrets / | $c: Richard Rhodes.
## 1932                                                                                                                                                                                                                                                                                                                                                            A woman of Bangkok,
## 1933                                                                                                                                                                                                                                                                                                                                                 The acrobat and other stories.
## 1934                                                                                                                                                                                                                                                                                                                         Son of a smaller hero. | $c: Introd.: George Woodcock.
## 1935                                                                                                                                                                                                                                                                                                                                The light in the forest / | $c: Conrad Richter.
## 1936                                                                                                                                                                                                                                                                                                                                  The dark peninsula / | $c: [John J. Riordan].
## 1937                                                                                                                                                                                                                                                                                                                                                             The right trumpet.
## 1938                                                                                                                                                                                                                                                                                                                                               Rocking / | $c: Rosalind Wright.
## 1939                                                                                                                                                                                                                                                                                                                             This child's gonna live, | $c: by Sarah E. Wright.
## 1940                                                                                                                                                                                                                                                                                                                                                  The winter after this summer.
## 1941                                                                                                                                                                                                                                                                                                                                                                    Edens lost.
## 1942                                                                                                                                                                                                                                                                                                                                                            Parktilden Village.
## 1943                                                                                                                                                                                                                                                                                                                                         Among the Dangs : | ten short stories.
## 1944                                                                                                                                                                                                                                                                                                                                                                 Vietnam nurse.
## 1945                                                                                                                                                                                                                                                                                                                                                          The Dick Gibson show.
## 1946                                                                                                                                                                                                                                                                                               Stanley Elkin's greatest hits / | $c: Stanley Elkin ; foreword by Robert Coover.
## 1947                                                                                                                                                                                                                                                                                                                                        One basket; | thirty-one short stories.
## 1948                                                                                                                                                                                                                                                           Samskara = | A rite for a dead man / | $c: a translation of U. R. Anantha Murthy's Kannada novel by A. K. Ramanujan.
## 1949                                                                                                                                                                                                                                                                                                                                            Going / | $c: Sumner Locke Elliott.
## 1950                                                                                                                                                                                                                                                                                                                             The man who got away / | $c: Sumner Locke Elliott.
## 1951                                                                                                                                                                                                                                                                                                                                                       Praise the human season.
## 1952                                                                                                                                                                                                                                                           Nicholas Crabbe; | or, The one and the many, a romance, | by Fr. Rolfe (Baron Corvo) With an introd. by Cecil Woolf.
## 1953                                                                                                                                                                                                                                                                                                                                                                The gasteropod.
## 1954                                                                                                                                                                                                                                                                                                                              On Spider Creek :a novel / | $c: by Robert Roper.
## 1955                                                                                                                                                                                                                                                                                                       The confession of a child of the century by Samuel Heather; | a novel. -
## 1956                                                                                                                                                                                                                                                                                                                                        Nine months in the life of an old maid.
## 1957                                                                                                                                                                                                                                                                                                                                             Crossings | $c: [by] Earl Rovit. -
## 1958                                                                                                                                                                                                                                                                                                                              The delectable mountains, | and other narratives.
## 1959                                                                                                                                                                                                                                                                                                                                                        The sword of the golem.
## 1960                                                                                                                                                                                                                                                                                                                                                       The shame of our wounds.
## 1961                                                                                                                                                                                                                                                                                                                                                                      The orgy.
## 1962                                                                                                                                                                                                                                                                                                                                         Favours : | a novel by Bernice Rubens.
## 1963                                                                                                                                                                                                                                                                                                                         Something of value. | $c: Drawings by Daniel Schwartz.
## 1964                                                                                                                                                                                                                                                                                                                                          Top of the world / | $c: Hans Ruesch.
## 1965                                                                                                                                                                                                                                                                                     Clancy, my friend, my friend: | a picaresque story of the thirties down the Old Kent Road.
## 1966                                                                                                                                                                                                            Princess Pamela : | being the personal journal of Miss Pamela Summerfield of Berkeley Square, Mayfair, London / | $c: edited, and with an afterword by Ray Russell.
## 1967                                                                                                                                                                                                                                                                                                                      The day in shadow; | a novel | $c: [by] Nayantara Sahgal.
## 1968                                                                                                                                                                                                                                                                                                                                        A small fire / | $c: by Gladys Schmitt.
## 1969                                                                                                                                                                                                                                                                                                                        The Nightclerk : | being his perfectly true confession.
## 1970                                                                                                                                                                                                                                                                                                                                                            The gentle infidel.
## 1971                                                                                                                                                                                                                                                                                                                               The fell of dark | $c: [by] James Norman [pseud.
## 1972                                                                                                                                                                                                                                                                                                                                            The Islar, a narrative of Lang III.
## 1973                                                                                                                                                                                                                                                                                                                                                       Faithful are the wounds.
## 1974                                                                                                                                                                                                                                                                                                                                                                  War memorial.
## 1975                                                                                                                                                                                                                                                                                                                                                                Half moon haven
## 1976                                                                                                                                                                                                                                                                                                                     "---and ladies of the club" / | $c: Helen Hooven Santmyer.
## 1977                                                                                                                                                                                                                                                                                                                    The laughing matter : | a novel / | $c: by William Saroyan.
## 1978                                                                                                                                                                                                                                                                                                                                      The vertical ladder, | and other stories.
## 1979                                                                                                                                                                                                                                                                                           Son of the gamblin' man : | the youth of an artist : a novel / | $c: by Mari Sandoz.
## 1980                                                                                                                                                                                                                                                                                                                                         Slogum House / | $c: [by] Mari Sandoz.
## 1981                                                                                                                                                                                                                                                                                                                  Freezing down. | $c: Translated from the Danish by Joan Tate.
## 1982                                                                                                                                                                               The complete works of Homer : | the Iliad / | $c: translated by Andrew Lang, Walter Leaf and Ernest Myers ; The Odyssey, translated by S.H. Butcher and Andrew Lang ; introd. by Gilbert Highet.
## 1983                                                                                                                                                                                                                                                                                              Vlemk, the box-painter / | $c: by John Gardner ; illustrated by Catherine Kanner.
## 1984                                                                                                                                                                                                                                                                                                                     Briefing for a descent into Hell | $c: [by] Doris Lessing.
## 1985                                                                                                                                                                                                                                                                   Death on the installment plan, | $c: by Louis-Ferdinand Céline. Translated from the French by Ralph Manheim.
## 1986                                                                                                                                                                                                                                                                                                                                           I sing the body electric! | Stories.
## 1987                                                                                                                                                                                                                                                         The werewolf; | Varulven. | $c: Translated from the Norwegian by Gustaf Lannestock. With an introd. by Harald S. Næss.
## 1988                                                                                                                                                                                                                                                                         Solaris. | $c: Translated from the French by Joanna Kilmartin and Steve Cox. Afterword by Darko Suvin.
## 1989                                                                                                                                                                                                                                                                                And never said a word / | $c: by Heinrich Böll ; translated from the German by Leila Vennewitz.
## 1990                                                                                                                                                                                                                                                                                                                                                         The place of the lion.
## 1991                                                                                                                                                                                                                                                                                                                                      Other people's houses / | $c: Lore Segal.
## 1992                                                                                                                                                                                                                                                                                   The red room: | scenes of artistic and literary life; | $c: translated by Elizabeth Sprigge.
## 1993                                                                                                                                                                                                                                                                                         The man who fell to Earth / | $c: Walter Tevis ; with a new introd. by Norman Spinard.
## 1994                                                                                                                                                                                                                                                                                                     The confidence man: | his masquerade; | $c: edited by Elizabeth S. Foster.
## 1995                                                                                                                                                                                                                                                                                             Thousand cranes / | $c: Yasunari Kawabata ; translated by Edward G. Seidensticker.
## 1996                                                                                                                                                                                                                                                                                                              The fugitive mind : | the early development of an autistic child.
## 1997                                                                                                                                                                                                                                                                 The betrothed; | a novel, | $c: by Sarat Chandra Chattopadhyay. Translated from Bengali by Sachindralal Ghosh.
## 1998                                                                                                                                                                                                                                                                    Childhood, boyhood and youth. | $c: Translated by Louise and Aylmer Maude. With an introd. by Aylmer Maude.
## 1999                                                                                                                                                                                                                                                                                                                                              The wars / | $c: Timothy Findley.
## 2000                                                                                                                                                                                                                                                                                                                      Famous last words : | a novel / | $c: by Timothy Findley.
## 2001                                                                                                                                                                                                                                                                                                                                                          The butterfly plague.
## 2002                                                                                                                                                                                                                                                                                                                           Back to China, | a novel | $c: by Leslie A. Fiedler.
## 2003                                                                                                                                                                                                                                                                                                                                              The second Stone; | a love story.
## 2004                                                                                                                                                                                                                                                                                                                                      At Freddie's / | $c: Penelope Fitzgerald.
## 2005                                                                                                                                                                                                                                                                                                                                                      In the bunker; | a novel.
## 2006                                                                                                                                                                                                                                                                                                                       The cubical city. | $c: With an afterword by the author.
## 2007                                                                                                                                                                                                                                                                                   Mosquitoes : | a novel / | $c: by William Faulkner ; with an introduction by Richard Hughes.
## 2008                                                                                                                                                                                                                                                                                                                                                                   The mansion.
## 2009                                                                                                                                                                                                                                                                                                                        The violins of Saint-Jacques: | a tale of the Antilles.
## 2010                                                                                                                                                                                                                                                                                               Destiny; or, The Chief's daughter. | $c: Edinburgh ed. London, R. Bentley, 1882.
## 2011                                                                                                                                                                                                                                                                                                                                                       The story of Lola Gregg.
## 2012                                                                                                                                                                                                                                                                                        Flags in the dust / | $c: William Faulkner ; edited and with an introd. by Douglas Day.
## 2013                                                                                                                                                                                                                                                                  Sanctuary : | the original text / | $c: William Faulkner ; edited, with an afterword and notes, by Noel Polk.
## 2014                                                                                                                                                                                                                                                                                                                                              Uncle Willy, | and other stories.
## 2015                                                                                                                                                                                                                                                                                                                                                                 Soldier's pay.
## 2016                                                                                                                                                                                                                                                                                                                                      A star in the family / | $c: Irvin Faust.
## 2017                                                                                                                                                                                                                                                                                                                                                         Passport for Jennifer.
## 2018                                                                                                                                                                                                                                                                                                                              Tomboy. | $c: With an introd. by Fredric Wertham.
## 2019                                                                                                                                                                                                                                                                                                                                       Lilo's dairy, | $c: by Richard M. Elman.
## 2020                                                                                                                                                                                                                                                                                                        Alone against tomorrow; | stories of alienation in speculative fiction.
## 2021                                                                                                                                                                                                                                                                                                                             The 28th day of Elul, | $c: [by] Richard M. Elman.
## 2022                                                                                                                                                                                                                                                                                                                             Summer ends now : | stories / | $c: by John Emery.
## 2023                                                                                                                                                                                                                                                                                                                                                            No clouds of glory.
## 2024                                                                                                                                                                                                                                                                                                                                          Doublefields; | memories and stories.
## 2025                                                                                                                                                                                                                                                                                                                                                             Train to Pakistan.
## 2026                                                                                                                                                                                                                                                                                                                                                                Divided heaven.
## 2027                                                                                                                                                                                                                                                                                                                                      Long after midnight / | $c: Ray Bradbury.
## 2028                                                                                                                                                                                                                                                                                                                                      Some came running / | $c: by James Jones.
## 2029                                                                                                                                                                                                                                                                                                      East of the sun and west of the moon; | $c: illustrated by Hedvig Collin.
## 2030                                                                                                                                                                                                                                                                                                                                  Dance of the happy shades, and other stories.
## 2031                                                                                                                                                                                                                                                                                       Adam, and, The train: | two novels. | $c: Translated from the German by Leila Vennewitz.
## 2032                                                                                                                                                                                                                                                                                                                                                            Decision at Delphi.
## 2033                                                                                                                                                                                                                                                                                                                                             Saturday night and Sunday morning.
## 2034                                                                                                                                                                                                                                                                                                                             Seven tears for Apollo / | $c: Phyllis A. Whitney.
## 2035                                                                                                                                                                                                                                                            The Venus of Ille and other stories / | $c: Prosper Mérimée ; translated by Jean Kimber, introduced by A. W. Raitt.
## 2036                                                                                                                                                                                                                                                                                     Adam, where art thou? / | $c: Heinrich Böll ; translated from the German by Mervyn Savill.
## 2037                                                                                                                                                                                                                                                                       The laughing policeman | $c: [by] Maj Sjöwall and Per Wahlöö. Translated from the Swedish by Alan Blair.
## 2038                                                                                                                                                                                                                                                                                                                                                The novels of Dashiell Hammett.
## 2039                                                                                                                                                                                                                                                                                                                Carnival confession. | $c: Translated by John and Necke Mander.
## 2040                                                                                                                                                                                                                                                                                                      Gargoyles. | $c: Translated from the German by Richard and Clara Winston.
## 2041                                                                                                                                                                                                                      Fenland chronicle: | recollections of William Henry and Kate Mary Edwards | $c: collected and edited by their daughter; with drawings by Ewart Oakeshott.
## 2042                                                                                                                                                                                                                                                                             The master of Hestviken / | $c: Sigrid Undset ; translated from the Norwegian by Arthur G. Chater.
## 2043                                                                                                                                                                                                                                                                                                                                                                Horrible tango.
## 2044                                                                                                                                                                                                                                                                                                                          Night and silence, who is here? | an American comedy.
## 2045                                                                                                                                                                                                                                                                                                                                                      The undiscovered country.
## 2046                                                                                                                                                                                                                                                                                                             Turkish delight. | $c: Translated from the Dutch by Greta Kilburn.
## 2047                                                                                                                                                                                                                                                                                                                                                             The king must die.
## 2048                                                                                                                                                                                                                                                                                               The ambassadors. | $c: With illus. by Leslie Saalburg and a pref. by the author.
## 2049                                                                                                                                                                                                                                                                                  Treblinka / | $c: preface by Simone de Beauvoir ; translated from the French by Helen Weaver.
## 2050                                                                                                                                                                                                                                                       Strange things happen here : | twenty-six short stories and a novel / | $c: Luisa Valenzuela ; translated by Helen Lane.
## 2051                                                                                                                                                                                                                                                                            Autobiography of Maxim Gorky [Book three]: | My universities. | $c: Translated by Isidor Schneider.
## 2052                                                                                                                                                                                                                                                                                                    The Artamonovs. | $c: [Translated by Alec Brown] Woodcuts by Peter Pendrey.
## 2053                                                                                                                                                                                                                                                                                                                                                                 Foma Gordeyev.
## 2054                                                                                                                                                                                                                                                                                                                                      The kiss and The duel, and other stories.
## 2055                                                                                                                                                                                                                                                 The darling, and other stories, | $c: by Anton Tchehov. From the Russian by Constance Garnett, with introd. by Edward Garnett.
## 2056                                                                                                                                                                                                                                                                                                          Select tales. | $c: Translated from the Russian by Constance Garnett.
## 2057                                                                                                                                                                                                                                                                                           The Odyssey of Homer done into English prose, | $c: by S.H. Butcher and Andrew Lang.
## 2058                                                                                                                                                                                                                                                                                                           The Oxford Chekhov. / | $c: Translated and edited by Ronald Hingley.
## 2059                                                                                                                                                                                                                                                                                            Fathers and children. | $c: Translated by Avril Pyman. Introd. by Nikolay Andreyev.
## 2060                                                                                                                                                                                                                                                                                                                   On the eve; | a novel. | $c: Translated by Gilbert Gardiner.
## 2061                                                                                                                                                                                                                                                      True history, and Lucius or the ass. | $c: Translated from the Greek by Paul Turner. Illustrated by Hellmuth Weissenborn.
## 2062                                                                                                                                                                                                                                                                                                                                                             Surgery and crime,
## 2063                                                                                                                                                                                                                                                                                        The wanderer (Le grand Meaulnes) | $c: Translated from the French by Françoise Delisle.
## 2064                                                                                                                                                                                                                                                                                                           Pamela; | or, Virtue rewarded. | $c: Introd. by William M. Sale, Jr.
## 2065                                                                                                                                                                                                                                                                                                                                                                  A wild thing.
## 2066                                                                                                                                                                                                                                                                                                                                                          The guide; | a novel.
## 2067                                                                                                                                                                                                                                                                                                                                    Pinktoes : | a novel / | $c: Chester Himes.
## 2068                                                                                                                                                                                                                                                                                                                                         Land without thunder; | short stories.
## 2069                                                                                                                                                                                                                                                                       A happy death. | $c: Translated from the French by Richard Howard. Afterword and notes by Jean Sarocchi.
## 2070                                                                                                                                                                                                                                                                                       The Princess of Clèves / | $c: Madame de LaFayette ; translated by Mildred Sarah Greene.
## 2071                                                                                                                                                                                                                                                Where the jackals howl, and other stories / | $c: Amos Oz ; translated from the Hebrew by Nicholas de Lange and Philip Simpson.
## 2072                                                                                                                                                                                                                                                                                                                                                              Laugh a defiance.
## 2073                                                                                                                                                                                                                                                                                                                                                   The time of Adam; | stories.
## 2074                                                                                                                                                                                                                                                                                                                                                                      The hack.
## 2075                                                                                                                                                                                                                                                                                                                                            Carnival, | $c: by Arthur H. Lewis.
## 2076                                                                                                                                                                                                                                                                                                                                       The forever war / | $c: by Joe Haldeman.
## 2077                                                                                                                                                                                                                 Threepenny novel / | $c: Bertolt Brecht ; translated from the German by Desmond I. Vesey, verses translated by Christopher Isherwood, introd. by John Willett.
## 2078                                                                                                                                                                                                                                                                                                       The fifth queen: | The fifth queen, Privy seal, The fifth queen crowned.
## 2079                                                                                                                                                                                                                                                                                                               The Bodley Head Ford Madox Ford. | $c: [Edited by Graham Greene]
## 2080                                                                                                                                                                                                                                                                                                                                             Once a spy / | $c: Robert Footman.
## 2081                                                                                                                                                                                                                                                                                                                                                            North to yesterday.
## 2082                                                                                                                                                                                                                                                                                                                              The sixth column; | a singular tale of our times.
## 2083                                                                                                                                                                                                                                                                                                                                                           The fortune tellers.
## 2084                                                                                                                                                                                                                                                                                                                                              The beast / | $c: Hugh Fleetwood.
## 2085                                                                                                                                                                                                                                                                                                                               An Artist and a magician / | $c: Hugh Fleetwood.
## 2086                                                                                                                                                                                                                                                                                                                            The noble enemy : | a novel / | $c: by Charles Fox.
## 2087                                                                                                                                                                                                                                                                                                                                                        Owls do cry, | a novel.
## 2088                                                                                                                                                                                                                                                                                                                                         The reservoir, | stories and sketches.
## 2089                                                                                                                                                                                                                                                                                                                                      Snowman, snowman, | fables and fantasies.
## 2090                                                                                                                                                                                                                                               Memoirs of a Victorian gentleman, William Makepeace Thackeray / | $c: by Maragret Forster ; ill. by William Makepeace Thackeray.
## 2091                                                                                                                                                                                                                                                                                                                                                         The day of the jackal.
## 2092                                                                                                                                                                                                                                                                                                      Jim Mundy : | a novel of the American Civil War / | $c: Robert H. Fowler.
## 2093                                                                                                                                                                                                                                                                                                                                                                  The corridor.
## 2094                                                                                                                                                                                                                                                                                                                                                                 The castaways.
## 2095                                                                                                                                                                                                                                                                                                                                                       Tree of dark reflection.
## 2096                                                                                                                                                                                                                                                                                                                                                                    The Jesuit.
## 2097                                                                                                                                                                                                                                                                                          The art of living, and other stories / | $c: John Gardner ; woodcuts by Mary Azarian.
## 2098                                                                                                                                                                                                                                                                                                                                                                       Jocelyn.
## 2099                                                                                                                                                                                                                                                                                                                                  The Nostradamus traitor / | $c: John Gardner.
## 2100                                                                                                                                                                                                                                                                                                                               The wreckage of Agathon | $c: [by] John Gardner.
## 2101                                                                                                                                                                                                                                                                                                                                            The family man, | $c: by John Gale.
## 2102                                                                                                                                                                                                                                                                                                                                          The shadow line / | $c: Laura Furman.
## 2103                                                                                                                                                                                                                                                                                                                                                           Hold back the night.
## 2104                                                                                                                                                                                                                                                                                                                                                                    City block.
## 2105                                                                                                                                                                                                                                                                                                                           Clothes of a king's son; | a novel in three volumes.
## 2106                                                                                                                                                                                                                                                                                                                                                        Road through the woods.
## 2107                                                                                                                                                                                                                                                                                               Pandora; | a novel. | $c: Drawings by Harold Town. Introduction by David Staine.
## 2108                                                                                                                                                                                                                                                                                                                                           Pork and others / | $c: Cris Freddi.
## 2109                                                                                                                                                                                                                                                                                                                                                               The major works.
## 2110                                                                                                                                                                                                                                                                                                                                         Valparaiso, | $c: by F. R. E. Nicolas.
## 2111                                                                                                                                                                                                                                                                                                                                                  A mother's kisses, | a novel.
## 2112                                                                                                                                                                                                                                                                                                                                                       Black angels; | stories.
## 2113                                                                                                                                                                                                                                                                                                                                                 The legend of Daniel Williams.
## 2114                                                                                                                                                                                                                                                                                                                                                                     The rabbi.
## 2115                                                                                                                                                                                                                                                                                        Ambrose's vision : | sketches towards the creation of a cathedral / | $c: Giles Gordon.
## 2116                                                                                                                                                                                                                                                                                                                        Old Red, | and other stories. | $c: By Caroline Gordon.
## 2117                                                                                                                                                                                                                                                                                                                                      Hammett : | a novel / | $c: by Joe Gores.
## 2118                                                                                                                                                                                                                                                                                                                                            The paratrooper of Mechanic Avenue.
## 2119                                                                                                                                                                                                                                                                                                                                      Not for publication, | and other stories.
## 2120                                                                                                                                                                                                                                                                                                                            The soft voice of the serpent, | and other stories.
## 2121                                                                                                                                                                                                                                                                                                                                                              A time for Paris.
## 2122                                                                                                                                                                                                                                                                                                                                                                       The lie.
## 2123                                                                                                                                                                                                                                                                                                                                                       A game of hide-and-seek.
## 2124                                                                                                                                                                                                                                                                                                                                                              Ulterior motives.
## 2125                                                                                                                                                                                                                                                                                                                                                              The finished man.
## 2126                                                                                                                                                                                                                                                                                                                                                           Murgatreud's empire.
## 2127                                                                                                                                                                                                                                                                                                                                                                    The heyday.
## 2128                                                                                                                                                                                                                                                                                                                                                               A net for Venus.
## 2129                                                                                                                                                                                                                                                                                                                Death in Don Mills : | a murder mystery / | $c: by Hugh Garner.
## 2130                                                                                                                                                                                                                                                                                                                                                        Cabbagetown; | a novel.
## 2131                                                                                                                                                                                                                                                                                                                                                      The silence on the shore.
## 2132                                                                                                                                                                                                                                                                                                                                    Gertrude. | $c: Translated by Hilda Rosner.
## 2133                                                                                                                                                                                                                                                                                                       Forbidden colors. | $c: Translated from the Japanese by Alfred H. Marks.
## 2134                                                                                                                                                                                                                                                                                                                           Peter Camenzind. | $c: Translated by Michael Roloff.
## 2135                                                                                                                                                                                                                                                                                                                            World's end and other stories / | $c: Paul Theroux.
## 2136                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2137                                                                                                                                                                                                                                                                                                          The lively image : | 4 myths in literature / | $c: Richard E. Hughes.
## 2138                                                                                                                                                                                                                                                                                                                                       The London embassy / | $c: Paul Theroux.
## 2139                                                                                                                                                                                                                                                                                                                                     The peaceable kingdom; | an American saga.
## 2140                                                                                                                                                                                                                                                                              Refiner's fire : | The life and adventures of Marshall Pearl, a foundling/ | $c: by Mark Helprin.
## 2141                                                                                                                                                                                                                                                                                                                                                        Vile bodies; | a novel.
## 2142                                                                                                                                                                                                                                                                              A house of gentlefolk | $c: [by] Ivan Turgenev; translated from the Russian by Constance Garnett.
## 2143                                                                                                                                                                                                                                                                                                            The tanker Derbent. | $c: [Translated from the Russian by R. Dixon]
## 2144                                                                                                                                                                                                                                                                                              Medieval romances, | $c: edited by Roger Sherman Loomis and Laura Hibbard Loomis.
## 2145                                                                                                                                                                                                                                                                                    An actor prepares. | $c: Translated by Elizabeth Reynolds Hapgood. Introd. by John Gielgud.
## 2146                                                                                                                                                                                                                                                                                    The elephant. | $c: Translated from the Polish by Konrad Syrop. Illustrated by Daniel Mroz.
## 2147                                                                                                                                                                                                                                                  Glory; | a novel | $c: [by] Vladimir Nabokov. Translated from the Russian by Dmitri Nabokov in collaboration with the author.
## 2148                                                                                                                                                                                                                                                                                                                          Safe conduct; | an autobiography, and other writings.
## 2149                                                                                                                                                                                                                                                                                                                                           Inter ice age 4 / | $c: by Kobo Abé.
## 2150                                                                                                                                                                                                                                                                                          Nine stories, 1855-63, | $c: by Leo Tolstóy; | translated by Louise and Aylmer Maude.
## 2151                                                                                                                                                                                                                                                                                                                                          The wanderer / | $c: by Fritz Leiber.
## 2152                                                                                                                                                                                                                                                                                                                             Mutant / | $c: by Lewis Padgett [i.e. H. Kuttner].
## 2153                                                                                                                                                                                                       The cosmic carnival of Stanisław Lem : | an anthology of entertaining stories by the modern master of science fiction / | $c: edited, with commentary by Michael Kandel.
## 2154                                                                                                                                                                                                                                                                                                                              Cosmos / | $c: English version by Eric Mosbacher.
## 2155                                                                                                                                                                                                                                                                                        Time of parting: | a novel; | $c: translated from the Bulgarian by Marguerite Alexieva.
## 2156                                                                                                                                                                                                                                                                                        The captain's daughter. | $c: [Translated from the Russian by Ivy and Tatyana Litvinov]
## 2157                                                                                                                                                                                                                                                                        Oblomov / | $c: by Ivan Goncharov ; translated by Natalie Duddington ; introduction by Renato Poggioli.
## 2158                                                                                                                                                                                                                                                                                                             One thousand souls. | Translated from the Russian by Ivy Litvinov.
## 2159                                                                                                                                                                                                                  The good soldier Švejk and his fortunes in the World War. | $c: In a new and unabridged translation by Cecil Parrott, with the original illus. by Josef Lada.
## 2160                                                                                                                                                                                                                                                                                            Night and hope / | $c: Arnost Lustig ; translated from the Czech by George Theiner.
## 2161                                                                                                                                                                                                                                                                                            A ship named Hope: | two novels; | $c: translated from the Czech by Edith Pargeter.
## 2162                                                                                                                                                                                                                                                                                                                                        The walnut door / | $c: by John Hersey.
## 2163                                                                                                                                                                     Definitely maybe : | a manuscript discovered under unusual circumstances / | $c: Arkady Strugatsky and Boris Strugatsky ; translated from the Russian by Antonina W. Bouis ; introd. by Theodore Sturgeon.
## 2164                                                                                                                                                                                                                                                              The Makepeace experiment | $c: [by] Abram Tertz. Translated from the Russian and with an introd. by Manya Harari.
## 2165                                                                                                                                                                                                                                                       The life and extraordinary adventures of Private Ivan Chonkin / | $c: Vladimir Voinovich ; translated by Richard Lourie.
## 2166                                                                                                                                                                                                                                                                              Anthology of Soviet short stories / | $c: compiled by Nikolai Atarov ; [translated into English].
## 2167                                                                                                                                                                                                                                                                                    Lenin in Zurich : | chapters / | $c: Alexander Solzhenitsyn ; translated by H. T. Willetts.
## 2168                                                                                                                                                                                                                                                                                                                                                                     Sara Dane.
## 2169                                                                                                                                                                                                                                                                                                                  The eagle and the raven : | a novel / | $c: by Pauline Gedge.
## 2170                                                                                                                                                                                                                                                                                                                             Autumnal knight : | stories / | $c: Andrew Gemant.
## 2171                                                                                                                                                                                                                                                                                                                                                                         Works.
## 2172                                                                                                                                                                                                                                                                                                                                                                         Works.
## 2173                                                                                                                                                                                                                                                                                                                                            The murder of Aziz Khan: | a novel.
## 2174                                                                                                                                                                                                                                                                                                                         Siberian road / | $c: Simon Harvester [i.e. H. Gibbs].
## 2175                                                                                                                                                                                                                                                                                                                      Reflections on a mountain summer / | $c: Joanna M. Glass.
## 2176                                                                                                                                                                                                                                                                                                                                                             The new ancestors.
## 2177                                                                                                                                                                                                                                                                                                                                                      The lady and the unicorn.
## 2178                                                                                                                                                                                                                                                                                                                                                       The optimist; | a novel.
## 2179                                                                                                                                                                                                                                                                                                                                     A schoolmaster with the Blackfeet Indians.
## 2180                                                                                                                                                                                                                                                                                                                                                                Pincher Martin.
## 2181                                                                                                                                                                                                                                                                                                                                       The man from Greek and Roman, | a novel.
## 2182                                                                                                                                                                                                                                                                                                                 Five legs ; Communion : | two novels / | $c: by Graeme Gibson.
## 2183                                                                                                                                                                                                                                                                                                                                                    American chrome; | a novel.
## 2184                                                                                                                                                                                                                                                                                                                   Vanquish the angel, | a novel / | $c: Diana and Meir Gillon.
## 2185                                                                                                                                                                                                                                                                                                                                                       The rise of Gerry Logan.
## 2186                                                                                                                                                                                                                                                                                                                                        The director's wife, and other stories.
## 2187                                                                                                                                                                                                                                                                                                                                             The comic / | $c: Brian Glanville.
## 2188                                                                                                                                                                                                                                                                                                                                               A bad streak, and other stories.
## 2189                                                                                                                                                                                                                                                                                                                               Ashes and petals : | a novel / | $c: H. S. Gill.
## 2190                                                                                                                                                                                                                                                                                                                                                                Ways of loving.
## 2191                                                                                                                                                                                                                                                                                                                                              Sunburst / | $c: Phyllis Gotlieb.
## 2192                                                                                                                                                                                                                                                           Modern Chinese stories; | $c: selected and edited by W. J. F. Jenner; translated by W. J. F. Jenner and Gladys Yang.
## 2193                                                                                                                                                                                                                                                                                                                                         Schoolmaster Ni Huan-chih; : | [novel.
## 2194                                                                                                                                                                                                                                                                                                           The Family / | $c: by Pa Chin (pseud.) Translated by Sidney Shapiro.
## 2195                                                                                                                                                                                                                    Let us die fighting : | the struggle of the Herero and Nama against German imperialism (1884-1915) / | $c: Horst Drechsler ; [translated by Bernd Zöllner].
## 2196                                                                                                                                                                                                                                                                                            Tomorrow's Eve / | $c: Villiers de L'Isle-Adam ; translated by Robert Martin Adams.
## 2197                                                                                                                                                                                                                                                                                   The devil in the flesh: | a novel; | $c: translated from the French by A. M. Sheridan Smith.
## 2198                                                                                                                                                                                                                                     Confessions of Zeno | $c: [by] Italo Svevo [pseud.] Translated from the Italian by Beryl de Zoete. With a rote on svevo by Edouard Roditi.
## 2199                                                                                                                                                                                                                                                                                                 The long way home / | $c: by Poul Anderson ; with a new introd. by the author.
## 2200                                                                                                                                                                                                                                                                                                        Two worlds / | $c: by Poul Anderson ; with a new introd. by the author.
## 2201                                                                                                                                                                                                                                                                                                      Orbit unlimited / | $c: Poul Anderson ; with a new introd. by the author.
## 2202                                                                                                                                                                                                                                                         The obscene bird of night / | $c: by José Donoso ; translated from the Spanish by Hardie St. Martin and Leonard Mades.
## 2203                                                                                                                                                                                                                                                                                                                                                       The traitors; | a novel.
## 2204                                                                                                                                                                                                                                                                                                                                 The flight of Ikaros; | a journey into Greece.
## 2205                                                                                                                                                                                                                                                                                                                                                      If he hollers let him go.
## 2206                                                                                                                                                                                                                                                                                                                                                                 House of gold.
## 2207                                                                                                                                                                                                                                                                                                      The adventures of Huckleberry Finn. | $c: With an introd. by T. S. Eliot.
## 2208                                                                                                                                                                                                                                                  The Charlotte Perkins Gilman reader : | The yellow wallpaper, and other fiction / | $c: edited and introduced by Ann J. Lane.
## 2209                                                                                                                                                                                                                                                                             Death in Venice, | and seven other stories; | $c: translated from the German by H. T. Lowe-Porter.
## 2210                                                                                                                                                                                                                                                                                                                                                                       Odyssey.
## 2211                                                                                                                                                                                                                                                                                                                   Little novels of Sicily; | $c: translated by D. H. Lawrence.
## 2212                                                                                                                                                                                                                                                                       A happy death. | $c: Translated from the French by Richard Howard. Afterword and notes by Jean Sarocchi.
## 2213                                                                                                                                                                                                                                                                                                Earth. | $c: Pref. by Angus Wilson. [Translated from the French by Ann Lindsay]
## 2214                                                                                                                                                                                                                                                         The sound of waves, | $c: by Yukio Mishima [pseud.] Translated by Meredith Weatherby, drawings by Yoshinori Kinoshita.
## 2215                                                                                                                                                                                                                                                                                                               Furioso; | $c: translated by Count Cagliostro from the French. -
## 2216                                                                                                                                                                                                                                                                                             The Summer book / | $c: Tove Jansson ; translated from the Swedish by Thomas Teal.
## 2217                                                                                                                                                                                                                                   Dangerous acquaintances = | Les liaisons dangereuses / | $c: by Choderlos de Laclos ; translated by Richard Aldington, with an introduction.
## 2218                                                                                                                                                                                                                                                                               Four romantic tales from 19th century German / | $c: translated with an introd. by Helene Scher.
## 2219                                                                                                                                                                                                                                                                                                                                                         Envy, and other works,
## 2220                                                                                                                                                                                                                                                                                                         The midnight fox, | $c: by Betsy Byars. Illustrated by Ann Grifalconi.
## 2221                                                                                                                                                                                                                                                                           Three novels / | $c: by Mariano Azuela ; translated by Frances Kellam Hendricks and Beatrice Berler.
## 2222                                                                                                                                                                                                                                                                                            The goatibex constellation / | $c: Fazil Iskander ; translated by Helen Burlingame.
## 2223                                                                                                                                                                                                                                                                                                                            Brotherly love [by] | $c: Gabriel Fielding [pseud.]
## 2224                                                                                                                                                                                                                                                                                                                                          Tortilla Flat / | $c: John Steinbeck.
## 2225                                                                                                                                                                                                                                                                                                                                                             Welcome to Xanadu.
## 2226                                                                                                                                                                                                                                                                                                                                                     Trinity / | $c: Leon Uris.
## 2227                                                                                                                                                                                                                                                                                                         After the banquet. | $c: Translated from the Japanese by Donald Keene.
## 2228                                                                                                                                                                                                                                                                                                       The sinful ones / | $c: Fritz Leiber ; with a new introd. by Jeff Frane.
## 2229                                                                                                                                                                                                                                                        A hero of our time / | $c: M. Lermontov ; [translated from the Russian by Martin Parker ; illustrated by D. Shmarinov].
## 2230                                                                                                                                                                                                                                                                                      The blood of others. | $c: Translated from the French by Roger Senhouse and Yvonne Moyse.
## 2231                                                                                                                                                                                                                                                                               Ambiguous adventure / | $c: Cheikh Hamidou Kane ; translated from the French by Katherine Woods.
## 2232                                                                                                                                                                                                                                                        Golden Ophelia : | a novel / | $c: Ward Ruyslinck [i.e. R. K. M. de Belser] ; translated from the Dutch by David Smith.
## 2233                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2234                                                                                                                                                                                                                                                                                   Reasons of state / | $c: Alejo Carpentier; translated from the Spanish by Frances Partridge.
## 2235                                                                                                                                                                                                                                                                                                                                         Child Ellen / | $c: by Frank Trippett.
## 2236                                                                                                                                                                                                                                                                                                                                                         The bull from the sea.
## 2237                                                                                                                                                                                                                                                                                                                                    The abortion: | an historical romance 1966.
## 2238                                                                                                                                                                                                                                                                                                                                                            A Ulysses too many.
## 2239                                                                                                                                                                                                                                                                                                                                                                Car; | a novel.
## 2240                                                                                                                                                                                                                                                                                                         Epitaph for a spy / | $c: Eric Ambler ; with a footnote by the author.
## 2241                                                                                                                                                                                                                                                                                                                                   The ballroom of romance and other stories. -
## 2242                                                                                                                                                                                                                                                                               The other woman; | $c: translated from the French and with an introduction by Margaret Crosland.
## 2243                                                                                                                                                                                                                                                  The hundred tales | (Les cent nouvelles nouvelles) | $c: Translated by Rossell Hope Robbins. Illustrated by Alexander Dobkin.
## 2244                                                                                                                                                                                                                                                                                                                                                       The gods are not mocked.
## 2245                                                                                                                                                                                                                                                                                                                             The illusionless man; | fantasies and meditations.
## 2246                                                                                                                                                                                                                                                                                               Master and man, and other parables and tales. | $c: Introd. by Nikolay Andreyev.
## 2247                                                                                                                                                                                                                                                                                                    Collected stories / | $c: Frank O'Connor ; introduction by Richard Ellmann.
## 2248                                                                                                                                                                                                                                                                                                                                                                  Ancuta's Inn.
## 2249                                                                                                                                                                                                                                            Love and war; | adventures from the Firuz shāh nāma of Sheikh Bighami. | $c: Translated from the Persian by William L. Hanaway, Jr.
## 2250                                                                                                                                                                                                                                                                                                                          First family : | a novel / | $c: by Patrick Anderson.
## 2251                                                                                                                                                                                                                                                                                              Chosen pages from Lu Hsun [pseud.] the literary mentor of the Chinese Revolution.
## 2252                                                                                                                                                                                                                                                                                                The people of Seldwyla, and Seven legends. | $c: Translated by M. D. Hottinger.
## 2253                                                                                                                                                                                                                                                                                                                                            Lying low / | $c: by Diane Johnson.
## 2254                                                                                                                                                                                                                                                       Coup de Grâce / | $c: Marguerite Yourcenar ; translated from the French by Grace Frick in collaboration with the author.
## 2255                                                                                                                                                                                                                                                                                                              The hatchet. | $c: Translated from the Rumanian by Eugenia Farca.
## 2256                                                                                                                                                                                                                                                                                Pilgrim at sea. | $c: Translated from the Swedish by Naomi Walford. Drawings by Emil Antonucci.
## 2257                                                                                                                                                                                                                                                                                              The Watsons; | $c: Jane Austen's fragment continued and completed by John Coates.
## 2258                                                                                                                                                                                                                                                                                        The survivor / | $c: by Siegfried Lenz ; translated from the German by Michael Bullock.
## 2259                                                                                                                                                                                                                                                                                                                                                         A lantern in her hand.
## 2260                                                                                                                                                                                                                                                                                                                                                   Warlock / | $c: Oakley Hall.
## 2261                                                                                                                                                                                                                                                                 The golden road / | $c: Hao Ran ; [translated by Carma Hinton and Chris Gilmartin ; illustrations by Cai Rong]
## 2262                                                                                                                                                                                                                                                                                                                          Silicon valley : | a novel / | $c: by Michael Rogers.
## 2263                                                                                                                                                                                                                                                                                                                                              Why are we in Vietnam? | A novel.
## 2264                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2265                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2266                                                                                                                                                                                                                                                                                                                                  Other people's worlds / | $c: William Trevor.
## 2267                                                                                                                                                                                                                                                                                                                                                           The love department.
## 2268                                                                                                                                                                                                                                                                                              The film of memory, | a novel. | $c: Translated from the French by Moura Budberg.
## 2269                                                                                                                                                                                                                                                                                                                                    A god against the gods / | $c: Allen Drury.
## 2270                                                                                                                                                                                                                                                                                  The she-devils (Les diaboliques) | $c: Translated by Jean Kimber. Introduced by Enid Starkie.
## 2271                                                                                                                                                                                                                                                                                                         The best short stories of John Buchan / | $c: edited by David Daniell.
## 2272                                                                                                                                                                                                                                                                   The son of the bondwoman / | $c: by Emilia Pardo Bazán ; translated from the Spanish by Ethel Harriet Hearn.
## 2273                                                                                                                                                                                                                                                                                Explosion in a cathedral : | a novel / | $c: by Alejo Carpentier ; translated by John Sturrock.
## 2274                                                                                                                                                                                                                                                                              The devil's agent; | $c: a novel by Hans Habe [pseud.] Translated from the German by Ewald Osers.
## 2275                                                                                                                                                                                                                                                                                                Paradise, & other stories; | $c: translated from the Italian by Angus Davidson.
## 2276                                                                                                                                                                                                                                                   The empty canvas [by] Alberto Moravia [pseud] | $c: Translated by Angus Davidson. New York, Farrar, Straus and Cudahy [1961]
## 2277                                                                                                                                                                                                                                                           Chemmeen; | a novel, | $c: by Thakazhi Sivasankara Pillai. Translated by Narayana Menon. Introd. by Santha Rama Rau.
## 2278                                                                                                                                                                                                                                                                                                 The gates of the forest / | $f: translated from the French by Frances Frenaye.
## 2279                                                                                                                                                                                                                                                                                                                                  The sibyl, | $c: translated by Naomi Walford.
## 2280                                                                                                                                                                                                                                                                        The death of Ahasuerus. | $c: Translated from the Swedish by Naomi Walford. Drawings by Emil Antonucci.
## 2281                                                                                                                                                                                                                                                                                 Talks with a devil; | $c: translated by Katya Petroff; edited and introduced by J. G. Bennett.
## 2282                                                                                                                                                                                                                                                                                                                      Destination Biafra : | a novel / | $c: by Buchi Emecheta.
## 2283                                                                                                                                                                                                                                                                                                                                                   Lokotown, and other stories.
## 2284                                                                                                                                                                                                                                                                                            The scavenger. | $c: Translated into English and with an introd. by Hugh A. Harter.
## 2285                                                                                                                                                                                                                                                                                                                          Death is part of the process / | $c: Hilda Bernstein.
## 2286                                                                                                                                                                                                                                                                                                                                     The crucible of time / | $c: John Brunner.
## 2287                                                                                                                                                                                                                                                                                                                           The complete short stories / | $c: Anthony Trollope.
## 2288                                                                                                                                                                                                                                                                                                                                       The railway accident, and other stories.
## 2289                                                                                                                                                                                                                                                                                                                             The battle lost and won / | $c: by Olivia Manning.
## 2290                                                                                                                                                                                                                                                                                                                                     Friends and heroes / | $c: Olivia Manning.
## 2291                                                                                                                                                                                                                                                                             Love and other stories of Yokomitsu Riichi / | $c: translated and with an introd. by Dennis Keene.
## 2292                                                                                                                                                                                                                                                                                                              Island priest; | $c: translated from the French by James Whitall.
## 2293                                                                                                                                                                                                                                                                      The Wandering Jew, and other stories; | $c: translated by Rèmy Inglis Hall, illustrated by Antony Little.
## 2294                                                                                                                                                                                                                                                          When things of the spirit come first : | five early tales / | $c: Simone de Beauvoir ; translated by Patrick O'Brian.
## 2295                                                                                                                                                                                                                    Stories of the Chinese People's Volunteers / | $c: [translated by teachers of the English Faculty of the Foreign Languages Department of Futan University].
## 2296                                                                                                                                                                                                                                                                                                             Children of the frost. | $c: Edited and introduced by I. O. Evans.
## 2297                                                                                                                                                                                                                                                                                                                                                                          Miau.
## 2298                                                                                                                                                                                                                                                                     An anthology of Persian prose, from Beihaqui [and others] | $c: Selected and translated by Siavosh Danesh.
## 2299                                                                                                                                                                                                                                     Gestapu : | Indonesian short stories on the abortive Communist coup of 30th September 1965 / | $c: edited and translated by Harry Aveling.
## 2300                                                                                                                                                                                                                                                                                                                                                        The proud and the free.
## 2301                                                                                                                                                                                                                                                      Seven short stories | $c: [by] Dušan Kužel [et al. Translated by George Theiner, Rosemary Kavanová and Marian Wilbraham].
## 2302                                                                                                                                                                                                                                                                                                          Him with his foot in his mouth and other stories / | $c: Saul Bellow.
## 2303                                                                                                                                                                                                                                                                                                          Cities of the interior / | $c: Anaïs Nin ; introd. by Sharon Spencer.
## 2304                                                                                                                                                                                                                                                                                                                                                          The tale of Asa Bean.
## 2305                                                                                                                                                                                                                                                                                                The eyes of the interred. | $c: Translated from the Spanish by Gregory Rabassa.
## 2306                                                                                                                                                                                                                                                                                                                         Taking care : | short stories / | $c: by Joy Williams.
## 2307                                                                                                                                                                                                                                                                                                                                                             Lancet, | a novel.
## 2308                                                                                                                                                                                                                                                                                                                 The loved and the unloved. | $c: Translated by Gerard Hopkins.
## 2309                                                                                                                                                                                                                                                                                                                    Woman of the Pharisees. | $c: Translated by Gerard Hopkins.
## 2310                                                                                                                                                                                                                                                                                                 The mountain inn, and other stories; | $c: a new translation by H.N.P. Sloman.
## 2311                                                                                                                                                                                                                                                                                  The twenty-fifth hour, | $c: by Virgil Gheorghiu. Translated from the Romanian by Rita Eldon.
## 2312                                                                                                                                                                                                                                                                                                                   Verdun / | $c: Jules Romains ; translated by Gerard Hopkins.
## 2313                                                                                                                                                                                                                                                                              Portrait of a man unknown, | a novel. | $c: Pref. by Jean-Paul Sartre. Translated by Maria Jolas.
## 2314                                                                                                                                                                                                                                                                                              The hermit / | $c: Eugène Ionesco ; translated from the French by Richard Seaver.
## 2315                                                                                                                                                                                                                                                                                     Face to face / | $c: a film by Ingmar Bergman ; translated from the Swedish by Alan Blair.
## 2316                                                                                                                                                                                                                                                                                                     The joker, | a novel; | $c: translated from the French by Herma Briffault.
## 2317                                                                                                                                                                                                                                                                                                                           Return to the château, | preceded by A girl in love.
## 2318                                                                                                                     Tieta, the goat girl : | or, The return of the prodigal daughter : melodramatic serial novel in five sensational episodes, with a touching epilogue, thrills and suspense! / | $c: Jorge Amado ; translated from the Portuguese by Barbara Shelby Merello.
## 2319                                                                                                                                                                                                                                                                                                                 A stronger climate; | 9 stories | $c: [by] R. Prawer Jhabvala.
## 2320                                                                                                                                                                                                                                                                                                                                                               Operation Chaos.
## 2321                                                                                                                                                                                                                                                                                       Toilers of the sea. | $c: Translated by W. May [i.e. Moy] Thomas. Introd. by F.C. Green.
## 2322                                                                                                                                                                                                                                                                                                       A man apart. | $c: Translated by the author from the original Afrikaans.
## 2323                                                                                                                                                                                                                                                                                                                    Camel Xiangzi / | $c: Lao She ; translated by Shi Xiaoqing.
## 2324                                                                                                                                                                                                                                                                                                             Contemporary Chinese stories. | $c: Translated by Chi-chên Wang. -
## 2325                                                                                                                                                                                                                                                                                                                       Stories of China at war / | $c: edited by Chi-chen Wang.
## 2326                                                                                                                                                                                                                                                                                                                 Village in August, | $c: by Tʻien Chün. Introd. by Edgar Snow.
## 2327                                                                                                                                                                                                                                                                                          No man knows the night; | a novel. | $c: Translated from the Danish by A.I. Roughton.
## 2328                                                                                                                                                                                                                                                             Anne Frank's diary; | $c: translated from the Dutch by B. M. Mooyaart-Doubleday, with a foreword by Strom Jameson.
## 2329                                                                                                                                                                                                                                                                                                                                                                   Four novels:
## 2330                                                                                                                                                                                                                                                                                                                                  Legends of our time / | $c: [by] Elie Wiesel.
## 2331                                                                                                                                                                                                                                                                                 The selves of Quinte, | $c: by Marcel Moreau. Translated from the French by Bernard Frechtman.
## 2332                                                                                                                                                                                                                                                                                                       The Decameron. | $c: Introd. by Edward Hutton. [Translated by J.M. Rigg]
## 2333                                                                                                                                                                                                                                                                                                     The Decameron; | $c: translated from the Italian by Frances Winwar [pseud.
## 2334                                                                                                                                                                                                                                                                                  The iron staircase / | $c: Georges Simenon ; translated from the French by Eileen Ellenbogen.
## 2335                                                                                                                                                                                                                                                                                                  The move. | $c: Translated from the French by Christopher Sinclair-Stevenson.
## 2336                                                                                                                                                                                                                                                                                                            Betty / | $c: by Georges Simenon ; translated by Alastair Hamilton.
## 2337                                                                                                                                                                                                                                                                                                          Bound to violence; | $c: translated from the French by Ralph Manheim.
## 2338                                                                                                                                                                                                                                                                                                                                       On the black hill / | $c: Bruce Chatwin.
## 2339                                                                                                                                                                                                                                                                                                    Bertolt Brecht, 1921-1946 / | $c: edited by John Willett and Ralph Manheim.
## 2340                                                                                                                                                                                                                                                                                                                                         Twenty-thousand leagues under the sea.
## 2341                                                                                                                                                                                                                                                                                                                                     Kind are her answers / | $c: Mary Renault.
## 2342                                                                                                                                                                                                                                                                                                                                      A tiger for Malgudi / | $c: R.K. Narayan.
## 2343                                                                                                                                                                                                                                                                                                           Chingling / | $c: Nirmala Deshpande ; [translator, N. R. Deobhanker]
## 2344                                                                                                                                                                                                                                                                                                                                                            The new centurions.
## 2345                                                                                                                                                              The necklace of Princess Fiorimonde and other stories; | being the complete fairy tales. | $c: With original illus. by William De Morgan, Walter Crane [and] Olive Cockerell. Introduced by Roger Lancelyn Green.
## 2346                                                                                                                                                                                                                                                               Cocktails at Somoza's : | a reporter's sketchbook of events in revolutionary Nicaragua / | $c: by Richard Elman.
## 2347                                                                                                                                                                                                                                             Doctor Glas : | a novel / | $c: by Hjalmar Söderberg ; translated by Paul Britten Austin ; with an introduction by William Sansom.
## 2348                                                                                                                                                                                                                                                                                                                                          The smell of bread, and other stories
## 2349                                                                                                                                                                                                                                                                                         Stories from the Bible / | $c: by Walter De La Mare ; illustrated by Edward Ardizzone.
## 2350                                                                                                                                                                                                                                                                                               The Odyssey. | $c: Translated by George Herbert Palmer. Edited by Howard Porter.
## 2351                                                                                                                                                                                                                                                                                                                     The immoralist. | $c: A new translation by Richard Howard.
## 2352                                                                                                                                                                                                                                                                                                                                                                       Jubilee.
## 2353                                                                                                                                                                                                                                                                   Street of riches. | Introd.: | $c: Brandon Conron. General editor: Malcolm Ross. Translated by Henry Binsse.
## 2354                                                                                                                                                                                                                                                                                                                        Family occasions : | a novel / | $c: by George R. Clay.
## 2355                                                                                                                                                                                                                                                                                                                                               Running dog / | $c: Don DeLillo.
## 2356                                                                                                                                                                                                                                                                                       Stories for late night drinkers / | $c: Michel Tremblay ; translated by Michael Bullock.
## 2357                                                                                                                                                                                                                                                                                                             The immoralist. | $c: Translated from the French by Dorothy Bussy.
## 2358                                                                                                                                                                                                                                                                                                      Dreams; | short stories. | $c: [Translated by Robert Daglish, and others]
## 2359                                                                                                                                                                                                                                                                                                          Man's estate; | $c: translated from the French by Alastair Macdonald.
## 2360                                                                                                                                                                                                                                                                                                                                                    The planetarium, | a novel.
## 2361                                                                                                                                                                                                                                                                                                                                                 The names / | $c: Don DeLillo.
## 2362                                                                                                                                                                                                                                                                                                  Four stories by Ingmar Bergman / | $c: Trans. from the Swedish by Alan Blair.
## 2363                                                                                                                                                                                                                                               Money and other stories. | $c: [Translated from the Czech by Francis P. Marchant and others] With a foreword by John Galsworthy.
## 2364                                                                                                                                                                                                                                                                Absent without leave : | two novellas / | $c: by Heinrich Böll ; translated from the German by Leila Vennewitz.
## 2365                                                                                                                                                                                                                                                                                                                        Dutch Shea, Jr. : | a novel / | $c: John Gregory Dunne.
## 2366                                                                                                                                                                                                                                                                                                                                  "We never make mistakes"; | two short novels.
## 2367                                                                                                                                                                                                                                         The saint : | a fictional biography of Thomas Becket / | $c: by Conrad Ferdinand Meyer ; translated from the German by W. F. Twaddell.
## 2368                                                                                                                                                                                                                                                                                         Fortunata and Jacinta: two stories of married women; | $c: translated by Lester Clark.
## 2369                                                                                                                                                                                                                                                                                                                                    Fifth business / | $c: by Robertson Davies.
## 2370                                                                                                                                                                                                                                                                                                                                                         The railway guerrillas
## 2371                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2372                                                                                                                                                                                                                                                                                         Doctor Zhivago. | $c: Boris Pasternak ; [translation by Max Hayward and Manya Harari].
## 2373                                                                                                                                                                                                                                                                                         Not of this time, not of this place / | $c: Translated from the Hebrew by Shlomo Katz.
## 2374                                                                                                                                                                                                                                                                                                      Memoirs of a good-for-nothing / | $c: translated by Bayard Quincy Morgan.
## 2375                                                                                                                                                                                                                                                                                The testament : | a novel / | $c: by Elie Wiesel ; translated from the French by Marion Wiesel.
## 2376                                                                                                                                                                                                                                                                                                                                                  Count d'Orgel opens the ball.
## 2377                                                                                                                                                                                                                                                                                                                                             Nervous people, and other satires.
## 2378                                                                                                                                                                                                                               Evenings near the village of Dikanka; | stories published by bee-keeper Rudi Panko. | $c: [Edited by Ovid Gorchakov. Illustrated by A. Kanevsky]
## 2379                                                                                                                                                                                                                                                                                                                                  The country cousin / | $c: Louis Auchincloss.
## 2380                                                                                                                                                                                                                                                                                               Tales of Melvil's mouser; | or, Much ado about libraries | $c: [by] Paul Dunkin.
## 2381                                                                                                                                                                                                                                                                                                                                                     Daddy was a number runner.
## 2382                                                                                                                                                                                                                                                                                                                       Xala / | $c: Sembene Ousmane ; translated by Clive Wake.
## 2383                                                                                                                                                                                                                                                                                            Mist (Niebla) a tragicomic novel. | $c: Translated from the Spanish by Warner Fite.
## 2384                                                                                                                                                                                                                                                                                          God bless you, Mr. Rosewater; | or, Pearls before swine | $c: [by] Kurt Vonnegut, Jr.
## 2385                                                                                                                                                                                                                                                                           The apple in the dark | $f: translated from the Portuguese, with an introduction by Gregory Rabassa.
## 2386                                                                                                                                                                                                                                                                                                            Family ties. | $c: Translated with an introd. by Giovanni Pontiero.
## 2387                                                                                                                                                                                                                                                                             Women : | or, Pour et contre / | $c: Charles Robert Maturin ; with an introd. by Robert Lee Wolff.
## 2388                                                                                                                                                                                                                                                                                                       The sad geraniums, and other stories. | $c: Translated by Keith Hamnett.
## 2389                                                                                                                                                                                                                                                                                                                                     Voices of a summer day / | $c: Irwin Shaw.
## 2390                                                                                                                                                                                                                                                                            The cancer ward | $c: [by] Aleksandr I. Solzhenitsyn. Translated from the Russian by Rebecca Frank.
## 2391                                                                                                                                                                                                                                                                    Havoc. | Hærværk. | $c: Translated from the Danish by Carl Malmberg. With an introd. by Børge Gedsø Madsen.
## 2392                                                                                                                                                                                                                                                                                                                                                            Papa, you're crazy.
## 2393                                                                                                                                                                                                                                                                                           Bitter herbs; | a little chronicle. | $c: [Translated from the Dutch by Roy Edwards]
## 2394                                                                                                                                                                                                                            Tyorkin & the stovemakers; | $c: poetry and prose by Alexander Tvardovsky. Translated from the Russian by Anthony Rudolf; introduced by C. P. Snow.
## 2395                                                                                                                                                                                                                                                                                                              Span of the year / | $c: Vera Panova ; translated by Vera Traill.
## 2396                                                                                                                                                                                                                                                                                                                                         Counterpoint / | $c: Isabelle Holland.
## 2397                                                                                                                                                                                                                                                                                                                                                                I looked right.
## 2398                                                                                                                                                                                                                                                                  De Sade quartet [four stories from Contes et fabliaux. | $c: Translated from the French by Margaret Crosland]
## 2399                                                                                                                                                                                                                                                                                                                 This gentle companion | $c: [translated by Sebastian Roberts].
## 2400                                                                                                                                                                                                                                                                                                         Strait is the gate. | $c: Translated from the French by Dorothy Bussy.
## 2401                                                                                                                                                                                                                                                                                                          Tales of my people | $c: [by] Sholem Asch. Translated by Meyer Levin.
## 2402                                                                                                                                                                                                                                                                                             Cancer ward. | $c: Translated from the Russian by Nicholas Bethell and David Burg.
## 2403                                                                                                                                                                                                                                                  The darling, and other stories | $c: by Anton Tchehov; from the Russian by Constance Garnett, with introd. by Edward Garnett.
## 2404                                                                                                                                                                                                                                                                                                                                 Stalking the nightmare / | $c: Harlan Ellison.
## 2405                                                                                                                                                                                                                                                                 Writers in the new Cuba: | an anthology / | $c: edited by J. M. Cohen, [translated by J. M. Cohen and others].
## 2406                                                                                                                                                                                                                                                                                                                                                         A death in the family.
## 2407                                                                                                                                                                                                                                                                                                                               Pedro Páramo. | $c: Translated by Lysander Kemp.
## 2408                                                                                                                                                                                                                                                                                                     Scavenger's son / | $c: T. Sivasankara Pillai ; translated by R. E. Asher.
## 2409                                                                                                                                                                                                                                                                                            Vishakanyaka / | $c: S.K. Pottekkatt ; translated from the Malayalam by V. Abdulla.
## 2410                                                                                                                                                                                                                                                                      The Sunday of life : | a novel / | $c: by Raymond Queneau ; translated from the French by Barbara Wright.
## 2411                                                                                                                                                                                                                                                                                    The legacy : | a novel / | $c: Vasudevan Nair ; translated from Malayalam by Celine Matheu.
## 2412                                                                                                                                                                                                                                                                                                    Lying woman; | a novel. | $c: Translated from the French by Richard Howard.
## 2413                                                                                                                                                                                                                                                                                                                                                             The disappearance.
## 2414                                                                                                                                                                                                                                                                                                                                     Three weeks in October / | $c: Yaël Dayan.
## 2415                                                                                                                                                                                                                                                                                                                       The Cambodia file / | $c: Jack Anderson & Bill Pronzini.
## 2416                                                                                                                                                                                                                                                                                                                                                     The old woman and the cow.
## 2417                                                                                                                                                                                                                                                                                                          334 / | $c: Thomas M. Disch ; with a new introd. by M. John Harrison.
## 2418                                                                                                                                                                                                                                                                     Rungs of the ladder / | $c: Thakazhi Sivasankara Pillai ; [translated from Malayalam by C. Paul Verghese].
## 2419                                                                                                                                                                                                                                                                                                                                     Zero : | a novel / | $c: C. Radhakrishnan.
## 2420                                                                                                                                                                                                                                                                                                                              The iron rod / | $c: Thakazhi Sivasankara Pillai.
## 2421                                                                                                                                                                                                                                                                                  Aswathama : | a novel / | $c: Matampu Kunhukuttan ; translated from Malayalam by Prema Menon.
## 2422                                                                                                                                                                                                                                                                                                  In the prison of her skin; | $c: translated from the French by Derek Coltman.
## 2423                                                                                                                                                                                                                                                      God's pauper : | St. Francis of Assisi : a novel / | $c: by Nikos Kazantzakis ; [translated from the Greek by P. A. Bien]
## 2424                                                                                                                                                                                                                                                          When things of the spirit come first : | five early tales / | $c: Simone de Beauvoir ; translated by Patrick O'Brian.
## 2425                                                                                                                                                                                                                                                                                          Stories / | $c: Gottfried Keller ; edited by Frank G. Ryder ; foreword by Max Frisch.
## 2426                                                                                                                                                                                                                                             The locked room; | the story of a crime | $c: [by] Maj Sjöwall and Per Wahlöö. Translated from the Swedish by Paul Britten Austin.
## 2427                                                                                                                                                                                                                                                                          The abominable man | $c: [by] Maj Sjöwall and Per Wahlöö. Translated from the Swedish by Thomas Teal.
## 2428                                                                                                                                                                                                                                                                                   Thinking it over : | 30 stories from the German Democratic Republic / | $c: Hubert Witt, ed.
## 2429                                                                                                                                                                                                                                                                                                                       Jealousy; | a novel. | $c: Translated by Richard Howard.
## 2430                                                                                                                                                                                                                                                                                                              The prodigy / | $c: Hermann Hesse ; translated by W. J. Strachan.
## 2431                                                                                                                                                                                                                                                   The betrothed, "I Promessi sposi" : | a tale of XVII century Milan / | $c: Translated with a preface by Archibald Colquhoun.
## 2432                                                                                                                                                                                                                                                                                                                The sibyl / | $c: Pär Lagerkvist ; translated by Naomi Walford.
## 2433                                                                                                                                                                                                                                                                                                             Pilgrim at sea | $f: translated from the Swedish by Naomi Walford.
## 2434                                                                                                                                                                                                                                                            The Tupamaro guerrillas / | $c: Maria Esther Gilio ; translated by Anne Edmondson ; introd. by Robert J. Alexander.
## 2435                                                                                                                                                                                                                                                          The betrothed, | (I Promessi sposi); by Alessandro Manzoni. | $c: Translated from the Italian by Archibald Colquhoun.
## 2436                                                                                                                                                                                                                                                                                                        Schelmuffsky. | $c: Introd. and English translation by Wayne Wonderley.
## 2437                                                                                                                                                                                                                                                                                                                                                       The journey to the East.
## 2438                                                                                                                                                                                                                                                                                                                            Early in the summer of 1970 / | $c: A. B. Yehoshua.
## 2439                                                                                                                                                                                                                                                                                    The heart-keeper | $c: [by] Françoise Sagan. Translated from the French by Robert Westhoff.
## 2440                                                                                                                                                                                                                                                                                   Three days and a child | $c: [by] A. B. Yehoshua; translated from the Hebrew by Miriam Arad.
## 2441                                                                                                                                                                                                                                                                                              Poor folk / | $c: Dostoevsky ; translated with an introduction by Robert Dessaix.
## 2442                                                                                                                                                                                                                                                                                                                  Over by the river, and other stories / | $c: William Maxwell.
## 2443                                                                                                                                                                                                                                                                           The wilderness of ice: | part two of The adventures of Captain Hatteras. | $c: Edited by I.O. Evans.
## 2444                                                                                                                                                                                                                                                                                           White nights, and other stories, | translated from the Russian by Constance Garnett.
## 2445                                                                                                                                                                                                                                                              Shadowed paths [and other stories. | $c: Translated from the Russian by Olga Shartse. Edited by Philippa Hentges]
## 2446                                                                                                                                                                                                                                                 The banner of the Upright Seven, and Ursula; | two novellas. | $c: Translated by Bayard Quincy Morgan. Introd. by Gerda Breit.
## 2447                                                                                                                                                                                                                                                                                                     The confessions of Arsène Lupin. | $c: [Translated by Joachim Neugroschel.
## 2448                                                                                                                                                                                                                                                                                                                                The cat's pajamas & Witch's milk; | two novels.
## 2449                                                                                                                                                                                                                                                                                                                                                           The neon wilderness.
## 2450                                                                                                                                                                                                            A madman's defense; | Le plaidoyer d'un fou. | $c: Translation based on Ellie Schleussner's version, The confession of a fool. Rev. and edited by Evert Sprinchorn.
## 2451                                                                                                                                                                                                                                                         The house of the sleeping beauties and other stories; | $c: translated [from the Japanese] by Edward G. Seidensticker.
## 2452                                                                                                                                                                                                                                                                                    Herod's children / | $c: Ilse Aichinger ; translated from the German by Cornelia Schaeffer.
## 2453                                                                                                                                                                                                                                                                                                  La maison de rendez-vous. | $c: Translated from the French by Richard Howard.
## 2454                                                                                                                                                                                                                                                                                                                                                               At Lady Molly's.
## 2455                                                                                                                                                                                                                                                                                                                           The golden casket; | Chinese novellas two millennia.
## 2456                                                                                                                                                                                                                                                                                           The heritage / | $c: Siegfried Lenz ; translated from the German by Krishna Winston.
## 2457                                                                                                                                                                                                                                                                                                           The Barsac mission. | $c: Translated from the French by I. O. Evans.
## 2458                                                                                                                                                                                                                                                                                                           The Barsac mission. | $c: Translated from the French by I. O. Evans.
## 2459                                                                                                                                                                                                                                                                                                                                             Young shoulders / | $c: John Wain.
## 2460                                                                                                                                                                                                                                                                                                The magicians; | the occult in fact and fiction. | $c: Introd. by Colin Wilson.
## 2461                                                                                                                                                                                                                                                                                                                                                                       One day.
## 2462                                                                                                                                                                                                                                                                                                                                               Tambourines to glory; | a novel.
## 2463                                                                                                                                                                                                                                                                               Peasants and other stories / | $c: Anton Chekhov ; selected and with a preface by Edmund Wilson.
## 2464                                                                                                                                                                                                                                                                                                                                                               Sword at sunset.
## 2465                                                                                                                                                                                                                                                                                                                      Secret lives and other stories / | $c: Ngugi wa Thiongʾo.
## 2466                                                                                                                                                                                                                                                                                                                                                        More pricks than kicks.
## 2467                                                                                                                                                                                                                                                                                                                        Tales / | $c: E.T.A. Hoffmann ; edited by Victor Lange.
## 2468                                                                                                                                                                                                                                                                                                                                                        The world in the attic.
## 2469                                                                                                                                                                                                                                                                                                                                                              The pool of fire.
## 2470                                                                                                                                                                                                                                                                                                  1934 / | $c: Alberto Moravia ; translated from the Italian by William Weaver.
## 2471                                                                                                                                                                                                                                                                                                 The face of another / | $c: [translated from the Japanese by E. Dale Saunders.
## 2472                                                                                                                                                                                                                                                                                           Modern Iraqi short stories / | $c: translated by Ali M. Cassimy, W. McClung Frazier.
## 2473                                                                                                                                                                                                                                                                                                                                                                 The inspector.
## 2474                                                                                                                                                                                                                                                                                                                                             The Bad Lands / | $c: Oakley Hall.
## 2475                                                                                                                                                                                                                                                                                                                                                      The emigrants, | a novel:
## 2476                                                                                                                                                                                                                                                                                             The late Mattia Pascal / | $c: by Luigi Pirandello ; translated by William Weaver.
## 2477                                                                                                                                                                                                                                                                                   Ashes and diamonds | $c: [by] George Andrzeyevski. Translated from the Polish by D.F. Welsh.
## 2478                                                                                                                                                                                                                                                                                Requiem for Naʾaman / | $c: by Benjamin Tammuz ; translated by Mildred Budny and Yehuda Safran.
## 2479                                                                                                                                                                                                                                              Stories from a Ming collection. | $c: Translations of Chinese short stories published in the seventeenth century, by Cyril Birch.
## 2480                                                                                                                                                                                                                                                       Short stories / | $c: by Luigi Pirandello ; translated from the Italian by Lily Duplaix ; introduction by Frances Keene.
## 2481                                                                                                                                                                                                                                                                                                                                  Tristan, | $c: translated for the first time.
## 2482                                                                                                                                                                                                                                                                                                 Unto a good land, | a novel; translated from the Swedish by Gustaf Lannestock.
## 2483                                                                                                                                                                                                                                                                                              The hermit / | $c: Eugène Ionesco ; translated from the French by Richard Seaver.
## 2484                                                                                                                                                                                                                                                            Sara Videbeck. | The chapel. | $c: Translated from the Swedish by Adolph Burnett Benson. Introd. by Staffan Björck.
## 2485                                                                                                                                                                                                                                                                                                                Hearing secret harmonies : | a novel / | $c: by Anthony Powell.
## 2486                                                                                                                                                                                                                                                                                                           Best short stories / | $c: with an introduction by James T. Farrell.
## 2487                                                                                                                                                                                                                                                                                                            The wanderer / | $c: by Mika Waltari ; translated by Naomi Walford.
## 2488                                                                                                                                                                                                                                                                                                                            The dark angel / | $c: translated by Naomi Walford.
## 2489                                                                                                                                                                                                                                Russian stories and legends / | $c: Leo Tolstoy ; [translated from the Russian by Louise and Aylmer Maude] Illustration by Alexander Alexeieff.
## 2490                                                                                                                                                                                                                                   The eighth day of the week / | $c: Marek Hlasko ; translated from the Polish by Norbert Guterman ; with an introd. by Harrison E. Salisbury.
## 2491                                                                                                                                                                                                                                                                                                                                                           Next stop--paradise.
## 2492                                                                                                                                                                                                                                                                                                                                              Kronk; | a science fiction novel.
## 2493                                                                                                                                                                                                                                                                                                                     The unreasoning heart / | $c: by Constance Beresford-Howe.
## 2494                                                                                                                                                                                                                                                                                                                                                        The well of loneliness.
## 2495                                                                                                                                                                                                                   Nobody : | or, The disgospel according to Maria Dementnaya = Nikto : a samizdat text / | $c: translated from the Russian, with an introd. by April FitzLyon.
## 2496                                                                                                                                                                                                                                                                                                                                               The walker, | and other stories.
## 2497                                                                                                                                                                                                                                                                                                                                                 The acceptance world, a novel.
## 2498                                                                                                                                                                                                                                                                                                                          The change-child / | $c: Illustrated by Gareth Floyd.
## 2499                                                                                                                                                                                                                                                       Acquainted with the night; | a novel. | $c: Translated [from the German Und sagte kein einziges Wort] by Richard Graves.
## 2500                                                                                                                                                                                                                                                                              The city & the mountains / | $c: Eça de Queiroz ; translated from the Portuguese by Roy Campbell.
## 2501                                                                                                                                                                                                                                                                                                                                                                 An alien heat.
## 2502                                                                                                                                                                                                                                                                               The daughter; | the diary of an Israeli girl. | $c: [Translated from the Hebrew by Zwi Wineberg]
## 2503                                                                                                                                                                                                                                                                              Winning a wife & other stories, | $c: by Peter Neogoë; with an introduction by Edward J. O'Brien.
## 2504                                                                                                                                                                                                                                                                                                                                                                   What is man?
## 2505                                                                                                                                                                                                                                                                                                            The good light / | $c: Karl Bjarnhof ; translated by Naomi Walford.
## 2506                                                                                                                                                                                                                                                          The early science fiction stories of Thomas M. Disch / | $c: Thomas M. Disch ; with a new introd. by Robert Thurston.
## 2507                                                                                                                                                                                                                                                                                               Children are civilians too. | $c: Translated from the German by Leila Vennewitz.
## 2508                                                                                                                                                                                                                                                                                                                                          The snow queen / | $c: Joan D. Vinge.
## 2509                                                                                                                                                                                                                                                                      Short novels and other writings / | $c: Theodor Fontane ; edited by Peter Demetz ; foreword by Peter Gay.
## 2510                                                                                                                                                                                                                                                                                                      Two women / | $c: Harry Mulisch ; translated from the Dutch by Els Early.
## 2511                                                                                                                                                                                                                                                                   Asahel : | a novel / | $c: by Aharon Megged ; translated from Hebrew by Robert Whitehill and Susan C. Lilly.
## 2512                                                                                                                                                                                                                                                                                               The mountain inn, and other stories; | a new translation | $c: by H.N.P. Sloman.
## 2513                                                                                                                                                                                                                                                                                                             Effi Briest. | $c: Translated, with an introd., by Douglas Parmée.
## 2514                                                                                                                                                                                                                                                                 Marcovaldo, or, The seasons in the city / | $c: Italo Calvino ; translated from the Italian by William Weaver.
## 2515                                                                                                                                                                                                                                                                     The Garies and their friends, | $c: by Frank J. Webb. With an introductory pref. by Mrs. Harriet B. Stowe.
## 2516                                                                                                                                                                                                                                                                                                                                Madame Bovary; | $c: translated from the French
## 2517                                                                                                                                                                                                                                                                                            Crime and punishment, | $c: by Fyodor Dostoyevsky; translated by Constance Garnett.
## 2518                                                                                                                                                                                                                                                                                                                                                                Tribal justice.
## 2519                                                                                                                                                                                                                             From Camelot to Joyous Guard. | The Old French La Mort le roi Artu. | $c: Translated by J. Neale Carman. Edited with an introd. by Norris J. Lacy.
## 2520                                                                                                                                                                                                                                                                                     The last letter home : | a novel / | $c: translated from the Swedish by Gustaf Lannestock.
## 2521                                                                                                                                                                                                                                                                                                                                                                   The omnibus.
## 2522                                                                                                                                                                                                                                                                            All men are brothers (Shui hu chuan) / | $c: Shui hu chuan ; tr. from the Chinese by Pearl S. Buck.
## 2523                                                                                                                                                                                                                                                                           I am a cat / | $c: Natsume Soseki ; translated from the Japanese by Katsue Shibata and Motonari Kai.
## 2524                                                                                                                                                                                                                                                                                                                   The Chaneysville incident : | a novel / | $c: David Bradley.
## 2525                                                                                                                                                                                                                                                       Italian fables / | $c: by Italo Calvino ; translated from the Italian by Louis Brigante, illustrated by Michael Train.--
## 2526                                                                                                                                                                                                                              Slaves of love and other Norwegian short stories / | $c: selected and edited by James McFarlane ; translated by James McFarlane and Janet Garton.
## 2527                                                                                                                                                                                                                                                                                     Complete short stories & Three fat men / | $c: Yuri Olesha ; translated by Aimee Anderson.
## 2528                                                                                                                                                                                                                                                                                                                                                          A glass of blessings.
## 2529                                                                                                                                                                                                                                                                                                      The disappearance of Odile. | $c: Translated from the French by Lyn Moir.
## 2530                                                                                                                                                                                                                                                                                            The neighbours; | $c: translated from the French by Christopher Sinclair-Stevenson.
## 2531                                                                                                                                                                                                                                                                                          The bells of Bicêtre | $c: [by] Simenon. [Translated from the French by Jean Stewart.
## 2532                                                                                                                                                                                                                                                                                                                                    Five times Maigret / | $c: Georges Simenon.
## 2533                                                                                                                                                                                                                                                                                        The house of Quai Notre Dame / | $c: Georges Simenon ; translated by Alastair Hamilton.
## 2534                                                                                                                                                                                                                                                                                                                                                                     The abyss;
## 2535                                                                                                                                                                                                                                                                              Jenny Treibel / | $c: Theodor Fontane : translated with introduction and notes by Ulf Zimmermann.
## 2536                                                                                                                                                                                                                                                                                                                                The prodigy. | $c: Translated by W.J. Strachan.
## 2537                                                                                                                                                                                                                                                                                                          SS-GB : | Nazi-occupied Britain, 1941 : a novel / | $c: Len Deighton.
## 2538                                                                                                                                                                                                                                                                                                                                                                  South Street.
## 2539                                                                                                                                                                                                                                                                                  The family / | $c: Toson Shimazaki ; translated and with an introd. by Cecilia Segawa Seigle.
## 2540                                                                                                                                                                                                                                                                                                                                                     The man without qualities.
## 2541                                                                                                                                                                                                                                                                                             A portrait of the artist as a young man. | $c: With six drawings by Robin Jacques.
## 2542                                                                                                                                                                                                                                                                                                                  Vijaya, | $c: by Sharat Chandra. Translated by Chandra Auluck
## 2543                                                                                                                                                                                                                                                                           Chandranath (Queen's gambit) | $c: by Saratchandra Chattopadhyaya. Translated by Sachindralal Ghosh.
## 2544                                                                                                                                                                                                                                                           The real life of Domingos Xavier / | $c: [by] Luandino Vieria ; translated [from the Portuguese] by Michael Wolfers.
## 2545                                                                                                                                                                                                                                                                                                                                                           King rat, | a novel.
## 2546                                                                                                                                                                                                                                                                                                          Clotelle; or, The colored heroine, : | a tale of the Southern States.
## 2547                                                                                                                                                                                                                                                                            Dearest Father; stories and other writings / | $f: Translated by Ernst Kaiser and Eithne Wilkins. -
## 2548                                                                                                                                                                                                                                                                                                                                                      The keepers of the house.
## 2549                                                                                                                                                                                                                                                                                                                       The last convertible : | a novel / | $c: by Anton Myrer.
## 2550                                                                                                                                                                                                                                                                                                                     Wright Morris: a reader. | $c: Introd. by Granville Hicks.
## 2551                                                                                                                                                                                                                                                                                              Journey without end / | $c: Manès Sperber ; translated by Constantine Fitzgibbon.
## 2552                                                                                                                                                                                                                                                                                                                The burned bramble; | $c: translated by Constantine Fitzgibbon.
## 2553                                                                                                                                                                                                                                                                                             Sketches from a hunter's album, | $c: selected and translated by Richard Freeborn.
## 2554                                                                                                                                                                                                                                           Memory and agony : | Dutch stories from Indonesia / | $c: collected and introduced by Rob Nieuwehuys ; translated by Adrienne Dixon.
## 2555                                                                                                                                                                                                                                                                                                                The loved and the unloved / | $c: translated by Gerard Hopkins.
## 2556                                                                                                                                                                             Midland; | twenty-five years of fiction and poetry selected from the writing workshops of the State University of Iowa. | $c: Edited by Paul Engle, assisted by Henri Coulette and Donald Justice.
## 2557                                                                                                                                                                                                                                                                                                                                                             Voss : | a novel /
## 2558                                                                                                                                                                                                                                                                             A people betrayed : | a novel / | $c: Alfred Döblin ; translated from the German by John E. Woods.
## 2559                                                                                                                                                                                                                                                                                                 Babel-17 / | $c: Samuel R. Delany ; with a new introduction by Robert Scholes.
## 2560                                                                                                                                                                                                                                                                                                                                 The lake. | $c: Translated by Reiko Tsukimura.
## 2561                                                                                                                                                                                                                                                                                            The eagle of the Ninth / | $c: Rosemary Sutcliff ; illustrated by C. Walter Hodges.
## 2562                                                                                                                                                                                                                                                                                                                                                          The cosmological eye.
## 2563                                                                                                                                                                                                                                                                                       Days of hope; | $c: translated from the French by Stuart Gilbert and Alastair Macdonald.
## 2564                                                                                                                                                                                                                                                                                                         Description of a struggle / | $f: translated by Tania and James Stern.
## 2565                                                                                                                                                                                                                                                                                                                                       Ruth / | $c: Elizabeth Cleghorn Gaskell.
## 2566                                                                                                                                                                                                                                                                                                                                                               The face of war.
## 2567                                                                                                                                                                                                                                  Insatiability : | a novel in two parts / | $c: by Stanisław Ignacy Witkiewicz ; translated, with an introd. and commentary by Louis Iribarne.
## 2568                                                                                                                                                                                                                                                 The unknown Chekhov: stories and other writings hitherto untranslated. | $c: Translated with an introd. by Avrahm Yarmolinsky.
## 2569                                                                                                                                                                                                                                                                                                                                         Novels, 1871-1880 / | $c: Henry James.
## 2570                                                                                                                                                                                                                                                                                                   Bunter's last fling, | $c: by Frank Richards. Illustrations by C.H. Chapman.
## 2571                                                                                                                                                                                                                                                                                                 The man who gave the Beatles away / | $c: Allan Williams and William Marshall.
## 2572                                                                                                                                                                                                                                                             The Chinese gold murders; | a Chinese detective story. | $c: With ten plates drawn by the author in Chinese style.
## 2573                                                                                                                                                                                                                                                                                                                                                            A strange marriage.
## 2574                                                                                                                                                                                                                                                                                                Remember Ruben / | $c: Mongo Beti ; translated from the French by Gerald Moore.
## 2575                                                                                                                                                                                                                                                                             The winds of Darkover / | $c: Marion Zimmer Bradley ; with a new introd. by Marion Zimmer Bradley.
## 2576                                                                                                                                                                                                                                                                                                                                                                      The Liar.
## 2577                                                                                                                                                                                                                                                                     Against the wind : | stories / | $c: by Martin A. Hansen ; translated, with an introd., by H. Wayne Schow.
## 2578                                                                                                                                                                                                                                                             Rashomon, | and other stories; | $c: translated by Takashi Kojima. Introd. by Howard Hibbett. Illus. by M. Kuwata.
## 2579                                                                                                                                                                                                                                                                                       The compromise / | $c: by Sergei Dovlatov ; translated from the Russian by Anne Frydman.
## 2580                                                                                                                                                                                                                               Maigret right and wrong, | $c: comprising Maigret in Montmartre [translated by Daphne Woodward] and Maigret's mistake [translated by Alan Hodge]
## 2581                                                                                                                                                                                                                                                              The quilt and other stories / | $c: by Tayama Katai ; translated and with an introduction by Kenneth G. Henshall.
## 2582                                                                                                                                                                                                                                                                                                                                                          Affairs of the heart.
## 2583                                                                                                                                                                             Tales from the Arab tribes; | a collection of the stories told by the Arab tribes of the lower Euphrates. | $c: Translated and set down by C. G. Campbell and illustrated by John Buckland-Wright.
## 2584                                                                                                                                                                                                                                                                      The ten thousand things / | $c: by Maria Dermoût ; translated by Hans Koning ; afterword by E.M. Beekman.
## 2585                                                                                                                                                                                                                                                                               The vizier's elephant; | three novellas. | $c: Translated from the Serbo-Croat by Drenka Willen.
## 2586                                                                                                                                                                                                                                                                                                                                   The Maltese falcon / | $c: Dashiell Hammett.
## 2587                                                                                                                                                                                                                                                                                                           Malone dies, | $c: a novel translated from the French by the author.
## 2588                                                                                                                                                                                                                                           The emperor's pearl, | a Chinese detective story, | $c: by Robert van Gulik. With eight illus. drawn by the author in Chinese style.
## 2589                                                                                                                                                                                                                                                                                                       The three musketeers / | $c: Alexandre Dumas ; introd. by Marcel Girard.
## 2590                                                                                                                                                                                                                                                                                                           The Oxford Chekhov. / | $c: Translated and edited by Ronald Hingley.
## 2591                                                                                                                                                                                                                                                                                                           The Oxford Chekhov. / | $c: Translated and edited by Ronald Hingley.
## 2592                                                                                                                                                                                                                                                                                                                                     The Chinese bandit / | $c: Stephen Becker.
## 2593                                                                                                                                                                                                                                                        Bread and wine. | $c: A new version translated from the Italian by Harvey Fergusson II, with a new pref. by the author.
## 2594                                                                                                                                                                                                                                                                                                    49 days : | a novel / | $c: Amrita Pritam ; translated by Krishna Gorowara.
## 2595                                                                                                                                                                                                                                                                                  The kiss and other stories / | $c: Chekhov ; translated with an introduction by Ronald Wilks.
## 2596                                                                                                                                                                                                                                                                                                                     The three-cornered world. | $c: Translated by Alan Turney.
## 2597                                                                                                                                                                                                                                                                                                                       Jealousy, | a novel. | $c: Translated by Richard Howard.
## 2598                                                                                                                                                                                                                                                                                 Beauty and sadness / | $c: Yasunari Kawabata ; translated from the Japanese by Howard Hibbett.
## 2599                                                                                                                                                                                                                                                                                           Chemmeen; | a novel. | $c: Translated by Narayana Menon. Introd. by Santha Rama Rau.
## 2600                                                                                                                                                                                                                                                 Lucky Kristoffer | $c: [by] Martin A. Hansen. Translated from the Danish by John Jepson Egglishaw. Introd. by Niels Ingwersen.
## 2601                                                                                                                                                                                                                                                                                                                                                              Roll, Shenandoah.
## 2602                                                                                                                                                                                                                                                                                                                                                            The Mezentian Gate.
## 2603                                                                                                                                                                                                                                                                              The tennis players / | $c: Lars Gustafsson ; translated from the Swedish by Yvonne I. Sandstroem.
## 2604                                                                                                                                                                                                                                                                                                            The inquisitors / | $c: translated from the Polish by Konrad Syrop.
## 2605                                                                                                                                                                                                                                                                                   Ashes and diamonds | $c: [by] George Andrzeyevski. Translated from the Polish by D.F. Welsh.
## 2606                                                                                                                                                                                                                                                                                                                                 Gods of riverworld / | $c: Philip José Farmer.
## 2607                                                                                                                                                                                                                                                                       Different : | an anthology of homosexual short stories / | $c: edited with an introd. by Stephen Wright.
## 2608                                                                                                                                                                                                                                                                                                   The greatest gamble; | $c: translated from the Norwegian by Maurice Michael.
## 2609                                                                                                                                                                                                                                                                                                                                        The time masters / | $c: Wilson Tucker.
## 2610                                                                                                                                                                                                                                                                                                                                                                      The earl.
## 2611                                                                                                                                                                                                                                                                                                                                         The origin of the Brunists: | a novel.
## 2612                                                                                                                                                                                                                                                                                               The dynamiter, | $c: by Robert Louis Stevenson and Fanny Van de Grift Stevenson.
## 2613                                                                                                                                                                                                                                                        The broken nest; | (Nashtanir). | $c: Translated by Mary M. Lago and Supriya Sen. With an introduction by Mary M. Lago.
## 2614                                                                                                                                                                                                                                                                                                                               Levitation, five fictions / | $c: Cynthia Ozick.
## 2615                                                                                                                                                                                                                                            The stone cross | $c: [by] Vasyl Stefanyk. Translated from the Ukrainian by Joseph Wiznuk, in collaboration with C. H. Andrusyshen.
## 2616                                                                                                                                                                                                                                                The Romance of Tristan and Isolt. | $c: Translated from the Old French by Norman B. Spector. With a foreword by Eugène Vinaver.
## 2617                                                                                                                                                                                                                                                                       Life in the tomb / | $c: by Stratis Myrivilis ; translated from the modern Greek original by Peter Bien.
## 2618                                                                                                                                                                                                                                                                                                                                      The death of the novel and other stories.
## 2619                                                                                                                                                                                                                                                                                                           The satyricon. | $c: Translated and with an introd. by Paul Dinnage.
## 2620                                                                                                                                                                                                                                                                    I want to live; | short stories | $c: [by] Vasily Shukshin. [Translated from the Russian by Robert Daglish]
## 2621                                                                                                                                                                                                                                       The thirteenth labour of Hercules / | $c: Fazil Iskander ; [translated from the Russian by Robert Daglish ; illustrated by Lev Katayev].
## 2622                                                                                                                                                                                                                                                                                                                  Agatha Moudio's son. | $c: Translated by Joyce A. Hutchinson.
## 2623                                                                                                                                                                                                                                                                                                           The conquerors / | $c: André Malraux ; translated by Stephen Becker.
## 2624                                                                                                                                                                                                                                                                                                                          God is not a fish inspector / | $c: W. D. Valgardson.
## 2625                                                                                                                                                                                                                                                      Alexander the Great : | a novel / | $c: Nikos Kazantzakis ; translated by Theodora Vasils, illustrated by Virgil Burnett.
## 2626                                                                                                                                                                                                                                                                                                                                      The black marble / | $c: Joseph Wambaugh.
## 2627                                                                                                                                                                                                                                                                                                                                       Kalki : | a novel / | $c: by Gore Vidal.
## 2628                                                                                                                                                                                                                                                                         The brothers Karamazov, | $c: by Fyodor Dostoyevsky. Translated from the Russian by Constance Garnett.
## 2629                                                                                                                                                                                                                                                                                                                                                                   Juniper Loa.
## 2630                                                                                                                                                                                                                                                The violent land. | $c: Translated from the Portuguese (Terras do sem fim) by Samuel Putnam. With a new foreword by the author.
## 2631                                                                                                                                                                                                                                                    The secret history of the Lord of Musashi ; and, Arrowroot / | $c: Junʾichirō Tanizaki ; translated by Anthony H. Chambers.
## 2632                                                                                                                                                                                                                                                                               The shattered chain / | $c: Marion Zimmer Bradley ; with a new introd. by Marion Zimmer Bradley.
## 2633                                                                                                                                                                                                                                                                  Twice twenty-two: | The golden apples of the sun. A medicine for melancholy. | $c: Drawings, by Joe Mugnaini.
## 2634                                                                                                                                                                                                                                                                                          Maigret and the wine merchant. | $c: Translated from the French by Eileen Ellenbogen.
## 2635                                                                                                                                                                                                                                                                                                     Secret rendezvous / | $c: by Kobo Abé ; translated by Juliet W. Carpenter.
## 2636                                                                                                                                                                                                                                                                                                Dear fatherland. | $c: Translated from the German by Richard and Clara Winston.
## 2637                                                                                                                                                                                                                                                                                 Barabbas; translated by Alan Blair, | with a pref. by Lucien Maury and a letter by André Gide.
## 2638                                                                                                                                                                                                          Finding the center; | narrative poetry of the Zuñi Indians. | $c: Translated by Dennis Tedlock. From performances in the Zuñi by Andrew Peynetsa and Walter Sanchez. 
## 2639                                                                                                                                                                                                                                                                                                                              Two captains. | $c: [Translation by Brian Pearce]
## 2640                                                                                                                                                                                                                                                               Molloy; Malone dies and The unnamable : | three novels / | $c: Samuel Beckett, | $f: translated from the French.
## 2641                                                                                                                                                                                                                                                                                                 The seizure of power / | $c: Czeslaw Milosz ; translated by Celina Wieniewska.
## 2642                                                                                                                                                                                                                                                                                              L'abbé C : | a novel / | $c: by Georges Bataille ; translated by Philip A. Facey.
## 2643                                                                                                                                                                                                                                                                                                  One day in the "New Life" / | $c: Fyodor Abramov ; translated by David Floyd.
## 2644                                                                                                                                                                                                                                                          Perpetua and the habit of unhappiness / | $c: [by] Mongo Beti ; translated from the French by John Reed & Clive Wake.
## 2645                                                                                                                                                                                                                                                                             Meek heritage; | a novel. | $c: [Originally translated by Alex Matson, and rev. by John R. Pitkin.
## 2646                                                                                                                                                                                                                                                                                                        Hymn of the spirit / | $c: Han Malsook ; translated by Suzanne Crowder.
## 2647                                                                                                                                                                                                                         The son of mad Mat Lela / | $c: Ishak Haji Muhammad ; translated by Harry Aveling with an introduction by Phillip L. Thomas ; illustrated by Rita Lim.
## 2648                                                                                                                                                                                                                                                                                                                      The man in the gray flannel suit II / | $c: Sloan Wilson.
## 2649                                                                                                                                                                                                                                                                                                                          No refuge : | science-fiction / | $c: by John Boland.
## 2650                                                                                                                                                                                                                                                                                          Hal Porter / | $c: selected and edited with an introd. and bibliography by Mary Lord.
## 2651                                                                                                                                                                                                                                                                                                         Kavanagh; | a tale. | $c: Edited for the modern reader by Jean Downey.
## 2652                                                                                                                                                                                                                                                           Tell me, Bella: | a selection of stories; | $c: compiled and translated from the Armenian [MSS.] by Misoha Kudian. -
## 2653                                                                                                                                                                                                                                                                                                                                              Affliction / | $c: Russell Banks.
## 2654                                                                                                                                                                                                                                                                                                           The Caine mutiny : | a novel of World War II / | $c: by Herman Wouk.
## 2655                                                                                                                                                                                                                                                                                                                                   The dramaturges of Yan / | $c: John Brunner.
## 2656                                                                                                                                                                                                                                                                                               Three mint lollipops. | $c: Translated by Patsy Southgate and Joan Wright Smith.
## 2657                                                                                                                                                                                                                                                                           No time for tombstones; | life and death in the Vietnamese jungle | $c: [by] James and Marti Hefley.
## 2658                                                                                                                                                                                                                                                                                         A simple story / | $c: S.Y. Agnon ; translated and with an afterword by Hillel Halkin.
## 2659                                                                                                                                                                                                                                                          A shameful revenge, and other stories. | $c: Translated with an introd. by John Sturrock. Illustrated by Eric Fraser.
## 2660                                                                                                                                                                                                                                                                                                              Road to nowhere. | $c: Translated from the Polish by Lew Sapieha.
## 2661                                                                                                                                                                                                                                                                                              Five seasons / | $c: A.B. Yehoshua ; translated from the Hebrew by Hillel Halkin.
## 2662                                                                                                                                                                                                                                                                                                       Women of Messina. | $c: Translated by Frances Frenaye and Frances Keene.
## 2663                                                                                                                                                                                                                                                               Five thousand runaways / | $c: stories by Takeshi Kaiko ; translated from the Japanese by Cecilia Segawa Seigle.
## 2664                                                                                                                                                                                                                                                                                                               The silent cry / | $c: Kenzaburo Oe ; translated by John Bester.
## 2665                                                                                                                                                                                                                                                                                                         Maigret and the bum. | $c: Translated from the French by Jean Stewart.
## 2666                                                                                                                                                                                                                                                                                                          Selected stories. | $c: Translated from the Hebrew by Shoshana Perla.
## 2667                                                                                                                                                                                                                                                                                                                       The happy warriors / | $c: Translated by Katherine John.
## 2668                                                                                                                                                                                                                                                                                São Bernardo / | $c: Graciliano Ramos ; translated from the Portuguese by R.L. Scott-Buccleuch.
## 2669                                                                                                                                                                                                                                                                                                                              Belchamber. | $c: With an introd. by Alan Harris.
## 2670                                                                                                                                                                                                                                                                                                  The last temptation of Christ. | $c: Translated from the Greek by P. A. Bien.
## 2671                                                                                                                                                                                                                                                                                           Paris interlude / | $c: Naim Kattan ; translated from the French by Sheila Fischman.
## 2672                                                                                                                                                                                                                                                                                                                                                              The beast in man.
## 2673                                                                                                                                                                                                                                                                                                               The dwarf. | $c: [Translated from the Swedish by Alexandra Dick]
## 2674                                                                                                                                                                                                                               Wings; prose and poetry / | $c: by Mikhail Kuzmin. Translated and edited by Neil Granoien and Michael Green. With a pref. by Vladimir Markov. -.
## 2675                                                                                                                                                                                                                                                                                                                 Darkness in summer. | $c: Translated by Cecilia Segawa Seigle.
## 2676                                                                                                                                                                                                                                                                         Across Paris, and other stories, | $c: translated from the French and with an introd. by Norman Denny.
## 2677                                                                                                                                                                                                                                                 God's world; an anthology of short stories | $c: [by] Nagib Mahfuz. Translated with an introd. by Akef Abadir and Roger Allen.
## 2678                                                                                                                                                                                                          Two Spanish picaresque novels: | Lazarillo de Tormes, anon; The swindler (El buscón) | $c: [por] Francisco de Quevedo. Translated from the Spanish by Michael Alpert.
## 2679                                                                                                                                                                                                                                                                                                                                                           God bless the child.
## 2680                                                                                                                                                                                                                                                                        I, Lars Hård / | $c: by Jan Fridegård ; translated, with an introduction and notes, by Robert E. Bjork.
## 2681                                                                                                                                                                                                                                                                                                                                 Nostromo; | $c: introd. by Robert Penn Warren.
## 2682                                                                                                                                                                                                                                                                                                                      Free air. | $c: New York, Harcourt, Brace and Howe, 1919.
## 2683                                                                                                                                                                                                                                                                                   The sky above hell and other stories / | $c: by Yuri Mamleyev ; translated by H. W. Tjalsma.
## 2684                                                                                                                                                                                                                                                                                                                                           Plague ship / | $c: by Andre Norton.
## 2685                                                                                                                                  Typee : | a peep at Polynesian life ; Omoo : a narrative of adventures in the South Seas ; Mardi : and a voyage thither / | $c: Herman Melville ; [G. Thomas Tanselle wrote the notes and chronology and selected the texts for this volume].
## 2686                                                                                                                                                                                                                                                                                                                                                Round the world in eighty days.
## 2687                                                                                                                                                                                                                                                                                                                                 The mute. | $c: Translated by Michael Bullock.
## 2688                                                                                                                                                                                                                                                                                                                                          Queen's play / | $c: Dorothy Dunnett.
## 2689                                                                                                                                                                                                                                                                                                                             Such is my beloved. | $c: Introd. by Malcolm Ross.
## 2690                                                                                                                                                                                                                                                                                                              A fine and private place : | a novel / | $c: by Morley Callaghan.
## 2691                                                                                                                                                                                                                                                                                                                                             World's end / | $c: Joan D. Vinge.
## 2692                                                                                                                                                                                                                                                                                                                    The admiral's wolf pack. | $c: Translated by J. F. Bernard.
## 2693                                                                                                                                                                                                                                                                                                                               Live bait and other stories / | $c: Frank Tuohy.
## 2694                                                                                                                                                                                                                                                                              Conjure wife / | $c: Fritz Leiber ; with new introductions by Charles L. Grant and Foster Hirsch.
## 2695                                                                                                                                                                                                                                                                                                                The guinea pigs; | a novel. | $c: Translated by Káča Poláčkova.
## 2696                                                                                                                                                                                                                                                                                                                                                            Claudine at school;
## 2697                                                                                                                                                                                                                                                                                                               Short stories / | $c: Lev Tolstoy ; translated from the Russian.
## 2698                                                                                                                                                                                                                                                                                                                      Lyonesse : | book I, Suldrun's garden / | $c: Jack Vance.
## 2699                                                                                                                                                                                                                                                                                                                                  Game in diamonds / | $c: by Elizabeth Cadell.
## 2700                                                                                                                                                                                                                                                                                                                            Autumn in spring, and other stories / | $c: Ba Jin.
## 2701                                                                                                                                                                                                                                                                                                                                        Flowers of darkness / | $c: Matt Cohen.
## 2702                                                                                                                                                                                                                                                                                                                 Night flights : | stories new and selected / | $c: Matt Cohen.
## 2703                                                                                                                                                                                                                                                                                  No harvest but a thorn, | $c: [by] Shahnon Ahmad; translated and introduced by Adibah Amin. -
## 2704                                                                                                                                                                                                                                                                       The woman who could not read, and other tales, | $c: by Michael Zoshchenko. Translated by Elisaveta Fen.
## 2705                                                                                                                                                                                                                                                                                                                         Hardwater country : | stories / | $c: Frederick Busch.
## 2706                                                                                                                                                                                                                                                                                         Somerset dreams and other fictions / | $c: Kate Wilhelm ; foreword by R. Glenn Wright.
## 2707                                                                                                                                                                                                                                                  Daredevils of Sassoun : | the Armenian national epic / | $c: [translated] by Leon Surmelian ; illustrated by Paul Sagsoorian.
## 2708                                                                                                                                                                                                                                                                                          Earth / | $c: Émile Zola ; | $f: [Translated by Ann Lindsay] ; pref. by Angus Wilson.
## 2709                                                                                                                                                                                                                                                                                                                                                                   Poor George.
## 2710                                                                                                                                                                                                                                                                                                 The heart of a man / | $c: by Georges Simenon ; [translated by Louise Varèse].
## 2711                                                                                                                                                                                                                                                                                       The others / | $c: by Georges Simenon ; translated from the French by Alastair Hamilton.
## 2712                                                                                                                                                                                                                                                                Maigret and the man on the boulevard / | $c: Georges Simenon ; translated from the French by Eileen Ellenbogen.
## 2713                                                                                                                                                                                                                                                                                        Aunt Jeanne / | $c: Georges Simenon ; translated from the French by Geoffrey Sainsbury.
## 2714                                                                                                                                                                                                                                                                                                                                                                Take these men.
## 2715                                                                                                                                                                                                                                                                                                                                     Petals of blood / | $c: Ngugi Wa Thiong'o.
## 2716                                                                                                                                                                                                                                                                                                                                                      The return of Lady Brace.
## 2717                                                                                                                                                                                                                                                                                                                                       Fingers in the door | and other stories.
## 2718                                                                                                                                                                                                                                                                                             A stranger came to the farm / | $c: by Mika Waltari : translated by Naomi Walford.
## 2719                                                                                                                                                                                                                                                                                                          Weights and measures / | $c: Joseph Roth; translated by David Le Vay.
## 2720                                                                                                                                                                                                                                                                                             Correction / | $c: Thomas Bernhard ; translated from the German by Sophie Wilkins.
## 2721                                                                                                                                                                                                                                                     Clinton Street, and other stories / | $c: Chaver Paver (Gershon Einbinder) ; translated from the Yiddish by Henry Goodman.
## 2722                                                                                                                                                                                                                                                                                                                                                                  The parasite,
## 2723                                                                                                                                                                                                                                                                                                                    The ogre. | $c: Translated from the French by Barbara Bray.
## 2724                                                                                                                                                                                                                                                                                                                                                            The snow was black;
## 2725                                                                                                                                                                                                                                                                                 The clans of darkness: Scottish stories of fantasy and horror; | $c: foreword by Angus Wilson.
## 2726                                                                                                                                                                                                                                                                                                                                                              What did it mean?
## 2727                                                                                                                                                                                                                                                                                                                                                               A double affair.
## 2728                                                                                                                                                                                                                                                                                                                       Peter the First. | $c: [Translated by Tatiana Shebunina]
## 2729                                                                                                                                                                                                                                                                                           Russian comic fiction. | $c: Edited, translated, and with an introd. by Guy Daniels.
## 2730                                                                                                                                                                                                                                                           A certain smile : | a novel / | $c: by Françoise Sagan [i.e. F. Quoirez] ; translated from the French by Anne Green.
## 2731                                                                                                                                                                                                                                                                                                        The grass widow : | a Father Dowling mystery / | $c: by Ralph McInerny.
## 2732                                                                                                                                                                                                                                      The school for wives. Robert. Geneiève, or The unfinished confidence / | $c: by André Gide ; translated from the French by Dorothy Bussy.
## 2733                                                                                                                                                                                                                                                                                                                               Welcome to Hard Times / | $c: by E. L. Doctorow.
## 2734                                                                                                                                                                                                                                                                                                     The dark room of Damocles. | $c: Translated from the Dutch by Roy Edwards.
## 2735                                                                                                                                                                                                                                                                                The Vatican cellars. | Les caves du Vatican. | $c: Translated from the French by Dorothy Bussy.
## 2736                                                                                                                                                                                                                                                                                                  The cart : | a novel / | $c: by Jacques Ferron ; translated by Ray Ellenwood.
## 2737                                                                                                                                                                                                                                                                                                                                                                  Universe 3. -
## 2738                                                                                                                                                                                                                                                                                                                                        Superluminal / | $c: Vonda N. McIntyre.
## 2739                                                                                                                                                                                                                                                                                                         The draft dodger / | $c: Louis Caron ; translated by David Toby Homel.
## 2740                                                                                                                                                                                                                                                                                                                                 Inside black Hollywood / | $c: by Carol Speed.
## 2741                                                                                                                                                                                                                                                                                                                                       Destination, void / | $c: Frank Herbert.
## 2742                                                                                                                                                            The figure on the boundary line : | selected prose / | $c: Christoph Meckel : edited by Christopher Middleton ; graphics by the author ; translations by Christopher Middleton, Brian Harris and Margaret Woodruff.
## 2743                                                                                                                                                                                                                                                                                                                                           Time after time / | $c: Molly Keane.
## 2744                                                                                                                                                                                                                                                                                                                   In constant flight : | stories / | $c: by Elizabeth Tallent.
## 2745                                                                                                                                                                                                                                                                                          One day of life / | $c: by Manlio Argueta ; translated from the Spanish by Bill Brow.
## 2746                                                                                                                                                                                                                                                                     Swann's way, | $c: by Marcel Proust, translated by C.K. Scott Moncrieff, introduction by Lewis Galantière.
## 2747                                                                                                                                                                                                                                                                            One day in the life of Ivan Denisovich / | $c: Alexander Solzhenitsyn ; translated by Ralph Parker.
## 2748                                                                                                                                                                                                                                                           Human landscapes / | $c: by Nazim Hikmet ; translated by Randy Blasing and Mutlu Konuk ; foreword by Denise Levertov
## 2749                                                                                                                                                                                                                                                                                                                                                            Von Ryan's Express.
## 2750                                                                                                                                                                                                                                                           Vietnamese women in society and revolution / | $c: [editing, Paul Grace ... et al. ; translations by Ngo Vinh Long].
## 2751                                                                                                                                                                                                                                                                                                         The rising sun / | $c: Amrita Pritam ; translated by Krishna Gorowara.
## 2752                                                                                                                                                                                                                                                                                                                        The legacy & other stories / | $c: by Shashi Deshpande.
## 2753                                                                                                                                                                                                                                                                                                                                              Zazie / | $c: by Raymond Queneau.
## 2754                                                                                                                                                                                                                                                                                                              Alive and dead in Indiana : | stories / | $c: by Michael Martone.
## 2755                                                                                                                                                                                                                                                                                                                          Something wicked this way comes / | $c: Ray Bradbury.
## 2756                                                                                                                                                                                                                                                                The Stone of truth, and other Irish folk tales / | $c: collected and translated from the Irish by Douglas Hyde.
## 2757                                                                                                                                                                                                                                                                                               Riceyman steps : | a novel / | $c: Arnold Bennett ; introduced by Frank Kermode.
## 2758                                                                                                                                                                                                                                                                                                              Corduroy / | $c: Adrian Bell. With an introduction by Susan Hill.
## 2759                                                                                                                                                                                                                                                                                                                                                                  Tempest-tost.
## 2760                                                                                                                                                                                                                                                    Tirant lo Blanc / | $c: by Joanot Martorell and Martí Joan de Galba ; translated and with a foreword by David H. Rosenthal.
## 2761                                                                                                                                                                                                                                                                                                                                                             The great fortune.
## 2762                                                                                                                                                                                                                                                                                     His monkey wife, or, Married to a chimp / | $c: John Collier ; introduced by Paul Theroux.
## 2763                                                                                                                                                                                                                                                                                                                                                   The Bodley Head Henry James.
## 2764                                                                                                                                                                                                                                                                                  The Macdermots of Ballycloran / | $c: Anthony Trollope ; with an introd. by Robert Lee Wolff.
## 2765                                                                                                                                                                                                                                                                                  Selected short stories of Isaac Bashevis Singer / | $c: edited and introduced by Irving Howe.
## 2766                                                                                                                                                                                                                                                                                                                                                             A hall of mirrors.
## 2767                                                                                                                                                                                                                                                                                                            In the storm / | $c: Sholom Aleichem ; translated by Aliza Shevrin.
## 2768                                                                                                                                                                                                    Two winters and three summers / | $c: Fyodor Abramov ; translated from the Russian by Jacqueline Edwards and Mitchell Schneider, with an introduction by Maurice Friedberg.
## 2769                                                                                                                                                                                                                                                                                                 The tree of knowledge. | $c: Translated from the Spanish by Aubrey F. G. Bell.
## 2770                                                                                                                                                                                                                                                                                                                    The family, | $c: by Pa Chin. Translated by Sidney Shapiro.
## 2771                                                                                                                                                                                                                                                              In the long run we are all dead : | a macroeconomics murder mystery / | $c: Murray Wolfson and Vincent Buranelli.
## 2772                                                                                                                                                                                                                                                                                  The weather in the streets / | $c: Rosamond Lehmann ; with a new introduction by Janet Watts.
## 2773                                                                                                                                                                                                                                                                                            Roman tales / | $c: by Alberto Moravia ; selected and translated by Angus Davidson.
## 2774                                                                                                                                                                                                                                                                              Dead souls; | $c: translated from the Russian by George Reavey, with an introd. by Maurice Bowra.
## 2775                                                                                                                                                                                                                                                                                                                                      Hunter's horn / | $c: by Harriette Arnow.
## 2776                                                                                                                                                                                                                                                                                                     The twilight years / | $c: Sawako Ariyoshi ; translated by Mildred Tahara.
## 2777                                                                                                                                                                                                                                                Letters from the underworld. | The gentle maiden. The landlady. | $c: Translated by C. J. Hogarth. Introd. by Nikolay Andreyev.
## 2778                                                                                                                                                                                                                                                                                                                             Decline and fall. | $c: Illustrated by the author.
## 2779                                                                                                                                                    The Iliad and the Odyssey : | the heroic story of the Trojan War [and] the fabulous adventures of Odysseus / | $c: adapted from the Greek classics of Homer by Jane Werner Watson ; pictures by Alice and Martin Provensen.
## 2780                                                                                                                                                                                                                                                                                           Hannibal and the bears, | $c: by Margaret J. Baker. Illustrated by C. Walter Hodges.
## 2781                                                                                                                                                                                                                                                                                The long ships; | a saga of the Viking age. | $c: Translated from the Swedish by Michael Meyer.
## 2782                                                                                                                                                                                                                                                                                                                  Among women only. Translated from the Italian by D. D. Paige.
## 2783                                                                                                                                                                                                                                                                                                                                                             The black obelisk.
## 2784                                                                                                                                                                                                                                                                                        Inferno / | $c: Larry Niven and Jerry Pournelle ; with a new introd. by Norman Spinrad.
## 2785                                                                                                                                                                                                                                                                                               Maigret's boyhood friend. | $c: Translated from the French by Eileen Ellenbogen.
## 2786                                                                                                                                                                                                                                                                                                      A soldier's legacy / | $c: Heinrich Böll ; translated by Leila Vennewitz.
## 2787                                                                                                                                                                                                                                                                                                                                   The book class / | $c: by Louis Auchincloss.
## 2788                                                                                                                                                                                                                                                                                                                                     Carpenter's gothic / | $c: William Gaddis.
## 2789                                                                                                                                                                                                                                                                                          Blind love / | $c: Patrick Cauvin ; translated from the French by Elaine P. Halperin.
## 2790                                                                                                                                                                                                                                                                                                                           The Iowa Baseball Confederacy / | $c: W.P. Kinsella.
## 2791                                                                                                                                                                                                                                                                                                                                       All we need of hell / | $c: Harry Crews.
## 2792                                                                                                                                                                                                                                          The blue flame-tree / | $c: Jean-Louis Baghio'o ; translated from the French by Stephen Romer ; with an introduction by Maryse Condé.
## 2793                                                                                                                                                                                                                                                                                                                                            The ring master / | $c: David Gurr.
## 2794                                                                                                                                                                                                                                                                                                                                  Last notes from home / | $c: Frederick Exley.
## 2795                                                                                                                                                                                                                                         Wandering in the garden, waking from a dream / | $c: Pai Hsien-yung ; translated by the author and Patia Yasin ; edited by George Kao.
## 2796                                                                                                                                                                                                                                                                                                                         A place on Earth : | a novel / | $c: by Wendell Berry.
## 2797                                                                                                                                                                                                                                                                                                                                                      Myself, Christopher Wren.
## 2798                                                                                                                                                                                                                                                                                                                                              The white birch-tree : | a novel.
## 2799                                                                                                                                                                                                                                                                                               The bushtrackers / | $c: Meja Mwangi ; based on the screenplay by Gary Strieker.
## 2800                                                                                                                                                                                                                                                                                      Ventures into the deep : | the thrill of scuba diving / | $c: photographs by Don Siverts.
## 2801                                                                                                                                                                                                                                                                                                                 In the time of Greenbloom | $c: [by] Gabriel Fielding [pseud.]
## 2802                                                                                                                                                                                                                                                                                                                 Mulata / | $c: translated from the Spanish by Gregory Rabassa.
## 2803                                                                                                                                                                                                                                                                                                                           The Unicorn; | $c: translated by Barrie Ellis-Jones.
## 2804                                                                                                                                                                                                                                  The burn : | a novel in three books : late sixties, early seventies / | $c: Vassily Aksyonov ; translated from the Russian by Michael Glenny.
## 2805                                                                                                                                                                                                                                                                                                                                               Other women / | $c: Lisa Alther.
## 2806                                                                                                                                                                                                                                                                                                          Spring snow. | $c: Translated from the Japanese by Michael Gallagher.
## 2807                                                                                                                                                                                                                                                                      Bouvard and Pecuchet; | $c: translated by T.W. Earp and G.W. Stonier. With an introd. by Lionel Trilling.
## 2808                                                                                                                                                                                                                                                                                                                                                       Birthplace of the winds.
## 2809                                                                                                                                                                                                                                                                     Decadence / | $c: by Maxim Gorky ; translated from the Russian by Veronica Dewey ; foreword by Irvin Weil.
## 2810                                                                                    The ingenious gentleman Don Quixote de la Mancha : | complete in two parts / | $c: Miguel de Cervantes ; translation from the Spanish, with a criticl̀ text based upon the first editions of 1605 and 1615, and with variant readings, variorum notes, and an introduction by Samuel Putnam.
## 2811                                                                                                                                                                                                                                                                                                                                                   The stories of John Cheever.
## 2812                                                                                                                                                                                                                                                                                 Tonka, and other stories. | $c: Translated from the German by Eithne Wilkins and Ernst Kaiser.
## 2813                                                                                                                                                                                                                                                                                                                                                  The soldier's art: | a novel.
## 2814                                                                                                                                                                                                                                                                                                                                                          Six days in Marapore.
## 2815                                                                                                                                                                                                                                                                                                                                                       The power and the glory.
## 2816                                                                                                                                                                                                                                                                           That summer in Paris; | memories of tangled friendships with Hemingway, Fitzgerald, and some others.
## 2817                                                                                                                                                                                                                                                                                The fifth son : | a novel / | $c: by Elie Wiesel ; translated from the French by Marion Wiesel.
## 2818                                                                                                                                                                                                                                                                                                                                         The Raj quartet / | $c: by Paul Scott.
## 2819                                                                                                                                                                                                                                                       King, queen, knave : | a novel / | $c: Vladimir Nabokov ; translated by Dmitri Nabokov in collaboration with the author.
## 2820                                                                                                                                                                                                                                                                                                                                             Selected works of Lu Hsun [pseud.]
## 2821                                                                                                                                                                                                                                                                                         The assault / | $c: Harry Mulisch ; translated from the Dutch by Claire Nicolas White.
## 2822                                                                                                                                                                                                                                                                                                                           Family dancing : | stories / | $c: by David Leavitt.
## 2823                                                                                                                                                                                                                                                                                                                   The riding mistress : | a novel / | $c: by Harriett Gilbert.
## 2824                                                                                                                                                                                                                                                                                                                       The Twyborn affair : | a novel / | $c: by Patrick White.
## 2825                                                                                                                                                                                                                                                                                        The celestial railroad, | and other stories. | $c: With an afterword by R. P. Blackmur.
## 2826                                                                                                                                                                                                                                                                                       Stories and prose poems | $c: [by] Alexander Solzhenitsyn. Translated by Michael Glenny.
## 2827                                                                                                                                                                                                                                              The wine of eternity : | short stories from the Latvian / | $c: by Knuts lesins ; translated by Ruth Speirs and Haralds Kundzins.
## 2828                                                                                                                                                                                                                                                           Solitudes / | $c: Goffredo Parise ; introduction by Natalia Ginzburg ; translated from the Italian by Isabel Quigly.
## 2829                                                                                                                                                                                                                                                                                             The trial begins / | $c: Abram Tertz ; translated from the Russian by Max Hayward.
## 2830                                                                                                                                                                                                                                                                                                                   The call-girls: | a tragi-comedy with prologue and epilogue.
## 2831                                                                                                                                                                                                                                                                                         The view from Pompey's Head / | $c: Hamilton Basso ; introduction by John W. Aldridge.
## 2832                                                                                                                                                                                                                                                                                                                           Gerald's party : | a novel / | $c: by Robert Coover.
## 2833                                                                                                                                                                                                                                                                                      The Flanders road / | $c: by Claude Simon ; translated from the French by Richard Howard.
## 2834                                                                                                                                                                                                                                                                                                 The curate's awakening / | $c: George MacDonald ; Michael R. Phillips, editor.
## 2835                                                                                                                                                                                                                                                                                                                       In the city was a garden; | a housing project chronicle.
## 2836                                                                                                                                                                                                                                                                                               Childhood /] | $c: by Jona Oberski ; translated from the Dutch by Ralph Manheim.
## 2837                                                                                                                                                                                                                                                      A cadre school life : | six chapters / | $c: Yang Jiang ; translated by Geremie Barmé with the assistance of Bennett Lee.
## 2838                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2839                                                                                                                                                                                                                                                   Told in confidence, | and other stories, | $c: edited, translated from the Italian, and with an introduction by A. E. Murch.
## 2840                                                                                                                                                                                                                                        Conquered city / | $c: A novel by Victor Serge; translated from the French and with a forward and biographical note by Richard Greeman.
## 2841                                                                                                                                                                                                                                                                                                                                                         A winter in the hills.
## 2842                                                                                                                                                                                                                                                                            St. Petersburg / | $f: translated with an introduction by John Cournos ; foreword by George Reavey.
## 2843                                                                                                                                                                                                                                                                                             Tengu child / | $c: by Kikuo Itaya ; translated by John Gardner and Nobuko Tsukui.
## 2844                                                                                                                                                                                                                                                                                                          The bridges; | $c: translated from the Norwegian by Elizabeth Rokkan.
## 2845                                                                                                                                                                                                                                                                                            "The factory ship" and "The absentee landlord." | $c: Translated by Frank Motofuji.
## 2846                                                                                                                                                                                                                                                                                                                                                                          Ruan.
## 2847                                                                                                                                                                                                                                                                                                                                                            Asimov's mysteries.
## 2848                                                                                                                                                                                                                                                                                                                                               Brothers / | $c: Bernice Rubens.
## 2849                                                        Snowball berry red | & other stories / | $c: Vasily Shukshin ; edited by Donald M. Fiene ; with translations by Donald M. Fiene ... [et al.] with a chronology of the life and works of Shukshin, and with a filmography of Shukshin, a bibliography of Shukshin, and with three critical articles on Shukshin's works.
## 2850                                                                                                                                                                                                                                                                                    Chapayev. | $c: [Translated by George Kittell and Jeanette Kittell, edited by G. Gorchakov]
## 2851                                                                                                                                                                                                                                                                                                                                                              Novels and tales.
## 2852                                                                                                                                                                                                                                                                                                The Begum's fortune. | [Translated from the French. | $c: Edited by I.O. Evans]
## 2853                                                                                                                                                                                                                        We | $c: [by] Yevgeny Zamyatin; translated [from the Russian MS.] by Bernard Guilbert Guerney; introduction and bibliographical note by Michael Glenny.
## 2854                                                                                                                                                                                                                                                                          A country doctor's notebook / | $c: Mikhail Bulgakov ; translated from the Russian by Michael Glenny.
## 2855                                                                                                                                                                                                                                                                                                                                              St. Urbain's horseman; | a novel.
## 2856                                                                                                                                                                                                                                                                                                                                                                Rogue in space.
## 2857                                                                                                                                                                                                                                                                                                Beware of pity / | $c: Stefan Zweig ; translated by Phyllis and Trevor Blewitt.
## 2858                                                                                                                                                                                                                                                                                                                                  Lord Arthur Savile's crime and other stories.
## 2859                                                                                                                                                                                                                                                                                                                                                        The death of the heart.
## 2860                                                                                                                                                                                                                                                                                                     The narrative works of Hartmann von Aue / | $c: translated by R.W. Fisher.
## 2861                                                                                                                                                                                                                                                                                    In a far distant land : | selected stories / | $c: Ivan Bunin ; translated by Robert Bowie.
## 2862                                                                                                                                                                                                                                                                                                         Effi Briest. | $c: Newly translated from the German by Walter Wallich.
## 2863                                                                                                                                                                                                                                                                                                                                    The thing at the door / | $c: Henry Slesar.
## 2864                                                                                                                                                                                                                                                                   View of dawn in the tropics / | $c: G. Cabrera Infante ; translated from the Spanish by Suzanne Jill Levine.
## 2865                                                                                                                                                                                                                                                                            As a man grows older | $c: [by] Italo Svevo [pseud.] Translated from the Italian by Beryl de Zoete.
## 2866                                                                                                                                                                                                                                           The little comedy and other stories / | $c: Arthur Schnitzler ; foreword by Frederick Ungar ; [translated from the original German].
## 2867                                                                                                                                                                                                                                                                            Little novels. | $c: Translated from the German by Eric Sutton. New York, Simon and Schuster, 1929.
## 2868                                                                                                                                                                                                                                                                                                Tribal scars and other stories. | $c: Translated from the French by Len Ortzen.
## 2869                                                                                                                                                                                                                                                                                                                                  A country such as this / | $c: by James Webb.
## 2870                                                                                                                                                                        "Me grandad 'ad an elephant!" : | three stories of Muslim life in South India / | $c: by Vaikom Muhammad Basheer ; translated from the Malayalam by R.E. Asher and Achamma Coilparampil Chandersekaran.
## 2871                                                                                                                                                                                                                                                                                                                          Bosnian story, | $c: translated by Kenneth Johnstone.
## 2872                                                                                                                                                                                                                                                                                                               That voice / | $c: Robert Pinget ; translated by Barbara Wright.
## 2873                                                                                                                                                                                                                                                                                                                             The tree of man : | a novel / | $c: Patrick White.
## 2874                                                                                                                                                                                                                                                                                                                                                           War of the wing-men.
## 2875                                                                                                                                                                                                                                                                              Voices ; The walls / | $c: Vaikom Muhammad Basheer ; translated from the Malayalam by V. Abdulla.
## 2876                                                                                                                                                                                                                                                             A beggar in Jerusalem, | a novel, | $c: by Elie Wiesel. Translated from the French by Lily Edelman and the author.
## 2877                                                                                                                                                                                                                       The Ruodlieb : | the first medieval epic of chivalry from eleventh-century Germany / | $c: Translated from the Latin, with an introd. by Gordon B. Ford.
## 2878                                                                                                                                                                                                                                                                             My Michael. | $c: Translated from the Hebrew by Nicolas de Lange in collaboration with the author.
## 2879                                                                                                                                                                                                                                                                                                                                                              Myron; | a novel.
## 2880                                                                                                                                                                                                                                                                                                                                         Crystal singer / | $c: Anne McCaffrey.
## 2881                                                                                                                                                                                                                                                                                                                             Saul's book : | a novel / | $c: by Paul T. Rogers.
## 2882                                                                                                                                                                                                                                                                                 Mercier and Camier / | $c: Samuel Beckett ; translated from the original French by the author.
## 2883                                                     Faust : | being the Historia Von D. Johann Fausten dem wietbeschreyten Zauberer und Schwartzkünstler, or History of Dr. John Faust the notorious magician and necromancer, as written by his familiar servant and disciple Christopher Wagner, now for the first time Englished from the Low German / | $c: by Robert Nye.
## 2884                                                                                                                                                                                                                                                                                We killed Mangy-Dog, | & other stories; | $c: translated from the Portuguese by Dorothy Guedes.
## 2885                                                                                                                                                                                                                                                                                                                                                               School for love.
## 2886                                                                                                                                                                                                                                                                                             Don Juan's Bar; | a novel. | $c: Translated from the Portuguese by Barbara Shelby.
## 2887                                                                                                                                                                                                                                                                                                                                                                     The touch.
## 2888                                                                                                                                                                                                                                                                                                        Book of the Eskimos. | $c: Edited, and with a pref. by Dagmar Freuchen.
## 2889                                                                                                                                                                                                                                                                                                                                                                 Satan's world.
## 2890                                                                                                                                                                                                                                                                                                                     The Libera me Domine / | $c: translated by Barbara Wright.
## 2891                                                                                                                                                                                                                                              Through golden windows. | $c: Edited by Nora Boust [and] others, Editor-in-chief: Jeanne Hale, assistant editor: Muriel Johnston.
## 2892                                                                                                                                                                                                                                                                                                                     Latin American writing today. | $c: Edited by J. M. Cohen.
## 2893                                                                                                                                                                                                                                                                                                          The black garden. | $c: Translated from the French by Robert Baldick.
## 2894                                                                                                                                                                                                                                                                                              Special friendships, | a novel. | $c: Translated from the French by Edward Hyams.
## 2895                                                                                                                                                                                                                                                                                                  The ballad of Typhoid Mary / | $c: J.F. Federspiel ; translated by Joel Agee.
## 2896                                                                                                                                                                                                                                                                                              St. Lawrence blues; | a novel. | $c: Translated from the French by Ralph Manheim.
## 2897                                                                                                                                                                                                                                                                               Arabesques / | $c: Nikolai Gogol ; translated by Alexander Tulloch ; introd. by Carl R. Proffer.
## 2898                                                                                                                                                                                                                                                                        Homecoming / | $c: translated from the Japanese by Brewster Horwitz, with an introd. by Harold Strauss.
## 2899                                                                                                                                                                                                                                                                                                                                          The blue angel / | $c: Heinrich Mann.
## 2900                                                                                                                                                                                                                                                                                                            The lime works. | $c: Translated from the German by Sophie Wilkins.
## 2901                                                                                                                                                                                                                                                                        The natives of Hemsö. | $c: Translated from the Swedish by Arvid Paulson. Introd. by Richard B. Vowles.
## 2902                                                                                                                                                                                                                                                                                                                                  The conversion of Chaplain Cohen : | a novel.
## 2903                                                                                                                                                                                                                                                                                                                                                              A garden of sand.
## 2904                                                                                                                                                                                                                                               We of Nagasaki; | the story of survivors in an atomic wasteland. | $c: Translated by Ichiro Shirato and Herbert B. L. Silverman.
## 2905                                                                                                                                                                                                                                                                                                                                   The Odyssey. | $c: Translated by Ennis Rees.
## 2906                                                                                                                                                                                                                                                                                                                                                        A disturbing influence.
## 2907                                                                                                                                                                                                                                                                                                                         Planet of the apes. | $c: Translation by Xan Fielding.
## 2908                                                                                                                                                                                                                                                                                      A noble profession / | $c: by Pierre Boulle ; translated from the French by Xan Fielding.
## 2909                                                                                                                                                                                                                                                                                              The Princess of Cleves / | $c: Madame de Lafayette ; translated by Nancy Mitford.
## 2910                                                                                                                                                                                                                                                                                              Hissing tales / | $c: Romain Gary ; translated from the French by Richard Howard.
## 2911                                                                                                                                                                                                                                                                                                                                                                   The bridge /
## 2912                                                                                                                                                                                                                        Housewarming, and other selected writings / | $c: edited and with an introd. by Amiya Chakravarty. Translated by Mary Lago, Tarun Gupta and the editor.
## 2913                                                                                                                                                                                                                                                                                                         Jules Verne, master of science fiction. | $c: [Edited] by I. O. Evans.
## 2914                                                                                                                                                                                                                                                                                                                        Five smooth stones; | a novel | $c: [by] Ann Fairbairn.
## 2915                                                                                                                                                                                                                                                                                                                              Larger than life. | $c: Translated by Henry Reed.
## 2916                                                                                                                                                                                                                                                                                                                                   The Dosadi experiment / | $c: Frank Herbert.
## 2917                                                                                                                                                                                                                                                                                                                                                              The dream walker.
## 2918                                                                                                                                                                                                                                                                                                                  The island within. | $c: With an introd. by Stanley F. Chyet.
## 2919                                                                                                                                                                                                                                                                                         Terra amata | $c: [by] J. M. G. Le Clézio. Translated from the French by Barbara Bray.
## 2920                                                                                                                                                                                                                                                                                     City of many days / | $c: Shulamith Hareven ; translated from the Hebrew by Hillel Halkin.
## 2921                                                                                                                                                                                                                                                                                                                       La guerre, yes sir! | $c: Translated by Sheila Fischman.
## 2922                                                                                                                                                                                                                                                                                                                                                Go / | $c: John Clellon Holmes.
## 2923                                                                                                                                                                                                                                                                                    The impatient ones / | $c: Yuri Trifonov ; [translated from the Russian by Robert Daglish].
## 2924                                                                                                                                                                                                                                                        Students : | a novel / | $c: by Yuri Trifonov; [translated from the Russian by Ivy Litvinova and Margaret Wettlin]. ---
## 2925                                                                                                                                                                                                                                                                                        Cement, | a novel. | $c: [Translated from the Russian by A. S. Arthur and C. Ashleigh].
## 2926                                                                                                                                                                                                                                                                                              Letter to a child never born / | $c: Oriana Fallaci ; translated by John Shepley.
## 2927                                                                                                                                                                                                                                                              The guardian of the word = | Kouma Lafôlô Kouma / | $c: Camara Laye ; translated from the French by James Kirkup.
## 2928                                                                                                                                                                                                                                                                               French mediaeval romances [from the lays of Marie de France] / | $c: translated by Eugene Mason.
## 2929                                                                                                                                                                                                                                                                                                                           The woman in white. | Introd. by Maurice Richardson.
## 2930                                                                                                                                                                                                                                                                            The shapes of fiction; | open and closed. | $c: [Compiled by] Beverly Gross [and] Richard Giannone.
## 2931                                                                                                                                                                                                                                                                                                        The unvanquished / | $c: William Faulkner ; drawings by Edward Shenton.
## 2932                                                                                                                                                                                                                                                                                                           The Oxford Chekhov. / | $c: Translated and edited by Ronald Hingley.
## 2933                                                                                                                                                                                                                                                                                                                                   The echo chamber / | $c: Gabriel Josipovici.
## 2934                                                                                                                                                                                                                                                                                                Sandro of Chegem / | $c: by Fazil Iskander ; translation by Susan Brownsberger.
## 2935                                                                                                                                                                                                                                                                                                                                     The city of the living, and other stories.
## 2936                                                                                                                                                                                                                                                                                                                                                         The women on the wall.
## 2937                                                                                                                                                                                                                                                                    McTeague : | a story of San Francisco / | $c: by Frank Norris ; edited with an introduction by Kevin Starr.
## 2938                                                                                                                                                                                                                                                                                                          Prochain épisode. | $c: Translated from the French by Penny Williams.
## 2939                                                                                                                                                                                                                                                                                                                               The star-spangled future / | $c: Norman Spinrad.
## 2940                                                                                                                                                                                                                                                                                     Lieutenant Lockeast, and other stories; | $c: translated from the Japanese by John Bester.
## 2941                                                                                                                                                                                                                                                                                                                                       Before she met me / | $c: Julian Barnes.
## 2942                                                                                                                                                                                                                                                                                        The shadow / | $c: by Benito Pérez Galdós ; translation and introd. by Karen O. Austin.
## 2943                                                                                                                                                                                                                                                                                                                   Russian hide-and-seek : | a melodrama / | $c: Kingsley Amis.
## 2944                                                                                                                                                                                                                                                                                                                       A square of sky; | $c: the recollections of a childhood.
## 2945                                                                                                                                                                                                                                                                                                                                              Vintage stuff / | $c: Tom Sharpe.
## 2946                                                                                                                                                                                                                                                                                      Flight of cranes / | $c: by Christine Brückner ; translated from the German by Ruth Hein.
## 2947                                                                                                                                                                                                                                                                                          Boy! | $c: Translated from the French by John Reed. With an introd. by Edris Makward.
## 2948                                                                                                                                                                                                                                                                                         The fall of the towers / | $c: Samuel R. Delany ; with a new intro. by Joseph Milicia.
## 2949                                                                                                                                                                                                                                                                                                                     The lost face: | best science fiction from Czechoslovakia.
## 2950                                                                                                                                                                                                                                                                                                                           Moon deluxe : | stories / | $c: Frederick Barthelme.
## 2951                                                                                                                                                                                                                                                                                                    The Council of Egypt. | $c: Translated from the Italian by Adrienne Foulke.
## 2952                                                                                                                                                                                                                                                                                                            Equal danger. | $c: Translated from the Italian by Adrienne Foulke.
## 2953                                                                                                                                                                                                                                                                                                                                            Superior women / | $c: Alice Adams.
## 2954                                                                                                                                                                                                                                                         The kidnapped saint & other stories / | $c: by B. Traven ; edited by Rosa Elena Lujan and Mina C. and H. Arthur Klein.
## 2955                                                                                                                                                                                                                                                                                                A wizard of earthsea / | $c: by Ursula K. LeGuin ; illustrated by Ruth Robbins.
## 2956                                                                                                                                                                                                                                                                                       The four wise men / | $c: Michel Tournier ; translated from the French by Ralph Manheim.
## 2957                                                                                                                                                                                                                                                                                                                                             The smaller sky / | $c: John Wain.
## 2958                                                                                                                                                                                                                                                                                                              Changeling / | $c: Roger Zelazny ; illustrated by Esteban Maroto.
## 2959                                                                                                                                                                                                                                                                                                                                          Novels & stories / | $c: Jack London.
## 2960                                                                                                                                                                                                                                                                           The wanderer | (Le grand Meaulnes) | $c: Translated by Franc̕oise Delisle. Introd. by Fredrika Blair.
## 2961                                                                                                                                                                                                                                                                                  The case of Comrade Tulayev, | a novel. | $c: Translated from the French by Willard R. Trask.
## 2962                                                                                                                                                                                                                                                    The third bank of the river, | and other stories. | $c: Translated from the Portuguese, with an introd., by Barbara Shelby.
## 2963                                                                                                                                                                                                                                                                                                                                                                    The expert.
## 2964                                                                                                                                                                                                                                                                               They burn the thistles / | $c: Yashar Kemal ; translated from the Turkish by Margaret E. Platon.
## 2965                                                                                                                                                                                                                                                                           St. Peter's umbrella. | $c: [Translated from the Hungarian by B. W. Worswick, rev. by István Fekete.
## 2966                                                                                                                                                                                                                                                                                                 The camp of the saints / | $c: by Jean Raspail ; translated by Norman Shapiro.
## 2967                                                                                                                                                                                                                                                             Breakdown and bereavement : | a novel / | $c: by Yosef Haim Brenner ; translated from the Hebrew by Hillel Halkin.
## 2968                                                                                                                                                                                                                                                                                                            The builders | $c: [Translated by Sidney Shapiro. Illus. by Ah Lao]
## 2969                                                                                                                                                                                                                                                                                                                                                        The game of Dostoevsky.
## 2970                                                                                                                                                                                                                                                                                                           Baga: | a novel; | $c: translated from the French by John Stevenson.
## 2971                                                                                                                                                                                                                                                                                    Virgin soil; | a novel, | $c: by Ivan Turgenev; tr. from the Russian, by Constance Garnett.
## 2972                                                                                                                                                                                                                                                                                                                                    This land, this time / | $c: Dobrica Ćosić.
## 2973                                                                                                                                                                                                                                                                                                                                    This land, this time / | $c: Dobrica Ćosić.
## 2974                                                                                                                                                                                                                                                                                                                             The fabulous riverboat / | $c: Philip José Farmer.
## 2975                                                                                                                                                                                                                          Noon, 22nd century / | $c: Arkady Strugatsky and Boris Strugatsky ; translated from the Russian by Patrick L. McGuire ; introd. by Theodore Sturgeon.
## 2976                                                                                                                                                                                                                        Prisoners of power / | $c: Arkady Strugatsky and Boris Strugatsky ; introd. by Theodore Sturgeon ; translated from the Russian by Helen Saltz Jacobson.
## 2977                                                                                                                                                                                                                                                                                                      Gossip from Thrush Green / | $c: Miss Read ; illustrated by J.S. Goodall.
## 2978                                                                                                                                                                                                                                                                                                                    The sin of Father Mouret. | $c: Translated by Sandy Petrey.
## 2979                                                                                                                                                                                                                                                                                                                                     Young hearts crying / | $c: Richard Yates.
## 2980                                                                                                                                                                                                                                                                                                                                                    The draft riots, July 1863.
## 2981                                                                                                                                                                                                                                                                                                                       Mulligan stew : | a novel / | $c: by Gilbert Sorrentino.
## 2982                                                                                                                                                                                                                                                                                                                                                                          Watt.
## 2983                                                                                                                                                                                                                                                                              The eternal husband, | and other stories. | $c: Translated from the Russian by Constance Garnett.
## 2984                                                                                                                                                                                                                                                                                      The saga of a seagull / | $c: Yashar Kemal ; translated from the Turkish by Thilda Kemal.
## 2985                                                                                                                                                                                                                                                                                                                                                           The rout; | a novel,
## 2986                                                                                                                                                                                                                                                           The edge of the storm ; | a novel / | $c: Agustin Yáñez ; translated by Ethel Brinton ; illustrated by Julio Prieto.
## 2987                                                                                                                                                                                                                                                                                                The gold-rimmed spectacles. | $c: Translated from the Italian by Isabel Quigly.
## 2988                                                                                                                                                                                                                                                                                                                Speculations about Jakob / | $f: translated by Ursule Molinaro.
## 2989                                                                                                                                                                                                                                                                  Trees on the cliff : | a novel of Korea and two stories / | $c: Whang Sun-won ; translated by Chang Wang-rok.
## 2990                                                                                                                                                                                                                                                                                                                                                             Barchester Towers.
## 2991                                                                                                                                                                                                                                                         New Soviet science fiction / | $c: introd. by Theodore Sturgeon ; translated from the Russian by Helen Saltz Jacobson.
## 2992                                                                                                                                                                                                                                     The last chance : | the pilots' plot against Göring, 1944-1945 / | $c: Johannes Steinhoff ; translated from the German by J. A. Underwood.
## 2993                                                                                                                                                                                                                                                                                                                      'Lena Rivers. | $c: New York, G. W. Dillingham Co., 1897.
## 2994                                                                                                                                                                                                                                                                                                                                    This land, this time / | $c: Dobrica Ćosić.
## 2995                                                                                                                                                                                                                                                                                                                                                              Light Over Water.
## 2996                                                                                                                                                                                                                                                                                                        Letters from Thailand / | $c: Botan ; translated by Susan Fulop Morell.
## 2997                                                                                                                                                                                                                                                                                                         South to destiny / | $c: Dobrica Ćosić ; translated by Muriel Heppell.
## 2998                                                                                                                                                                                                                                                                                                                           Behind the door. | $c: Translated by William Weaver.
## 2999                                                                                                                                                                                                                                                                                           Sabaria. | $c: Translated from the Hungarian by Florence Ignotus and Anthony Rhodes.
## 3000                                                                                                                                                                                                                                                                                    The eternal smile, | $c: and other stories by Pär Lagerkvist; [translated from the Swedish]
## 3001                                                                                                                                                                                                                                                                                                                                      Dr. Heart; | a novella and other stories.
## 3002                                                                                                                                                                                                                                                                                                                                     Three novels / | $c: by Witold Gombrowicz.
## 3003                                                                                                                                                                                                                                                                                                                                             Nightrunners of Bengal, | a novel.
## 3004                                                                                                                                                                                                                                                                                                                                                          Stranger in the land.
## 3005                                                                                                                                                                                                                                                                                         Children of the game. | $c: Translated by Rosamond Lehmann; illustrated by the author.
## 3006                                                                                                                                                                                                                Two novels of the Mexican Revolution: | The trials of a respectable family and The underdogs. | $c: Translated by Frances Kellam Hendricks and Beatrice Berler.
## 3007                                                                                                                                                                                                                                                                                                                      The old neighborhood : | a novel / | $c: by Avery Corman.
## 3008                                                                                                                                                                                                                                                                                            A late divorce / | $c: A.B. Yehoshua ; translated from the Hebrew by Hillel Halkin.
## 3009                                                                                                                                                                                                                                                                                 From beginning to end [and] The spell; | $c: translated from the Hungarian by Ilona Duczynska.
## 3010                                                                                                                                                                                                                                                                       My disappearance in Providence, and other stories / | $c: Alfred Andersch ; translated by Ralph Manheim.
## 3011                                                                                                                                                                                                                                                                                                          The miscreant. | $c: [Translated by Dorothy Williams from the French]
## 3012                                                                                                                                                                                                                                                                                                            The impostor. | $c: Translated from the Frency by Dorothy Williams.
## 3013                                                                                                                                                                                                                                                                                                        Journey into the blue. | $c: Translated from the French by Peter Green.
## 3014                                                                                                                                                                                                                                                                                            Going to town and other stories. | $c: Compiled and translated by Gabriella Azrael.
## 3015                                                                                                                                                                                                                                                                                                   Mastro-don Gesualdo / | $c: by Giovanni Verga ; translated by D.H. Lawrence.
## 3016                                                                                                                                                                                                                                                                                                                                                                        Novels.
## 3017                                                                                                                                                                                                                                                                                                           A change of heart. | $c: Translated from the French by Jean Stewart.
## 3018                                                                                                                                                                                                                                                                                                                    The mote in God's eye / | $c: Larry Niven, Jerry Pournelle.
## 3019                                                                                                                                                                                                                                                                                               Visions / | $c: as translated by roger L'Estrange and now introduced by J. M. C.
## 3020                                                                                                                                                                                                                                                                              Beautiful days : | a novel / | $c: Franz Innerhofer ; translated from the German by Anselm Hollo.
## 3021                                                                                                                                                                                                                                       The gift : | a novel / | $c: by Vladimir Nabokov ; translated from the Russian by Michael Scammell with the collaboration of the author.
## 3022                                                                                                                                                                                                                                                                                             Ethan Frome and Summer / | $c: Edith Wharton ; introduced by Victoria Glendinning.
## 3023                                                                                                                                                                                                                                  Bread and wine / | $c: Ignazio Silone ; a new version, translated from the Italian by Harvey Fergusson II ; with an afterword by Marc Slonim.
## 3024                                                                                                                                                                                                                                                                                                                                                            When I was a child.
## 3025                                                                                                                                                                                                                                                                                                                                                            The hound of earth.
## 3026                                                                                                                                                                                                                                                    The hatchet : | a short story / | $c: Mihail Sadoveanu ; ill. by A. Demian ; translated from the Rumanian by Eugenia Farca.
## 3027                                                                                                                                                                                                                                                                                                                                                            The Tar-Aiym Krang.
## 3028                                                                                                                                                                                                                                                                         World light (Heimsljós) | $c: [by] Halldor Laxness. Translated from the Icelandic by Magnus Magnusson.
## 3029                                                                                                                                                                                                                                                                                                                             Two symphonies. | $c: Translated by Dorothy Bussy.
## 3030                                                                                                                                                                                                                                                                                                                                                                        Novels.
## 3031                                                                                                                                                                                                                                         Where nests the water hen. | Introd.: | $c: Gordon Roper. General editor: Malcolm Ross. Translated from the French by Harry L. Binsse.
## 3032                                                                                                                                                                                                                                                                            Before I forget. | $c: Translated from the Dutch by the author. Editing and introd. by Angelo Cohn.
## 3033                                                                                                                                                                                                                                                                                  The journey / | $c: by Anatolii Kuznetsov ; translated from the Russian by William E. Butler.
## 3034                                                                                                                                                                                                                                                                                                                                                               Taos; | a novel.
## 3035                                                                                                                                                                                                                                                                                               Dita Saxova / | $c: Arnošt Lustig ; translated from the Czech by Jeanne Nemcova.
## 3036                                                                                                                                                                                                                                                                                                                                                               North from Rome.
## 3037                                                                                                                                                                                                                                                                                                                                                    Two autobiographical plays.
## 3038                                                                                                                                                                                                                                                                         Cold nights : | a novel / | $c: by Pa Chin [i.e. F. Li] ; translated by Nathan K. Mao & Liu Tsʻun-yan.
## 3039                                                                                                                                                                                                                                                                                                           The fifth head of Cerberus : | three novellas / | $c: by Gene Wolfe.
## 3040                                                                                                                                                                                                                                                                                                                                                             Don't tell Alfred.
## 3041                                                                                                                                                                                                                                       Russian women : | two stories / | $c: I. Grekova ; translated from Russian by Michel Petrov ; with an introduction by Maurice Friedberg.
## 3042                                                                                                                                                                                                                                                                         Old Hungarian fairy tales | $c: [by] Baroness Orczy. Illustrated by Montagu Barstow and Emmuska Orczy.
## 3043                                                                                                                                                                                                                                                                                The magician of Lublin. | $c: Translated from the Yiddish by Elaine Gottlieb and Joseph Singer.
## 3044                                                                                                                                                                                                                                                                                                                    The séance and other stories / | $c: Isaac Bashevis Singer.
## 3045                                                                                                                                                                                                                                                      Cop killer : | the story of a crime / | $c: [by] Maj Sjöwall and Per Wahlöö ; translated from the Swedish by Thomas Teal.
## 3046                                                                                                                                                                                                                                                  Plots and counterplots : | more unknown thrillers of Louisa May Alcott / | $c: edited and with an introd. by Madeleine Stern.
## 3047                                                                                                                                                                                                                                                                        The sea serpent: | the yarns of Jean Marie Cabidoulin; | $c: translated from the French by I. O. Evans.
## 3048                                                                                                                                                                                                                                  Flying Osip; | stories of new Russia, | $c: by Seifulina [and others. Translated from the Russian by L. S. Friedland and J. R. Piroshnikoff].
## 3049                                                                                                                                                                                                                                                                            Green seaweed and salted eggs; | short stories | $c: by Lin Hai Yin. Translated by Nancy Chang Ing.
## 3050                                                                                                                                                                                                                                                                                  Selected stories [of] Ivan Turgenev / | $c: translated from the Russian by Constance Garnett.
## 3051                                                                                                                                                                                                                                                                                                                                                               Room at the top.
## 3052                                                                                                                                                                                                                                                                                                                                    Soldier, ask not / | $c: Gordon R. Dickson.
## 3053                                                                                                                                                                                                                                                    Booker T. Washington, | educator of hand, head, and heart. | $c: [by] Shirley Graham. Front. and jacket by Donald W. Lambo.
## 3054                                                                                                                                                                                                  Simplicius Simplicissimus. | Translated from the original German edition of 1669 | $c: by Hellmuth Weissenborn and Lesley Macdonald, with engravings by Hellmuth Weissenborn.
## 3055                                                                                                                                                                                                                                                                                                                                                  Siberia: three short stories.
## 3056                                                                                                                                                                                                                                                                                                                                 The traveler in black / | $c: by John Brunner.
## 3057                                                                                                                                                                                                                                                                                                                               Persian adventure / | $c: Anne Sinclair Mehdevi.
## 3058                                                                                                                                                                                                                                  The canary and other tales of martial law / | $c: Marek Nowakowski ; translated by Krystyna Bronkowska ; with a preface by Leszek Kolakowski.
## 3059                                                                                                                                                                                                                                                                            Lays of Marie de France and other French legends. | $c: Translated with an introd. by Eugene Mason.
## 3060                                                                                                                                                                                                                                                                  Joseph and his brothers. | $c: Translated from the German by H.T. Lowe-Porter. With an introd. by the author.
## 3061                                                                                                                                                                                                                                                                                                     Born guilty; | a novel. | $c: Translated from the Spanish by Frank Gaynor.
## 3062                                                                                                                                                                                                                                                                                          The nigger of the 'Narcissus'. Typhoon. The shadow-line. | $c: Introd. by A.J. Hoppé.
## 3063                                                                                                                                                                                                                                                                                                      Lafcadio's adventures. | $c: Translated from the French by Dorothy Bussy.
## 3064                                                                                                                                                                                                                                                                                                       The Decameron; | $c: translated with an introduction by G. H. McWilliam.
## 3065                                                                                                                                                                                                                                                                                                                     Stories. | $c: Compiled and introduced by Yevhen Kirilyuk.
## 3066                                                                                                                                                                                                                                          Selected works / | $c: Vera Panova ; [translated from the Russian by Olga Shartse and Eve Manning ; illustrated by Tatiana Tolstaya].
## 3067                                                                                                                                                                                                                                       The lives and times of Jerry Cornelius / | $c: [by] Michael Moorcock ; illustrated by Mal Dean, Richard Glyn Jones and Harry Douthwaite.
## 3068                                                                                                                                                                                                                                                                                      History : | a novel / | $c: Elsa Morante ; translated from the Italian by William Weaver.
## 3069                                                                                                                                                                                                                                                                                                      Cupid's executioners. | $c: Translated from the French by Richard Howard.
## 3070                                                                                                                                                                                                                                                                                                                              What's become of screwloose? and other inquiries.
## 3071                                                                                                                                                                                                                                                                                              Rockinghorse / | $c: Yoram Kaniuk ; translated from the Hebrew by Richard Flantz.
## 3072                                                                                                                                                                                                                                                                                                                 Asian laughter; | an anthology of oriental satire and humor. -
## 3073                                                                                                                                                                                                                                                                                                                 The cowboy and the Cossack. | $c: Illustrated by Brad Holland.
## 3074                                                                                                                                                                                                                                                                     Character portraits from Dickens. | $c: Selected and arr. by Charles Welsh. London, Chatto & Windus, 1908.
## 3075                                                                                                                                                                                                                                 A golden treasury of Jewish tales, | $c: retold by Asher Barash. Translated from the Hebrew by Murray Roston. [Illustrated by Henry Hechtkopf]
## 3076                                                                                                                                                                                                                                                                              The liar. | $c: Translated from the Danish by John Jepson Egglishaw. Introd. by Elias Bredsdorff.
## 3077                                                                                                                                                                                                                The Gospel according to Chegem : | being the further adventures of Sandro of Chegem / | $c: Fazil Iskander ; translated from the Russian by Susan Brownsberger.
## 3078                                                                                                                                                                                                                                                                                                                                                                 Jungle lovers.
## 3079                                                                                                                                                                                                                                                                         Cheerful weather for the wedding and An integrated man : | two short novels / | $c: by Julia Strachey.
## 3080                                                                                                                                                                                                                                                           Tales. | $c: [Translated from the Russian by Dorian Rottenberg. Edited by John Gibbons. Illustrated by M.A. Taranov]
## 3081                                                                                                                                                                                                                                                                                                                              A choice of enemies / | $c: by George V. Higgins.
## 3082                                                                                                                                                                                                                                                                                       Stained glass elegies : | stories / | $c: by Shusaku Endo ; translated by Van C. Gessel.
## 3083                                                                                                                                                                                                                                                                The voice of the sea and other stories / | $c: Alberto Moravia ; translated from the Italian by Angus Davidson.
## 3084                                                                                                                                                                                                                                                                                                           A long madness. | $c: Translated from the Italian by Helen Barolini.
## 3085                                                                                                                                                                                                                                                                                                                       The Greek passion; | $c: translated by Jonathan Griffin.
## 3086                                                                                                                                                                                                                                                                               A woman named Solitude / | $c: André Schwarz-Bart ; translated from the French by Ralph Manheim.
## 3087                                                                                                                                                                                                                                                                                                                                The red cock flies to heaven ; tr. by E.D. Goy.
## 3088                                                                                                                                                                                                                                                                                                  Martin Eden / | $c: by Jack London ; with an introduction by Andrew Sinclair.
## 3089                                                                                                                                                                                                                                                                                  Lead us into temptation / | $c: Breandan Ó hEithir ; translated by the author from the Irish.
## 3090                                                                                                                                                                                                                                                                                                                          The Wycherly woman | $c: [by] Ross Macdonald [pseud.]
## 3091                                                                                                                                                                                                                                                                                                              Tales of the sacred and the supernatural/ | $c: by Mircea Eliade.
## 3092                                                                                                                                                                                                                                                                                                  The fish can sing | $c: [by] Halldòr Laxness; translated by Magnus Magnusson.
## 3093                                                                                                                                                                                                                                                                                                                                                  The riding master, | a novel;
## 3094                                                                                                                                                                                                                                                                                           The straw man / | $c: by Jean Giono ; translated from the French by Phyllis Johnson.
## 3095                                                                                                                                                                                                                                                                                                                                                                Ocean of night.
## 3096                                                                                                                                                                                                                                                                                                                The Emperor's last soldiers. | $c: Translated by Roger Clifton.
## 3097                                                                                                                                                                                                                                                              Ice floes and flaming water; | a true adventure in Melville Bay. | $c: Translated from the Danish by Johan Hambro
## 3098                                                                                                                                                                                                                                                                                                       The novice, | a novel; | $c: translated from the Italian by Peter Green.
## 3099                                                                                                                                                                                                                                          Little Tel Aviv / | $c: Nathan Alterman ; translated with an introduction by Yishai Tobin ; reproductions by Aharon Avni ... [et al.]
## 3100                                                                                                                                                                                                                                                                            Threepenny novel. | $c: Translated by Desmond I. Vesey. Verses translated by Christopher Isherwood.
## 3101                                                                                                                                                                                                                                                                                                                                                                         Debby.
## 3102                                                                                                                                                                                                                                                                                                                                                                   Fire sermon.
## 3103                                                                                                                                                                                                                                                                          The sinner from Toledo, and other stories, | $c: by Anton Chekhov. Translated by Arnold Hinchliffe. -
## 3104                                                                                                                                                                                                                                                                         The story of the stone : | a novel in five volumes / | $c: by Cao Xueqin ; translated by David Hawkes.
## 3105                                                                                                                                                                                                                                                                                                                                     Ellison wonderland / | $c: Harlan Ellison.
## 3106                                                                                                                                                                                                                                                        The narrow path; | the man of Nazareth | $c: [by] Aharon A. Kabak. [Translated from the Hebrew by Julian Louis Meltzer]
## 3107                                                                                                                                                                                                                                                                                Black children, white dreams | $c: [by] Thomas J. Cottle. With a foreword by Walter F. Mondale.
## 3108                                                                                                                                                                                                                                                                                                                                      The giant. | Behind the brick wall. Love.
## 3109                                                                                                                                                                                                                                                                                                  Knulp: three tales from the life of Knulp. | $c: Translated by Ralph Manheim.
## 3110                                                                                                                                                                                                                                                                                                                                                          The castle of Fratta.
## 3111                                                                                                                                                                                                                                                                                Blue mimosa. | $c: Translated from Nepali by Tanka Vilas Varya; assisted by Sondra Zeidenstein.
## 3112                                                                                                                                                                                                                                                                                                                Nepalese short stories / | $c: translated by Karuna Kar Vaidya.
## 3113                                                                                                                                                                                                                                                                                      Novel with cocaine / | $c: M. Ageyev ; translated from the Russian by Michael Henry Heim.
## 3114                                                                                                                                                                                                                                                                                          The fetishist / | $c: Michel Tournier ; translated from the French by Barbara Wright.
## 3115                                                                                                                                                                                                                                                                                                                                   Add a dash of pity / | $c: by Peter Ustinov.
## 3116                                                                                                                                                                                                                                                                                                                                                 Sour sweet / | $c: Timothy Mo.
## 3117                                                                                                                                                                                                                                                                                                                                With shuddering fall / | $c: Joyce Carol Oates.
## 3118                                                                                                                                                                                                                                                                                                                                      Love on a dark street / | $c: Irwin Shaw.
## 3119                                                                                                                                                                                                                                                                                                                                                            The beckoning door.
## 3120                                                                                                                                                                                                                                                                       Territorial song : | contemporary writing from Finland / | $c: selected and translated by Herbert Lomas.
## 3121                                                                                                                                                                                                                                                                                                          Twenty-four eyes / | $c: by Sakae Tsuboi ; translated by Akira Miura.
## 3122                                                                                                                                                                                                                                                                              A funny man's dream. | $c: [Translated from the Russian by Olga Shartse. Edited by Julius Katzer]
## 3123                                                                                                                                                                                                                                                                                                 The life of a useless man | $c: [by] Maxim Gorki. Translated by Moura Budberg.
## 3124                                                                                                                                                                                                                                                                                                         The ivory balls and other stories | $c: Translated by Nancy Chang Ing.
## 3125                                                           Exotic Japanese stories, the beautiful and the grotesque; | 16 unusual tales and unforgettable images. | $c: Translated by Takashi Kojima and John McVittie. Introd. by John McVittie. Edited for Western readers by John McVittie and Arthur Pell. 22 collage illus. in color and black & white by Masakazu Kuwata.
## 3126                                                                                                                                                                                                                                                                                                                                                         Conference of victims.
## 3127                                                                                                                                                                                                                                                                                                                                           Old dyke tales / | $c: by Lee Lynch.
## 3128                                                                                                                                                                                                                                                                                                         La charca / | $c: by Manuel Zeno-Gandía ; translated by Kal Wagenheim.
## 3129                                                                                                                                                                                                                                                                                                                               Mysterious ways : | a novel / | $c: Terry Davis.
## 3130                                                                                                                                                                                                                                                                                                   Under the colors | $c: [by] Milovan Djilas. Translated by Lovett F. Edwards.
## 3131                                                                                                                                                                                                                                                                                         Great German short novels and stories. | $c: Edited, with an introd., by Victor Lange.
## 3132                                                                                                                                                                                      Soul of wood, including Journey through the night, The pious brother, The judgment, The window, Hurrah for freedom [and] Resurrection. | $c: Translated from the German by Ralph Manheim.
## 3133                                                                                                                                                                                                                                                            Soviet Russian stories of the 1960's and 1970's / | $c: [compiled by Yuri Bochkarev ; translated from the Russian].
## 3134                                                                                                                                                                                                                                                                                                  The dragon masters / | $c: Jack Vance ; with a new introd. by Norman Spinrad.
## 3135                                                                                                                                                                                                                                                                                               The saga of Tristram and Ísönd. | $c: Translated with an introd. by Paul Schach.
## 3136                                                                                                                                                                                                                                                                                                  The look = | La mirada / | $c: Rene Marques ; translated by Charles Pilditch.
## 3137                                                                                                                                                                                                                                                                                                                                                             The faithful ally.
## 3138                                                                                                                                                                                                                                                                                                                                     Emma | $c: With an introd. by G. B. Stern.
## 3139                                                                                                                                                                                                                                                                                                                A book of ghosts & goblins. | $c: Illustrated by Robin Jacques.
## 3140                                                                                                                                                                                                                                                                                                                               Master of the world. | $c: Edited by I.O. Evans.
## 3141                                                                                                                                                                                                                                                                                                                    Star of Peace : | a novel of the sea / | $c: Jan de Hartog.
## 3142                                                                                                                                                                                                                                                                                          North to freedom | $c: [by] Anne Holm. Translated from the Danish by L. W. Kingsland.
## 3143                                                                                                                                                                                                                                                                                                      Tent of miracles. | $c: Translated from the Portuguese by Barbara Shelby.
## 3144                                                                                                                                                                                                                                                                             The boat / | $c: Lothar-Günther Buchheim ; translated from the German by Denver and Helen Lindley.
## 3145                                                                                                                                                                                                                                                                                                                    The eye of the heart; | short stories from Latin America. -
## 3146                                                                                                                                                                                                                                                                          Morning in Shanghai / | $c: by Zhou Erfu ; [translated by A.C. Barnes ; illustrated by Hua Sanchuan].
## 3147                                                                                                                                                                                                                                                                                                                      The drowning pool | $c: [by] John Ross Macdonald [pseud.]
## 3148                                                                                                                                                                                                                                                                                                                                               The edict, | $c: by Max Ehrlich.
## 3149                                                                                                                                                                                                                                                                                                                                                   The Ravi Lancers, | a novel.
## 3150                                                                                                                                                                                                                                                                                                      Alberta alone. | $c: Translated [from the Norwegian] by Elizabeth Rokkan.
## 3151                                                                                                                                                                                                                                                                         Alberta and freedom | $c: [by] Cora Sandel [pseud.] Translated from the Norwegian by Elizabeth Rokkan.
## 3152                                                                                                                                                                                                                                                                                                                    1914; | $c: translated [from the Swedish] by Mary Sandbach.
## 3153                                                                                                                                                                                                                                                                           Alberta and Jacob | $c: [by] Cora Sandel [pseud.] Translated from the Norwegian by Elizabeth Rokkan.
## 3154                                                                                                                                                                                                                                                           Krane's Café: | an interior with figures; | $c: [by] Cora Sandel; translated from the Norwegian by Elizabeth Rokkan.
## 3155                                                                                                                                                                                                                                                                       Kallocain. | $c: Translated from the Swedish by Gustaf Lannestock. With an introd. by Richard B. Vowles.
## 3156                                                                                                                                                                                                                                                                                                                               Despair : | a novel / | $c: by Vladimir Nabokov.
## 3157                                                                                                                                                                                                                 Lillelord : | a novel / | $c: by Johan Borgen ; edited with an introduction by Ronald E. Peterson ; translated by Elizabeth Brown Moen and Ronald E. Peterson.
## 3158                                                                                                                                                                                                                                                                                 The garnet bracelet, and other stories. | $c: [Translated from the Russian by Stepan Apresyan]
## 3159                                                                                                                                                                                                                                                                         The hurricane / | $c: Chou Li-po ; [translated from the Chinese by Hsu Meng-hsiung ; ill. by Ku Yuan].
## 3160                                                                                                                                                                                                                                                                           The sun shines over the Sanggan River / | $c: Ding Ling [translated by Yang Xianyi and Gladys Yang].
## 3161                                                                                                                                                                                                                                                                                                                   The sailor from Gibraltar; | $c: translated by Barbara Bray.
## 3162                                                                                                                                                                                                                                                                                                             Ten-thirty on a summer night / | $c: translated by Anne Borchardt.
## 3163                                                                                                                                                                                                                                                                                                                                        The innocent and the guilty; | stories.
## 3164                                                                                                                                                                                                                                                                                                            The leech. | $c: Translated from the Norwegian by Elizabeth Rokkan.
## 3165                                                                                                                                                                                                                                                                                                                    The case of Sonia Wayward | $c: [by] Michael Innes [pseud.]
## 3166                                                                                                                                                                                                                                                                                              Abracadabra / | $c: by Danarto ; translated from the Indonesian by Harry Aveling.
## 3167                                                                                                                                                                                                                                                                                                                                                        From the twilight zone.
## 3168                                                                                                                                                                                                                                                                          Time, forward / | $c: Valentine Kataev ; Authorized translation from the Russian by Charles Malamuth.
## 3169                                                                                                                                                                                                                                                                                                                                                                     Fireflies.
## 3170                                                                                                                                                                                                                                                                                                                                                                 The moonstone.
## 3171                                                                                                                                                                                                                                                                                                                                             Joining Charles and other stories.
## 3172                                                                                                                                                                                                                                                                     The life and death of the Mayor of Casterbridge : | a story of a man of character / | $c: by Thomas Hardy.
## 3173                                                                                                                                                                                                                                                                                                                                                                  The sergeant.
## 3174                                                                                                                                                                                                                                                                                                                                                                 The bachelors.
## 3175                                                                                                                                                                                                                                                                       Tourists and colonials / | $c: Anthony Trollope ; edited, with introduction, by Betty Jane Slemp Breyer.
## 3176                                                                                                                                                                                                                                                                                                                       The leatherstocking tales / | $c: James Fenimore Cooper.
## 3177                                                                                                                                                                                                                                                                                                                                   Sleepless nights / | $c: Elizabeth Hardwick.
## 3178                                                                                                                                                                                                                                                                      The war was better. | $c: Translated from the Serbo-Croatian by B. S. Brusar. Adapted by Michael Wolfert.
## 3179                                                                                                                                                                                                                                                                                                                                                   Moscow interlude, | a novel.
## 3180                                                                                                                                                                                                                                                                                                                                                   The Bodley Head Henry James.
## 3181                                                                                                                                                                                                                                                                                           The double : | two versions / | $c: Fyodor Dostoevsky ; translated by Evelyn Harden.
## 3182                                                                                                                                                                                                                                                                                                                        My present age : | a novel / | $c: by Guy Vanderhaeghe.
## 3183                                                                                                                                                                                                                                        Unto death / | $c: Amos Oz ; woodcuts by Jacob Pins ; translated from the Hebrew by Nicholas de Lange in collaboration with the author.
## 3184                                                                                                                                                                                                                                                                                                                                           Listen, listen / | $c: Kate Wilhelm.
## 3185                                                                                                                                                                                                                                                                        Blue man & other stories / | $c: Adolf Muschg ; translated by Marlis Zeller Cambon & Michael Hamburger.
## 3186                                                                                                                                                                                                                                                                                                          A time of death / | $c: Dobrica Ćosić ; translated by Muriel Heppell.
## 3187                                                                                                                                                                                                                                                                                                          Garden, ashes / | $c: Danilo Kiš ; translated by William J. Hannaher.
## 3188                                                                                                                                                                                                                                                                                Yugoslav short stories / | $c: selected, translated and with introduction by Svetozar Koljević.
## 3189                                                                                                                                                                                                                                                                                                                                          Confederates / | $c: Thomas Keneally.
## 3190                                                                                                                                                                                                                                                                                                                                    The collected stories / | $c: Dylan Thomas.
## 3191                                                                                                                                                                                                                                                                                                                                                          The humbler creation.
## 3192                                                                                                                                                                                                                                                                                                                                                    The last resort; | a novel.
## 3193                                                                                                                                                                                                                                                                                                                                                 Tangier / | $c: William Bayer.
## 3194                                                                                                                                                                                                                                       The Gift : | a novel / | $c: by Vladimir Nabokov ; translated from the Russian by Michael Scammell with the collaboration of the author.
## 3195                                                                                                                                                                                                                                                                     The betrothed | (I promessi sposi), a tale of xvii century Milan; | $c: translated by Archibald Colquhoun.
## 3196                                                                                                                                                                                                                                                                                                                                The spirit of Dorsai / | $c: Gordon R. Dickson.
## 3197                                                                                                                                                                                                                                                                                                                           The smoking mountain; | stories of post war Germany.
## 3198                                                                                                                                                                                                                                                                                                                                                                  Soft answers.
## 3199                                                                                                                                                                                                                                                                                                                                                            The Mackerel Plaza.
## 3200                                                                                                                                                                                                                                                                                                           The fire within. | $c: Translated from the French by Richard Howard.
## 3201                                                                                                                                                                                                                                                                                                                                                              A touch of Midas.
## 3202                                                                                                                                                                                                                                              Farewell, my friend and The garden; | two novelettes | $c: by Rabindranath Tagore. Translated from the Bengali by K.R. Kripalani.
## 3203                                                                                                                                                                                                                                                                    The comedy of Charleroi, and other stories. | $c: Translated and with an introduction by Douglas Gallagher.
## 3204                                                                                                                                                                                                                                                                                                                                           World without stars / Poul Anderson.
## 3205                                                                                                                                                                                                                                                                                                                                       Precinct 19 / | $c: Thomas Larry Adcock.
## 3206                                                                                                                                                                                                                                                                                                                                           Harvest : | a novel in three parts /
## 3207                                                                                                                                                                                                                                                                                                                             Twenty-four eyes, | $c: translated by Akira Miura.
## 3208                                                                                                                                                                                                                                                                                             Not for every eye; | a novel. | $c: Translated from the French by Glen Shortliffe.
## 3209                                                                                                                                                                                                                                                                                    The great madness; | $c: authorized translation from the Hebrew original by Jacob Freedman.
## 3210                                                                                                                                                                                                                                                                                November : | a novel / | $c: by Rolf Schneider ; translated from the German by Michael Bullock.
## 3211                                                                                                                                                                                                                                                                                                                  Tyrants destroyed and other stories / | $c: Vladimir Nabokov.
## 3212                                                                                                                                                                                                                                                                                                                      Home of the gentry. | $c: Translated by Richard Freeborn.
## 3213                                                                                                                                                                                                                                                                                                                                                      The green man; | a novel.
## 3214                                                                                                                                                                                                                                                                                                                                                   Bhowani Junction, | a novel.
## 3215                                                                                                                                                                                                                                                                             The carnivorous lamb / | $c: Agustin Gomez-Arcos ; translated from the French by William Rodarmor.
## 3216                                                                                                                                                                                                                                                                                                                                        The collected stories of André Maurois,
## 3217                                                                                                                                                                                                                                                                                                                                                                 Short stories.
## 3218                                                                                                                                                                                                                             The world about us : | a novel / | $c: by Claude Simon ; translated from the French by Daniel Weissbort ; with an introduction by Mark W. Andrews.
## 3219                                                                                                                                                                                                                                                                                                                               Valentine Pontifex / | $c: by Robert Silverberg.
## 3220                                                                                                                                                                                                                                                                        A nest of the gentry : | a novel / | $c: Ivan Turgenev ; translated from the Russian by Bernard Isaacs.
## 3221                                                                                                                                                                                                                                                                                                                                                  Raphael / | $c: R.A. MacAvoy.
## 3222                                                                                                                                                                                                                                  The path of glory: | being the memoirs of the extraordinary military career of John Shipp, | $c: written by himself; edited by C. J. Stranks.
## 3223                                                                                                                                                                                                                                                                                                                               The true story of Ah Q | $c: [by] Lu Hsun pseud.
## 3224                                                                                                                                                                                                                                                                                                           Blaze of embers; | $c: translated from the French by April Fitzlyon.
## 3225                                                                                                                                                                                                                                                                                                                                                                     Ending up.
## 3226                                                                                                                                                                                                                                                                                                                                Hail Galarneau] | $c: Translated by Alan Brown.
## 3227                                                                                                                                                                                                                                                                                                                                     According to Mark / | $c: Penelope Lively.
## 3228                                                                                                                                                                                                                                                                                                            Troubled sleep. | $c: Translated from the French by Gerard Hopkins.
## 3229                                                                                                                                                                                                                                                                     Srengenge : | a novel from Malaysia / | $c: by Shahnon Ahmad ; translated from the Malay by Harry Aveling.
## 3230                                                                                                                                                                                                                                                                          The third notch and other stories / | $c: Shahnon Ahmad ; translated from the Malay by Harry Aveling.
## 3231                                                                                                                                                                                                                       Hallucinations; | being an account of the life and adventures of Friar Servando Teresa de Mier. | $c: Translated from the Spanish by Gordon Brotherston.
## 3232                                                                                                                                                                                                                                                                                       The journey of Ibn Fattouma / | $c: Naguib Mahfouz ; translated by Denys Johnson-Davies.
## 3233                                                                                                                                                                                                                                                                                   Separation : | a novel / | $c: by Dan Franck ; translated from the French by Jon Rothschild.
## 3234                                                                                                                                                                                                                                                                                                                                 Pictures at an exhibition / | $c: D.M. Thomas.
## 3235                                                                                                                                                                                                                                                                         Two stories of Prague / | $c: by Rainer Maria Rilke ; introduced and translated by Angela Esterhammer.
## 3236                                                                                                                                                                                              The vampyre ; and, Ernestus Berchtold, or, The modern Oedipus : | collected fiction of John William Polidori / | $c: edited and introduced by D.L. Macdonald and Kathleen Scherf.
## 3237                                                                                                                                                                                                                                                                                                 Cometh up as a flower : | "is the old man yet alive?" / | $c: Rhoda Broughton.
## 3238                                                                                                                                                                                                                                                                                                                                                  Dolly / | $c: Anita Brookner.
## 3239                                                                                                                                                                                                                                                                                                                                 Things invisible to see / | $c: Nancy Willard.
## 3240                                                                                                                                                                                                                                                                                                                          The exiles trilogy : | three novels / | $c: Ben Bova.
## 3241                                                                                                                                                                                                                                                                                                                                                                      The thaw.
## 3242                                                                                                                                                                                                                                                                                                                                             The cupboard / | $c: Rose Tremain.
## 3243                                                                                                                                                                                                                                                                        Meetings with the angel ; | seven stories from Israel, | $c: edited by Benjamin Tammuz and Leon Yudkin.
## 3244                                                                                                                                                                                                                                                                                                                                                      All the emperor's horses.
## 3245                                                                                                                                                                                                                                                                                     Not by bread alone by Vladimir Dudint͡sev. | $c: Translated from the Russian by Edith Bone.
## 3246                                                                                                                                                                                                                                                                                                                                                               Gate to the sea.
## 3247                                                                                                                                                                                                                                                                                                                          Music and silence : | a novel / | $c: by Anne Redmon.
## 3248                                                                                                                                                                                                                                                                                                                Beware of pity. | $c: Translated by Phyllis and Trevor Blewitt.
## 3249                                                                                                                                                                                                                                                                                 Kaleidoscope two. | $c: [Translated from the German by B. W. Huebsch, and Eden and Cedar Paul.
## 3250                                                                                                                                                                                                                                                          Candido : | or, A dream dreamed in Sicily / | $c: Leonardo Sciascia ; translated from the Italian by Adrienne Foulke.
## 3251                                                                                                                                                                                                                                                                                                                   The Makepeace experiment / | $c: Translated by Manya Harari.
## 3252                                                                                                                                                                                   Three, seven, ace & other stories; | $c: [by] Vladimir Trendryakov [i.e. Tendriakov]; translated from the Russian by David Alger, Olive Stevens [and] Paul Falla, foreword by Max Hayward. -
## 3253                                                                                                                                                                                                                                                                                                                           Cannibal / | $c: by Michael Harner and Alfred Meyer.
## 3254                                                                                                                                                                                                                                                                                                                                 City of splintered gods / | $c: George Faludy.
## 3255                                                                                                                                                                                                                                                                    River mist and other stories / | $c: by Kunikida Doppo ; translated from the Japanese by David G. Chibbett.
## 3256                                                                                                                                                                                                                                                                                        Maigret and the headless corpse. | $c: Translated from the French by Eileen Ellenbogen.
## 3257                                                                                                                                                                                                                                                                                               Maigret loses his temper. | $c: Translated from the French by Robert Eglesfield.
## 3258                                                                                                                                                                                                                                                                                                            Four stories. | $c: Translated from the Norwegian by Naomi Walford.
## 3259                                                                                                                                                                                                                                                                                                            Long time between kisses : | a novel / | $c: by Sandra Scoppettone.
## 3260                                                                                                                                                                                                                                                                                                                                                                 Burning grass;
## 3261                                                                                                                                                                                                                                                                                                                                     The collected stories / | $c: Frank Tuohy.
## 3262                                                                                                                                                                                                                                                                                                                                                           God and the Soviets.
## 3263                                                                                                                                                                                                                                                                                                                                                            Gulf Coast stories.
## 3264                                                                                                                                                                                                                                                                                       The chess-players and other stories | $c: [by] Prem Chand. Translated by Gurdial Mallik.
## 3265                                                                                                                                                                                                                          Lay down your arms; | the autobiography of Martha von Tilling. | $c: Translated by T. Holmes. With a new introd. for the Garland ed. by Irwin Abrams.
## 3266                                                                                                                                                                                                                                                                             Philosopher or dog? : | (Quincas Borba) / | $c: translated from the Portuguese by Clotilde Wilson.
## 3267                                                                                                                                                                                                                                                                                                                                    The violent wedding, | $c: by Robert Lowry.
## 3268                                                                                                                                                                                                                                                                                               The lover / | $c: Marguerite Duras ; translated from the French by Barbara Bray.
## 3269                                                                                                                                                                                                                                                                                                          African myths and legends / | $f: illustrated by Joan Kiddell-Monroe.
## 3270                                                                                                                                                                                                                                                                  Germinie Lacerteux / | $c: Edmond and Jules de Goncourt ; translated with an introduction by Leonard Tancock.
## 3271                                                                                                                                                                                                                                                                                                        The Flanders road / | $c: Translated from the French by Richard Howard.
## 3272                                                                                                                                                                                                                                                                      The holy well | $c: [by] Valentin Katayev. Translated from the Russian by Max Hayward and Harold Shukman.
## 3273                                                                                                                                                                                                                                                                                    Getting married; | $c: translated from the Swedish, edited and introduced by Mary Sandbach.
## 3274                                                                                                                                                                                                                                                                             The naked year, | $c: by Boris Pilnyak. Translated by Alec Brown. New York, Payson & Clarke [1928.
## 3275                                                                                                                                                                                                                                                  The death of the king's canary / | $c: [by] Dylan Thomas and John Davenport ; with an introduction by Constantine FitzGibbon.
## 3276                                                                                                                                                                                                                                                              Epitaph of a small winner; | $c: translated from the Portuguese by William L. Grossman. Drawings by Shari Frisch.
## 3277                                                                                                                                                                                                                                                                                                       Our conquest / | $c: Gert Hofmann ; translated by Christopher Middleton.
## 3278                                                                                                                                                                                                                                                                                                                               The black queen stories / | $c: Barry Callaghan.
## 3279                                                                                                                                                                                                                                                                                                                                                             Arabic folk tales.
## 3280                                                                                                                                                                                                                                                                                                                                       Guilt; | $c: translated by Gyula Gulyás;
## 3281                                                                                                       The virtuous orphan : | or, The life of Marianne, Countess of ***** / | $c: an eighteenth century English translation by Mary Mitchell Collyer of Marivaux's La vie de Marianne ; edited with a critical introd. by William Harlin McBurney and Michael Francis Shugrue.
## 3282                                                                                                                                                                                                                                                                             Choma's drum / | $c: K. Shivaram Karanth ; translated [from Kannada into English] by U. R. Kalkur.
## 3283                                                                                                                                                                                                                                                                      The whispering earth : | a novel / | $c: K. S. Karanth ; translated from the Kannada by A. N. Murthy Rao.
## 3284                                                                                                                                                                                                                                                                                                                                                The legacy / | $c: Howard Fast.
## 3285                                                                                                                                                                                                                                            Fierce and gentle warriors; | three stories, | $c: by Mikhail Sholokhov. Translated by Miriam Morton. Illustrated by Milton Glaser.
## 3286                                                                                                                                                                                                                                                                    The complete works of Count Tolstoy / | $c: [Translated from the original Russian and edited by Leo Wiener.
## 3287                                                                                                                                                                                                                                                                             Whole days in the trees / | $c: by Marguerite Duras ; translated from the French by Anita Barrows.
## 3288                                                                                                                                                                                                                                                                                         Miss Ravenel's conversion from secession to loyalty. | $c: Introduced by Arlin Turner.
## 3289                                                                                                                                                                                                                                                                                                                                   Martha, Eric & George / | $c: Margery Sharp.
## 3290                                                                                                                                                                                                                                                                                                           Zero / | $c: Ignácio de Loyola Brandão ; translated by Ellen Watson.
## 3291                                                                                                                                                                                                                                                                                                                                                            Beautiful feathers.
## 3292                                                                                                                                                                                                                                                           Volcano : | a novel / | $c: Shusaku Endo ; translated from the Japanese and with an introd. by Richard A. Schuchert.
## 3293                                                                                                                                                                                                                                                                            Surplussed barrelware / | $c: Vassily Aksyonov ; translated by Joel Wilkinson and Slava Yastremski.
## 3294                                                                                                                                                                                                                                                                                                                                                              The wrong people.
## 3295                                                                                                                                                                                                                                                                                                                        The second window : | a novel / | $c: by Robin Maugham.
## 3296                                                                                                                                                                                                                                                                                                                                                          They came to Cordura.
## 3297                                                                                                                                                                                                                                                                                                                                            A romantic hero, and other stories.
## 3298                                                                                                                                                                                                                                                                                           The underground game / | $c: Françoise Mallet-Joris ; translated by Herma Briffault.
## 3299                                                                                                                                                                                                                                                                                                            An arid heart. | $c: Translated from the Italian by William Weaver.
## 3300                                                                                                                                                                                                                                                                                                         Fausto and Anna / | $c: Carlo Cassola ; [translated by Isabel Quigly].
## 3301                                                                                                                                                                                                                                                                                      Tun-huang : | a novel / | $c: Yasushi Inoue ; translated [from Japanese] by Jean Oda Moy.
## 3302                                                                                                                                                                              The misused love letters; | $c: translated by Michael Bullock, and Regula Amrain and her youngest son; translated by Anne Fremantle: two novellas / Gottfried Keller; introd. by Michael Bullock.
## 3303                                                                                                                                                                                                                                                                                                                                    The pillar of salt / | $c: by Albert Memmi.
## 3304                                                                                                                                                                                                                                                                                                                                Capital : | a fiction / | $c: by Maureen Duffy.
## 3305                                                                                                                                                                                                                                                                                                                                                                       Bel-ami.
## 3306                                                                                                                                                                                                                                                                                                             A woman's life. | $c: Translated with an introd. by H.N.P. Sloman.
## 3307                                                                                                                                                                                             Huasipungo = | The villagers : a novel / | $c: Jorge Icaza. Authorized translation [from the expanded 1951 version] and introd. by Bernard M. Dulsey. Foreword by J. Cary Davis. -
## 3308                                                                                                                                                                                                                                                                                                                                             City of darkness / | $c: Ben Bova.
## 3309                                                                                                                                                                                                                                                                                    The time of miracles : | a legend / | $c: Borislav Pekić ; translated by Lovett F. Edwards.
## 3310                                                                                                                                                                                                                                                                                                                    When pumpkins blossomed. | $c: Translated by Drenka Willen.
## 3311                                                                                                                                                                                                                                                                                                                                                              The crystal cave.
## 3312                                                                                                                                                                                                                                                                                                                 Henry Lawson's mates : | the complete stories of Henry Lawson.
## 3313                                                                                                                                                                                                                                                                                                           A violent life; | $c: translated from the Italian by William Weaver.
## 3314                                                                                                                                                                                                                                                                                                                                                                    Greenstone.
## 3315                                                                                                                                                                                                                                                             The wayward head and heart / | $c: Crébillon fils ; translated by Barbara Bray ; introduced by Rayner Heppenstall.
## 3316                                                                                                                                                                                                                                                                     Between the hammer and the anvil / | $c: by Stefan Korbonski ; translated from the Polish by Marta Erdman.
## 3317                                                                                                                                                                                                                                                                               Fata Morgana, and other stories / | $c: Mikhailo Kotsyubinsky ; [translated from the Ukrainian].
## 3318                                                                                                                                                                                                                                                                                                                                                        Set this house on fire.
## 3319                                                                                                                                                                                                                                                                                                                                      The long march / | $c: by William Styron.
## 3320                                                                                                                                                                                                                                                                                                                                          Gorky Park / | $c: Martin Cruz Smith.
## 3321                                                                                                                                                                                                     People in the summer night | = Ihmiset suviyössä : an epic suite / | $c: F.E. Sillanpää ; translated from the Finnish by Alan Blair ; with an introd. by Thomas Warburton.
## 3322                                                                                                                                                                                                                                                                                                                                                      German stories and tales.
## 3323                                                                                                                                                                                                                                                                                                                                 Tread softly in this place, | by Brian Cleeve.
## 3324                                                                                                                                                                                                                                                                                                                            Real losses, imaginary gains / | $c: Wright Morris.
## 3325                                                                                                                                                                                                                                                                                                         The Insurrection / | $c: Antonio Skármeta ; translated by Paula Sharp.
## 3326                                                                                                                                                                                                                                                                                                                                                              Complete stories.
## 3327                                                                                                                                                                                                                               Fata morgana: | a story of the peasant life and sentiments / | $c: by Mikhailo Kotsyubinsky; [translated from the Ukrainian by Arthur Bernhard].
## 3328                                                                                                                                                                                                                                                                                                           Sara / | $c: Abbas Mahmoud el Akkad ; translated by Moustafa Badawi.
## 3329                                                                                                                                                                                                              Miramar / | $c: Naguib Mahfouz ; translated from Arabic by Fatma Moussa-Mahmoud ; edited and rev. by Maged el Kommos and John Rodenbeck ; introd. by John Fowles.
## 3330                                                                                                                                                                                                                                                                                                                                        Clear light of day / | $c: Anita Desai.
## 3331                                                                                                                                                                                                                                                                                                                             Strange doings; | $c: stories by R. A. Lafferty. -
## 3332                                                                                                                                                                                                                                                                                                                                            Soldier boy / | $c: Michael Shaara.
## 3333                                                                                                          The child buyer : | a novel in the form of hearings before the Standing Committee on Education, Welfare, & Public Morality of a certain State Senate, investigating the conspiracy of Mr. Wissey Jones, with others, to purchase a male child / | $c: by John Hersey.
##                                                                                                                                                                                                                                                                                                shorttitle
## 1                                                                                                                                                                                                                                                                                 Her sailor a love story
## 2                                                                                                                                                                                                                       The Canadian brothers, or, The prophecy fulfilled a tale of the late American war
## 3                                                                                                                                                                                                                                                                      Tales and traditions of the Eskimo
## 4                                                                                                                                                                                                                                                                             Ingo; the story of my otter
## 5                                                                                                                                                                                                                                                                               The call of the man-eater
## 6                                                                                                                                                                                                                                                                                      The created legend
## 7                                                                                                                                                                                                                       Off on a comet! : A journey through planetary space : (a sequel to "To the sun?")
## 8                                                                                                                                                                                                                                                                                              Dream days
## 9                                                                                                                                                                                                                                                                                              La Faustin
## 10                                                                                                                                                                                                                                                                                Scenes of clerical life
## 11                                                                                                                                                                                                                                                                                  Moonchild; a prologue
## 12                                                                                                                                                                                                                                                                                         Boston Blackie
## 13                                                                                                                                                                                                                                                                                          The professor
## 14                                                                                                                                                                                                                                                          This is Goggle; or, The education of a father
## 15                                                                                                                                                                                                                                                      Lays of Marie de France, and other French legends
## 16                                                                                                                                                                                                                                                                                             Zoo doctor
## 17                                                                                                                                                                                                                                                                                  The wings of the dove
## 18                                                                                                                                                                                                                             Fanny Fern : a memorial volume containing her select writings and a memoir
## 19                                                                                                                                                                                                                                                                             The lives of the Ford Boys
## 20                                                                                                                                                                                                                                                                Upstream, downstream and out of my mind
## 21                                                                                                                                                                                                                                                                            Dream tales and prose poems
## 22                                                                                                                                                                                                                                                                            Captain Blood : his odyssey
## 23                                                                                                                                                                                                                                                                     The mambo kings play songs of love
## 24                                                                                                                                                                                                                                                                                   Virgin soil; a novel
## 25                                                                                                                                                                                                                                                                                   Virgin soil; a novel
## 26                                                                                                                                                                                                                                                                                        Jennie Gerhardt
## 27                                                                                                                                                                                                                                                                                            Greenmantle
## 28                                                                                                                                                                                                                                             The Bruce, the history of Robert, the Bruce, King of Scots
## 29                                                                                                                                                                                                                                                                    McTeague : a story of San Francisco
## 30                                                                                                                                                                                                                                                                                  The sense of the past
## 31                                                                                                                                                                                                                                                                                                Victory
## 32                                                                                                                                                                                                                                                                                    An owl came to stay
## 33                                                                                                                                                                                                                                                                   The adventures of Elizabeth in Rügen
## 34                                                                                                                                                                                                                                                                                       A rant of ravens
## 35                                                                                                                                                                                                                                                Even cows go to heaven : veterinary antics of the 1960s
## 36                                                                                                                                                                                                                                      The mysterious freebooter, or, The days of Queen Bess : a romance
## 37                                                                                                                                                                                                                                                                                           Lady Athlyne
## 38                                                                                                                                                                                                                                                                                       Arthur Coningsby
## 39                                                                                                                                                                                                                    News from nowhere; or, An epoch of rest; being some chapters from a utopian romance
## 40                                                                                                                                                                                                                                                            The collected writings of Thomas de Quincey
## 41                                                                                                                                                                                                                                                                                     Siamese harem life
## 42                                                                                                                                                                                                                                                                                        A golden autumn
## 43                                                                                                                                                                                                                                                           The prince of Coucy : a historical novelette
## 44                                                                                                                                                                                                                                                                                           Yellow fever
## 45                                                                                                                                                                                                                                                         Star-crossed : the life and love of an actress
## 46                                                                                                                                                                                                                                                                                      Tales and stories
## 47                                                                                                                                                                                                                          A gentleman of France : being the memoirs of Gaston de Bonne, Sieur de Marsac
## 48                                                                                                                                                                                                                                                                                          Father Goriot
## 49                                                                                                                                                                                                                                                                                         Breaking-point
## 50                                                                                                                                                                                                                                                                                   Marius the Epicurean
## 51                                                                                                                                                                                                                                                                  Strange stories from a Chinese studio
## 52                                                                                                                                                                                                                                                  The American claimant, and other stories and sketches
## 53                                                                                                                                                                                                                                                                        Hungry stones and other stories
## 54                                                                                                                                                                                                                                Joan of Arc; or, The maid of Orleans. From Michelet's History of France
## 55                                                                                                                                                                                                                                                                      Pestalozzi's Leonard and Gertrude
## 56                                                                                                                                                                                                                                                                          Master of the day of judgment
## 57                                                                                                                                                                                                                                                                                          Skipper Worse
## 58                                                                                                                                                                                                                                                                                  Pirates of the spring
## 59                                                                                                                                                                                                                                                                                    A curate in Bohemia
## 60                                                                                                                                                                                                                                                                                        Gilles & Jeanne
## 61                                                                                                                                                                                                                                                                                     King, queen, knave
## 62                                                                                                                                                                                                                                                                                       Abai : a novel ;
## 63                                                                                                                                                                                                                                                                                       Abai : a novel ;
## 64                                                                                                                                                                                                                                                                                        Aspects of love
## 65                                                                                                                                                                                                                                                                                          For every sin
## 66                                                                                                                                                                                                                                                                                          Farther north
## 67                                                                                                                                                                                                                                                                                                   Love
## 68                                                                                                                                                                                                                                                                                Nehalem Tillamook tales
## 69                                                                                                                                                                                                                                                                            A country doctor's notebook
## 70                                                                                                                                                                                                                                                                                       Weapon of hunger
## 71                                                                                                                                                                                                                                                                               The red badge of courage
## 72                                                                                                                                                                                                                                                                                         Sofia Petrovna
## 73                                                                                                                                                                                                                                                                               Engagements of the heart
## 74                                                                                                                                                                                                                                                                                          Short stories
## 75                                                                                                                                                                                                                                                                                          Doctor Pascal
## 76                                                                                                                                                                                                                                                                       The last laugh and other stories
## 77                                                                                                                                                                                                                                                                                      Destiny : a novel
## 78                                                                                                                                                                                                                                                                                    Camilla : a novella
## 79                                                                                                                                                                                                                                                                                     Funerals are fatal
## 80                                                                                                                                                                                                                                                                                The cathedral : a novel
## 81                                                                                                                                                                                                                                                                                       Debit and credit
## 82                                                                                                                                                                                                                                                                                        Grammar of love
## 83                                                                                                                                                                                                                                                               Maigret and the death of a harbor-master
## 84                                                                                                                                                                                                                                                                                    Command and control
## 85                                                                                                                                                                                                                                                                                             Blue movie
## 86                                                                                                                                                                                                                                                                              Portrait of a man unknown
## 87                                                                                                                                                                                                                                                                                 Fifteen by Maupassant;
## 88                                                                                                                                                                                                                                                                                       Tent of miracles
## 89                                                                                                                                                                                                                                                                              Minuet for 25-shot guitar
## 90                                                                                                                                                                                                                                                                                      Death on the Nile
## 91                                                                                                                                                                                                                                                              El̂oisa : or, a series of original letters
## 92                                                                                                                                                                                                                                                                    Tales from a mother-of-pearl casket
## 93                                                                                                                                                                                                                                                                                           Buddenbrooks
## 94                                                                                                                                                                                                                                                                                                 U-boat
## 95                                                                                                                                                                                                                                                                                The man who liked women
## 96                                                                                                                                                                                                                                                                                   The daughter of time
## 97                                                                                                                                                                                                                                                                                   Wednesday's children
## 98                                                                                                                                                                                                                                                                                             The Berets
## 99                                                                                                                                                                                                                                                                                        The storyteller
## 100                                                                                                                                                                                                                                                                                  Laughter in the dark
## 101                                                                                                                                                                                                                                                                                                August
## 102                                                                                                                                                                                                                                                                                         Sannikov land
## 103                                                                                                                                                                                                                                                                           Maigret and the toy village
## 104                                                                                                                                                                                                                                                                         Tales of tenderness and power
## 105                                                                                                                                                                                                                                                                                    The Lifted curtain
## 106                                                                                                                                                                                                                                                                                         Flawless jade
## 107                                                                                                                                                                                                                                                                                 The defense : a novel
## 108                                                                                                                                                                                                                                                              The collected stories of Elizabeth Bowen
## 109                                                                                                                                                                                                                                               Supernatural Clwyd : the folk tales of North-East Wales
## 110                                                                                                                                                                                                                                                                  The divided world : selected stories
## 111                                                                                                                                                                                                                                                                      Cliffs of fall and other stories
## 112                                                                                                                                                                                                                                                                                         Manon Lescaut
## 113                                                                                                                                                                                                                                                           A Connecticut Yankee in King Arthur's court
## 114                                                                                                                                                                                                                                                                                             The trial
## 115                                                                                                                                                                                                                                                                                          Atala : René
## 116                                                                                                                                                                                                                                                                                              I, Robot
## 117                                                                                                                                                                                                                                                                         The scarlet letter; a romance
## 118                                                                                                                                                                                                                                                                                 Stories of a lifetime
## 119                                                                                                                                                                                                                                                                                     The Belton estate
## 120                                                                                                                                                                                                                                                                                  A world of strangers
## 121                                                                                                                                                                                                                                                                                            Norstrilia
## 122                                                                                                                                                                                                                                                                        The Roman spring of Mrs. Stone
## 123                                                                                                                                                                                                                                                                                            The castle
## 124                                                                                                                                                                                                                                                                                   Farewell, my lovely
## 125                                                                                                                                                                                                                                                                                           Clochemerle
## 126                                                                                                                                                                                                                                                                                            Crossroads
## 127                                                                                                                                                                                                                                                                     Chinese fairy tales and fantasies
## 128                                                                                                                                                                                                                                                                                         Brighton rock
## 129                                                                                                                                                                                                                                                       Swallow barn; or, A sojourn in the Old Dominion
## 130                                                                                                                                                                                                                                                                               Adrift in Soho, a novel
## 131                                                                                                                                                                                                                                                                                     The age of reason
## 132                                                                                                                                                                                                                                                                                    Lucky Jim; a novel
## 133                                                                                                                                                                                                                                                               The stainless steel rat saves the world
## 134                                                                                                                                                                                                                                                               The complete short stories [in 3 vols.]
## 135                                                                                                                                                                                                                                                               The complete short stories [in 3 vols.]
## 136                                                                                                                                                                                                                                                                                The portrait of a lady
## 137                                                                                                                                                                                                                                                                                       Eugénie Grandet
## 138                                                                                                                                                                                                                                                                                             Jane Eyre
## 139                                                                                                                                                                                                                                                                                 Stories of a lifetime
## 140                                                                                                                                                                                                                                                                                          The reprieve
## 141                                                                                                                                                                                                                                                                         The prime of Miss Jean Brodie
## 142                                                                                                                                                                                                                     Tales of terror and fantasy: ten stories from "Tales of mystery and imagination";
## 143                                                                                                                                                                                                                                                                                      Bird of the East
## 144                                                                                                                                                                                                                                                                                              Lord Jim
## 145                                                                                                                                                                                                                                                        A sentimental journey through France and Italy
## 146                                                                                                                                                                                                                                                                                 The call of the wild;
## 147                                                                                                                                                                                                                                                          Passing time & A change of heart; two novels
## 148                                                                                                                                                                                                                                                                                         Anna Karenina
## 149                                                                                                                                                                                                                             Canada Bill; including 'The talking leather' and '"One Eye" Joe Burkers,'
## 150                                                                                                                                                                                                                                                                                    The farewell party
## 151                                                                                                                                                                                                                                                        The high window ; The long good-bye ; Playback
## 152                                                                                                                                                                                                                                                                                       The black tulip
## 153                                                                                                                                                                                                                                                                                         Poisoned bait
## 154                                                                                                                                                                                            The pilgrim's progress from this world to that which is to come, delivered under the similitude of a dream
## 155                                                                                                                                                                                                                                                                            Sylvie - her teenage years
## 156                                                                                                                                                                                                                                                                The cheapest nights, and other stories
## 157                                                                                                                                                                                                                                                                                         Uncle Charles
## 158                                                                                                                                                                                                                                                                                           Cabin fever
## 159                                                                                                                                                                                                                                                                                      Mabinogion tales
## 160                                                                                                                                                                                                                                                                                  The family Carnovsky
## 161                                                                                                                                                                                                                                                                                        Arab folktales
## 162                                                                                                                                                                                                                                                   The middle parts of fortune : Somme and Ancre, 1916
## 163                                                                                                                                                                                                                                    Memoirs of a space traveller : further reminiscences of Ijon Tichy
## 164                                                                                                                                                                                                                                                                Ruler in Hiroona : a West Indian novel
## 165                                                                                                                                                                                                                                                                          More tales of Pirx the pilot
## 166                                                                                                                                                                                                                                                 The instant millionaire : a tale of wisdom and wealth
## 167                                                                                                                                                                                                                                                                                            Spider cup
## 168                                                                                                                                                                                                                                                                                     Seven red Sundays
## 169                                                                                                                                                                                                                                                                              Each man in his darkness
## 170                                                                                                                                                                                            They shoot horses, don't they ; Kiss tomorrow goodbye ; No pockets in a shroud ; I should have stayed home
## 171                                                                                                                                                                                                                                                                          The opportunities of a night
## 172                                                                                                                                                                                                                                                                                         Cat and mouse
## 173                                                                                                                                                                                                              Castle Rackrent. Essay on Irish bulls. The science of self-justification. Ennui. The dun
## 174                                                                                                                                                                                                                                                                                                Lilith
## 175                                                                                                                                                                                                                                                                                         The ante-room
## 176                                                                                                                                                                                                                                                                                          Young Tr̲less
## 177                                                                                                                                                                                                                                                                               The heart of the matter
## 178                                                                                                                                                                                                                                                                           Nectar in a sieve : a novel
## 179                                                                                                                                                                                                                The Golden Lotus; a translation from the Chinese original of the novel, Chin pʻing mei
## 180                                                                                                                                                                                                                                                           Two adolescents : Agostino and Disobedience
## 181                                                                                                                                                                                                                                                                                          Tell freedom
## 182                                                                                                                                                                                                                                                                                            Last tales
## 183                                                                                                                                                                                                                                                                             Seduction of the minotaur
## 184                                                                                                                                                                                                                                                                                             Seraphita
## 185                                                                                                                                                                                                                                                                               The nun (La religieuse)
## 186                                                                                                                                                                                                                                                                                    A wreath for Udomo
## 187                                                                                                                                                                                                                                                                                   Can such things be?
## 188                                                                                                                                                                                                                          A Muriel Spark trio: The comforters, The ballad of Peckham Rye, Memento mori
## 189                                                                                                                                                                                                             The Song of the Nibelungs. A verse translation from the Middle High German Nibelungenlied
## 190                                                                                                                                                                                                                                                                                    In black and white
## 191                                                                                                                                                                                                                                                      A rackety colt : the adventures of Thomas Stubbs
## 192                                                                                                                                                                                                                                                                              The Doris Lessing reader
## 193                                                                                                                                                                                                                                                                                         The Iron King
## 194                                                                                                                                                                                                                                                                                   The strangled queen
## 195                                                                                                                                                                                                                                                                                    The powers that be
## 196                                                                                                                                                                                                                                                                                   Maigret sets a trap
## 197                                                                                                                                                                                                                                                                             Notes from the dead house
## 198                                                                                                                                                                                                                                                                            Maigret and the pickpocket
## 199                                                                                                                                                                                                                                                                                       The long voyage
## 200                                                                                                                                                                                                                                                                       North Carolina ghosts & legends
## 201                                                                                                                                                                                                                                                                        The other side of the mountain
## 202                                                                                                                                                                                                                                                                                   Stowaway to nowhere
## 203                                                                                                                                                                                                                                                                                The toilers of the sea
## 204                                                                                                                                                                                                                                  Mountain man : a novel of male and female in the early American West
## 205                                                                                                                                                                                                                                                                                          The fog line
## 206                                                                                                                                                                                                                                                                                The great English nude
## 207                                                                                                                                                                                                                                                                                      The sacred night
## 208                                                                                                                                                                                                                                                                                      A passionate man
## 209                                                                                                                                                                                                                                                         The uncollected writings of Thomas De Quincey
## 210                                                                                                                                                                                                                           Zakhar Berkut : a picture of life in thirteenth-century Carpathian Ruthenia
## 211                                                                                                                                                                                                              The Golden Lotus : a translation, from the Chinese original, of the novel Chin Pʻing Mei
## 212                                                                                                                                                                                                                                                                                     "Was- " : a novel
## 213                                                                                                                                                                                                                                          Confessions of Felix Krull, confidence man : the early years
## 214                                                                                                                                                                                                                                                                             Memoirs of an anti-Semite
## 215                                                                                                                                                                                                                                                                                           Last refuge
## 216                                                                                                                                                                                                                                                              Constancia and other stories for virgins
## 217                                                                                                                                                                                                                                                                                       Last man to die
## 218                                                                                                                                                                                                                                                         A circle round the sun : a foreigner in Japan
## 219                                                                                                                                                                                                                                                                                      Ghosts of Surrey
## 220                                                                                                                                                                                                                                                                               For a roll of parchment
## 221                                                                                                                                                                                                                                                                                Maigret goes to school
## 222                                                                                                                                                                                                                                                                       Varying degrees of hopelessness
## 223                                                                                                                                                                                                                                                                                  Dry bones that dream
## 224                                                                                                                                                                                                                                                                   Of gods and giants; norse mythology
## 225                                                                                                                                                                                                                                                                                       Dangerous games
## 226                                                                                                                                                                                                                                                                            The truth about Bébé Donge
## 227                                                                                                                                                                                                                                                                              A violent life : a novel
## 228                                                                                                                                                                                                                                                                                 Silent day in Tangier
## 229                                                                                                                                                                                                                                                                                         Four novellas
## 230                                                                                                                                                                                                                                                                                     Our share of time
## 231                                                                                                                                                                                                                                                                             Korean folk & fairy tales
## 232                                                                                                                                                                                                                                                       Straight up : the autobiography of Arthur Daley
## 233                                                                                                                                                                                                                                                                                  Fathers and children
## 234                                                                                                                                                                                                                                                                                     Bones and silence
## 235                                                                                                                                                                                                                                                                            Mendelssohn is on the roof
## 236                                                                                                                                                                                                                                                        The last days of William Shakespeare : a novel
## 237                                                                                                                                                                                                                                                                        Clap hands, here comes Charlie
## 238                                                                                                                                                                                                                                                      It ends with magic ... : a Milligan family story
## 239                                                                                                                                                                                                                                                                                        Right and left
## 240                                                                                                                                                                                                                                                                                                 Queer
## 241                                                                                                                                                                                                                                                                                Beyond the black stump
## 242                                                                                                                                                                                                                                                                                         Forced smiles
## 243                                                                                                                                                                                                                                                                                           Five novels
## 244                                                                                                                                                                                                                                                                                  The killer : a novel
## 245                                                                                                                                                                                                                                                                                             Adam Bede
## 246                                                                                                                                                                                                                                                                                           Ruined boys
## 247                                                                                                                                                                                                                                                                                        Bread and wine
## 248                                                                                                                                                                                                                                                                                     The distant lands
## 249                                                                                                                                                                                                                                                                                    A kind of marriage
## 250                                                                                                                                                                                                                                                                                             Dogeaters
## 251                                                                                                                                                                                                                                                                                 Pita Dumbrok's prison
## 252                                                                                                                                                                                                                                                                                            Song of be
## 253                                                                                                                                                                                                                                                                                          The battlers
## 254                                                                                                                                                                                                                                                                                     Strange loyalties
## 255                                                                                                                                                                                                                                                                       The country of the pointed firs
## 256                                                                                                                                                                                                                                                                  The last prince of Ireland : a novel
## 257                                                                                                                                                                                                                                                                                     Women in evidence
## 258                                                                                                                                                                                                                                                                                                 Women
## 259                                                                                                                                                                                                                                              Footprints in the Quag : stories & dialogues from Soweto
## 260                                                                                                                                                                                                                                                                           They couldn't lose the body
## 261                                                                                                                                                                                                                                                                           The destruction of the Jews
## 262                                                                                                                                                                                                                                                                                        A severed head
## 263                                                                                                                                                                                                                                                 The struggle in space; red dream: Soviet-American war
## 264                                                                                                                                                                                                                                             Poets and dreamers: studies & translations from the Irish
## 265                                                                                                                                                                                                                                                                               The professor of desire
## 266                                                                                                                                                                                                                                                                              Mogens and other stories
## 267                                                                                                                                                                                                                                                                                           Night shift
## 268                                                                                                                                                                                                                                                                                          Bleak spring
## 269                                                                                                                                                                                                                                                                                  They came to Baghdad
## 270                                                                                                                                                                                                                                                           The sympathetic undertaker and other dreams
## 271                                                                                                                                                                                                                                                                                        Eye in the sky
## 272                                                                                                                                                                                                                                                                                          Loving Roger
## 273                                                                                                                                                                                                                                                       Translations from the Russian and other stories
## 274                                                                                                                                                                                                                                                                 The silencer : another Levantine tale
## 275                                                                                                                                                                                                                                                                                 Pilgrimage to Dzhvari
## 276                                                                                                                                                                                                                                                                                           The journey
## 277                                                                                                                                                                                                                                                                                    The magic mountain
## 278                                                                                                                                                                                                                                         The maiden who rose from the sea and other Finnish folk tales
## 279                                                                                                                                                                                                                                                                                            The bridge
## 280                                                                                                                                                                                                                                                                                      Consider Phlebas
## 281                                                                                                                                                                                                                                                                                               Oblomov
## 282                                                                                                                                                                                                                                                                                        Judge on trial
## 283                                                                                                                                                                                                                                                                     But beautiful : a book about jazz
## 284                                                                                                                                                                                                                                                                                                  Fear
## 285                                                                                                                                                                                                                                                      Nine magic pea-hens and other Serbian folk tales
## 286                                                                                                                                                                                                                                                                                            Star peace
## 287                                                                                                                                                                                                                                             The complete prose tales of Alexandr Sergeyevitch Pushkin
## 288                                                                                                                                                                                                                                                                                    The gift of stones
## 289                                                                                                                                                                                                                                                                                 October eight o'clock
## 290                                                                                                                                                                                                                                                                                         The gillyvors
## 291                                                                                                                                                                                                                                                                                               Oblomov
## 292                                                                                                                                                                                                                                                                                     Holograms of fear
## 293                                                                                                                                                                                                                                                                                         Tropical sins
## 294                                                                                                                                                                                                                                               The Legend of Cuckoo Namjil : [folk tales from Mongolia
## 295                                                                                                                                                                                                                                                                                       The simple life
## 296                                                                                                                                                                                                                                                                                             Primavera
## 297                                                                                                                                                                                                                                                                                 Sense and sensibility
## 298                                                                                                                                                                                                                                              The good soldier Švejk and his fortunes in the World War
## 299                                                                                                                                                                                                                                                              Myths and traditions of the Crow Indians
## 300                                                                                                                                                                                                                                                                                   A tiler's afternoon
## 301                                                                                                                                                                                                                                                                                The mother-in-law joke
## 302                                                                                                                                                                                                                                                                  I think we should go into the jungle
## 303                                                                                                                                                                                                                                                                                   The chariot of time
## 304                                                                                                                                                                                                                                                                            The march of the musicians
## 305                                                                                                                                                                                                                                                                                          Little apple
## 306                                                                                                                                                                                                                                                                 The knight and death : three novellas
## 307                                                                                                                                                                                                                                                                                      My golden trades
## 308                                                                                                                                                                                                                                                                                     Dreams of leaving
## 309                                                                                                                                                                                                                                                                                  Sleepwalker in a fog
## 310                                                                                                                                                                                                                                                                Fallen angels : stories of los gamines
## 311                                                                                                                                                                                                                                                                                         Chapel Street
## 312                                                                                                                                                                                                                                                                                               Sailing
## 313                                                                                                                                                                                                                                                                         Swedish folktales and legends
## 314                                                                                                                                                                                                                                                                                               Infanta
## 315                                                                                                                                                                                                                                                                                         Solar lottery
## 316                                                                                                                                                                                                                                                                                              The doll
## 317                                                                                                                                                                                                                                                                                              The laws
## 318                                                                                                                                                                                                                                                                      The politician and other stories
## 319                                                                                                                                                                                                                                                                                            Grand days
## 320                                                                                                                                                                                                                                                                                        The chosen bud
## 321                                                                                                                                                                                                                                                                                          The only son
## 322                                                                                                                                                                                                                                                              The silken thread : stories and sketches
## 323                                                                                                                                                                                                                                                                             The kingdom of this world
## 324                                                                                                                                                                                                                                                                                   Monkeys in the dark
## 325                                                                                                                                                                                                                                                                                         Deadly cargo!
## 326                                                                                                                                                                                                                                                              Post office restaurant and other stories
## 327                                                                                                                                                                                                                                                                                      The ship who won
## 328                                                                                                                                                                                                                                                                                               Amerika
## 329                                                                                                                                                                                                                                                                                    A sea of troubles;
## 330                                                                                                                                                                                                                                  The personal history and experience of David Copperfield the younger
## 331                                                                                                                                                                                                                                                                                     The reign of Nero
## 332                                                                                                                                                                                                                                                                              The man who broke things
## 333                                                                                                                                                                                                                                                                           Southern mail. Night flight
## 334                                                                                                                                                                                                                                                                                       Pieces of music
## 335                                                                                                                                                                                                                                                                                   The mountain people
## 336                                                                                                                                                                                                                                                                                   My brother, my self
## 337                                                                                                                                                                                                                                                                                  Turbulence : a novel
## 338                                                                                                                                                                                                                                                        A taste of earth, and other legends of Vietnam
## 339                                                                                                                                                                                                                                                                                  The midnight country
## 340                                                                                                                                                                                                                                                                                       The son avenger
## 341                                                                                                                                                                                                                                                                   Imagining women : Fujian folk tales
## 342                                                                                                                                                                                                                                                                               The midnight love feast
## 343                                                                                                                                                                                                                                                                                                 Nexus
## 344                                                                                                                                                                                                                                                                                           The prodigy
## 345                                                                                                                                                                                                                                                                                             Americana
## 346                                                                                                                                                                                                                                                                                 The sword of Shannara
## 347                                                                                                                                                                                                                                                                               The assistant : a novel
## 348                                                                                                                                                                                                                                                                             The house of seven gables
## 349                                                                                                                                                                                                                                                                                          The survivor
## 350                                                                                                                                                                                                                                                                                    To the death, amic
## 351                                                                                                                                                                                                                                                                                        Just like that
## 352                                                                                                                                                                                                                                                     Kiss in the Hotel Joseph Conrad and other stories
## 353                                                                                                                                                                                                                                                                 A last glass of tea and other stories
## 354                                                                                                                                                                                                                                                                                   A year of our lives
## 355                                                                                                                                                                                                                                                Sibenik : in the period of Tito's partisans, 1941-1945
## 356                                                                                                                                                                                                                                                                                Appointment with death
## 357                                                                                                                                                                                                                                                                             Parisians and provincials
## 358                                                                                                                                                                                                                                                                                                  Emma
## 359                                                                                                                                                                                                                                                                                                  Emma
## 360                                                                                                                                                                                                                                                 French folktales from the collection of Henri Pourrat
## 361                                                                                                                                                                                                                                                                          Three Egyptian short stories
## 362                                                                                                                                                                                                                              Folk tales and legends of the Dai people : the Thai Lue in Yunnan, China
## 363                                                                                                                                                                                                                                                                                 Coromandel sea change
## 364                                                                                                                                                                                                                                                                                   The sense of things
## 365                                                                                                                                                                                                                                                                                          Dom Casmurro
## 366                                                                                                                                                                                                                                                                                                Elissa
## 367                                                                                                                                                                                                                                                                                          René's flesh
## 368                                                                                                                                                                                                                                                                                    Manhattan transfer
## 369                                                                                                                                                                                                                                                                       Zami, a new spelling of my name
## 370                                                                                                                                                                                                                                                                                    Folktales of Japan
## 371                                                                                                                                                                                                                                                                                     Korean folk-tales
## 372                                                                                                                                                                                                                                                                             The trials of Nero Okambo
## 373                                                                                                                                                                                                                                                                                                Shades
## 374                                                                                                                                                                                                                                                                 The key of gold : 23 Czech folk tales
## 375                                                                                                                                                                                                                                                                                                Family
## 376                                                                                                                                                                                                                                                                       The remains of the last emperor
## 377                                                                                                                                                                                                                                                                    Echoes in the mind : short stories
## 378                                                                                                                                                                                                                                                                            The city and the mountains
## 379                                                                                                                                                                                                                                                                     Jury : the people vs. Juan Corona
## 380                                                                                                                                                                                                                                         The collector of treasures:  and other Botswana village tales
## 381                                                                                                                                                                                                                                                                              A Chinese torture garden
## 382                                                                                                                                                                                                                                                  The trusting and the maimed, and other Irish stories
## 383                                                                                                                                                                                                                                                                      The country of marriage; a novel
## 384                                                                                                                                                                                                                                                     The political prisoner, and, The beautiful summer
## 385                                                                                                                                                                                                                                                                                      Wonderful clouds
## 386                                                                                                                                                                                                                                                                   The good soldier, a tale of passion
## 387                                                                                                                                                                                                                                                                                 Diamonds of the night
## 388                                                                                                                                                                                                                                                                                           The tin men
## 389                                                                                                                                                                                                                                                                                            Blue river
## 390                                                                                                                                                                                                                                                                                       House of tribes
## 391                                                                                                                                                                                                                                                                       Forbidden fruit and other tales
## 392                                                                                                                                                                                                                                                                   Killers are storming the Parliament
## 393                                                                                                                                                                                                                                                                                      In his own image
## 394                                                                                                                                                                                                                                                                              From a Swedish homestead
## 395                                                                                                                                                                                                                                                                             The Count of Monte Cristo
## 396                                                                                                                                                                                                                                                                   The collected tales of Pierre Louÿs
## 397                                                                                                                                                                                                                                                                                   Trap for Cinderella
## 398                                                                                                                                                                                                                                                                                  The end of vandalism
## 399                                                                                                                                                                                                                                                                              The ram of God : a novel
## 400                                                                                                                                                                                                                                                     Quo vadis : a classic story of love and adventure
## 401                                                                                                                                                                                                                                                                            Gather yourselves together
## 402                                                                                                                                                                                                                                                                            Half of paradise : a novel
## 403                                                                                                                                                                                                                                                                                      The rape of Sita
## 404                                                                                                                                                                                                                                                The Phynodderree, and other legends of the Isle of Man
## 405                                                                                                                                                                                                                                              Them, a novel from the last days of the old South Africa
## 406                                                                                                                                                                                                              Scandinavian folk-lore; illustrations of the traditional beliefs of the northern peoples
## 407                                                                                                                                                                                                                                                                                Brothers of the Cosmos
## 408                                                                                                                                                                                                                                                                                    Paradise reclaimed
## 409                                                                                                                                                                                                                                                                           Essential Chinese mythology
## 410                                                                                                                                                                                                                                                                                            Red nights
## 411                                                                                                                                                                                                                                                                                     The party is over
## 412                                                                                                                                                                                                                                                                          Chéri, and The last of Chéri
## 413                                                                                                                                                                                                                                                                    The secret agent -- The inheritors
## 414                                                                                                                                                                                                                                                                                             The Iliad
## 415                                                                                                                                                                                             The pastoral loves of Daphnis and Chloe / done into English by George Moore ; introduction by Samuel Roth
## 416                                                                                                                                                                                                                                                                                            La bâtarde
## 417                                                                                                                                                                                                                               Confession of a child of the century = Confession d'un enfant du siècle
## 418                                                                                                                                                                                                                                                                                        House of dolls
## 419                                                                                                                                                                                                                                                                                      Selected stories
## 420                                                                                                                                                                                                                                                                                             Mobie-Diq
## 421                                                                                                                                                                                                                                                                                  Rising sun : a novel
## 422                                                                                                                                                                                                                                                                     Nostromo : a tale of the seaboard
## 423                                                                                                                                                                                                                                                                                   The children's wing
## 424                                                                                                                                                                                                                                                                               Seven tales and a fable
## 425                                                                                                                                                                                                                                                                                 Pleasures and regrets
## 426                                                                                                                                                                                                                                                                                             The donor
## 427                                                                                                                                                                                                                                                                                             Kent Town
## 428                                                                                                                                                                                                                                                            The lady in the car with glasses and a gun
## 429                                                                                                                                                                                                                                                                                      Sheikh of lovers
## 430                                                                                                                                                                                                                                                    Weird tales from northern seas : Norwegian legends
## 431                                                                                                                                                                                                                                                 Russian adult humor : naughty folktales of old Russia
## 432                                                                                                                                                 The rainbow flute : a collection of short stories translated from indigenous languages to reflect the spectrum of Black experience in Southern Africa
## 433                                                                                                                                                                                                                                                                   Watunna : an Orinoco creation cycle
## 434                                                                                                                                                                                                                                                   Return to the château ; preceded by, A girl in love
## 435                                                                                                                                                                                                                                                                                          The Spaniard
## 436                                                                                                                                                                                                                                                                                               Lao She
## 437                                                                                                                                                                                                                                                                                 North star conspiracy
## 438                                                                                                                                                                                                                                                                          Maori myths & tribal legends
## 439                                                                                                                                                                                                                                                                                           Shadowlight
## 440                                                                                                                                                                                                                                                                                    The chin kiss king
## 441                                                                                                                                                                                                                                                                                            Six novels
## 442                                                                                                                                                                                                                                                                                      Twice twenty-two
## 443                                                                                                                                                                                                                                                                                       Baroque at dawn
## 444                                                                                                                                                                                                                                                             Cousin Bette : part one of Poor relations
## 445                                                                                                                                                                                                                                                                               Moonbay : short stories
## 446                                                                                                                                                                                                                                                                The gates of Kunarja; an Ogilvie novel
## 447                                                                                                                                                                                                                                                                                         The strollers
## 448                                                                                                                                                                                                                                                                               The night of the hunter
## 449                                                                                                                                                                                                                                                                                  The veil of Veronica
## 450                                                                                                                                                                                                                                                                                   The sundering flood
## 451                                                                                                                                                                                                                                                                                                Tamsin
## 452                                                                                                                                                                                                                                                 Roubles in words, kopeks in figures and other stories
## 453                                                                                                                                                                                                                                                                              The teardrop story woman
## 454                                                                                                                                                                                                                                                                             The happy hunting grounds
## 455                                                                                                                                                                                                                                                                                        The stone raft
## 456                                                                                                                                                                                                                                                Snowbound : the record of a theatrical touring company
## 457                                                                                                                                                                                                                                                              Down there (Là bas); a study in satanism
## 458                                                                                                                                                                                                                                                                                 The lostness of Alice
## 459                                                                                                                                                                                                                                                                        Adventures of Huckleberry Finn
## 460                                                                                                                                                                                                                                            A victim of circumstances : E.S. Madima's celebrated novel
## 461                                                                                                                                                                                                                                                                                    Because I love him
## 462                                                                                                                                                                                                                                                                                        The quiet land
## 463                                                                                                                                                                                                                                                                                                Psyche
## 464                                                                                                                                                                                                                                                                               The three-arched bridge
## 465                                                                                                                                                                                                                                                                                           The realist
## 466                                                                                                                                                                                                                                                                                       Mpuonzi's dream
## 467                                                                                                                                                                                                                                                                                                      
## 468                                                                                                                                                                                                                                                                                           Virgin soil
## 469                                                                                                                                                                                                                                                                                           Virgin soil
## 470                                                                                                                                                                                                                                                                     Fabulya's wives and other stories
## 471                                                                                                                                                                                                                                                                          The melancholy of resistance
## 472                                                                                                                                                                                                                                                                                      My brother's gun
## 473                                                                                                                                                                                                                                                                                  The twelfth dialogue
## 474                                                                                                                                                                                                                                                                   Smoke. Fathers and sons. First love
## 475                                                                                                                                                                                                                                                                   Creation myths of primitive America
## 476                                                                                                                                                                                                                                                                                  Grendel : past prime
## 477                                                                                                                                                                                                                                                                                    One minute stories
## 478                                                                                                                                                                                                                                                                                     Colours and years
## 479                                                                                                                                                                                                                                                                                     The sun worshiper
## 480                                                                                                                                                                                                                                                                                The new life : a novel
## 481                                                                                                                                                                                                                                                                                       Breathing space
## 482                                                                                                                                                                                                                                                                                Prayers of a young man
## 483                                                                                                                                                                                                                                                                                    The merciful women
## 484                                                                                                                                                                                                                                                                            Brown lord of the mountain
## 485                                                                                                                                                                                                                                                                          Traditional Slovak folktales
## 486                                                                                                                                                                                                                                                                                                  Like
## 487                                                                                                                                                                                                                                                                                        The white life
## 488                                                                                                                                                                                                                                                                    God made Sunday, and other stories
## 489                                                                                                                                                                                                                                                                                  My name is Alzheimer
## 490                                                                                                                                                                                                                                                                                  The queen of trouble
## 491                                                                                                                                                                                                                                                                                        Les misérables
## 492                                                                                                                                                                                                                                                                           The winter garden : a novel
## 493                                                                                                                                                                                                                                                                                         Silent extras
## 494                                                                                                                                                                                                                                                                                      People of heaven
## 495                                                                                                                                                                                                                                                                  All men are brothers (Shui hu chuan)
## 496                                                                                                                                                                                                                                                                               The garden of tortures;
## 497                                                                                                                                                                                                                                                          Lowland tales : short stories from Friesland
## 498                                                                                                                                                                                                                                                                           The tattoo hunter : a novel
## 499                                                                                                                                                                                                                                                                                    The Flanders panel
## 500                                                                                                                                                                                                                                                                                      A vase of shrubs
## 501                                                                                                                                                                                                                                                                                     The Stone diaries
## 502                                                                                                                                                                                                                                                     The Queen of Spades [and], The captain's daughter
## 503                                                                                                                                                                                                                                                                                   The way we live now
## 504                                                                                                                                                                                                                                                                                               Suttree
## 505                                                                                                                                                                                                                                                                                        The Dumas club
## 506                                                                                                                                                                                                                                                                                 What makes Sammy run?
## 507                                                                                                                                                                                                                                                                                       The white guard
## 508                                                                                                                                                                                                                                      The transformations of Lucius; otherwise known as The golden ass
## 509                                                                                                                                                                                                                                                  Who's afraid of Agatha Christie? : and other stories
## 510                                                                                                                                                                                                                                                                                     Cephalonian tales
## 511                                                                                                                                                                                                                                                               Charles, Diana and me and other stories
## 512                                                                                                                                                                                                                                                                       Mongolian folktales and legends
## 513                                                                                                                                                                                                                                                                                  The circle of reason
## 514                                                                                                                                                                                                                                                                 Selected short stories of Franz Kafka
## 515                                                                                                                                                                                                                                                                                       A ghost at noon
## 516                                                                                                                                                                                                                                                                                         Buridan's ass
## 517                                                                                                                                                                                                                                                                                Tales of two countries
## 518                                                                                                                                                                                                                                                                                 The secret of my face
## 519                                                                                                                                                                                                                                                                                     The German lesson
## 520                                                                                                                                                                                                                                                                       As far as my feet will carry me
## 521                                                                                                                                                                                                                                  Selected Russian short stories, chosen and translated by A.E. Chamot
## 522                                                                                                                                                                                                                                                                       John Christopher: Journey's end
## 523                                                                                                                                                                                                                                                                         Other side; a fantastic novel
## 524                                                                                                                                                                                                                                                                                 The Sardinian hostage
## 525                                                                                                                                                                                                 The answers of Ernst von Salomon to the 131 questions in the Allied Military Government "Fragebogen";
## 526                                                                                                                                                                                                                                                                                     A crime of honour
## 527                                                                                                                                                                                                                                                                The story of Adan-Wade : a Tiv classic
## 528                                                                                                                                                                                                                                                                                        Sleepless days
## 529                                                                                                                                                                                                                                         A servant of slaves : the life of Henriette Delille : a novel
## 530                                                                                                                                                                                                                                                                                   The Book of Amuwapi
## 531                                                                                                                                                                                                                                                                                  Night work : a novel
## 532                                                                                                                                                                                                                                                                                A catch of consequence
## 533                                                                                                                                                                                                                                                                                      Ruslan : a novel
## 534                                                                                                                                                                                                                                                                Icelandic folk tales and fairy stories
## 535                                                                                                                                                                                                                                                           My husband, Bar Kokhba : a historical novel
## 536                                                                                                                                                                                                                                                                                            Pig island
## 537                                                                                                                                                                                                                                                                                       No god in sight
## 538                                                                                                                                                                                                                                                                                          Wound Licker
## 539                                                                                                                                                                                                                                                    Tear down the mountain : an Appalachian love story
## 540                                                                                                                                                                                                                                                                                     Settling accounts
## 541                                                                                                                                                                                                                                                                              From the listening hills
## 542                                                                                                                                                                                                                                                                                              Red zone
## 543                                                                                                                                                                                                                                                                       In the presence of mine enemies
## 544                                                                                                                                                                                                                                                                                        Nothing simple
## 545                                                                                                                                                                                                                                                                                    Moroccan folktales
## 546                                                                                                                                                                                                                                                                                               Thérèse
## 547                                                                                                                                                                                                                                                                                        Wings of stone
## 548                                                                                                                                                                                                                                                                     The fairy flag, and other stories
## 549                                                                                                                                                                                                                                                                                     The white lioness
## 550                                                                                                                                                                                                                                                          Sparrow, Temptation and Cavalleria Rusticana
## 551                                                                                                                                                                                                                                                                                         Call me Kick!
## 552                                                                                                                                                                                                                                                                                               Baggage
## 553                                                                                                                                                                                                                                                                    The 13 culprits = Les 13 coupables
## 554                                                                                                                                                                                                                                                                                    The silent prophet
## 555                                                                                                                                                                                                                                                                             The other shore : a novel
## 556                                                                                                                                                                                                                                                                                          Mawardi cafe
## 557                                                                                                                                                                                                                                                                                         Short stories
## 558                                                                                                                                                                                                                                                                The language of pain and other stories
## 559                                                                                                                                                                                                                                                                                       Uncertain glory
## 560                                                                                                                                                                                                                                                                                                 Lucca
## 561                                                                                                                                                                                                                                                                                 Riding with the queen
## 562                                                                                                                                                                                                                                                                                            The lovers
## 563                                                                                                                                                                                                                                                          Confession of a murderer : told in one night
## 564                                                                                                                                                                                                                                                                                 The Fu-Manchu omnibus
## 565                                                                                                                                                                                                                                         Brother Bill's bait bites back and other tales from the Raton
## 566                                                                                                                                                                                                                                                                                              Lovesick
## 567                                                                                                                                                                                                                                                                                The madman of Bergerac
## 568                                                                                                                                                                                                                                                                             African myths and legends
## 569                                                                                                                                                                                                                                                                                 Maigret and the ghost
## 570                                                                                                                                                                                                                                                                                  The anatomy of truth
## 571                                                                                                                                                                                                                                                                                       The secret cure
## 572                                                                                                                                                                                                                                                                                     The piano teacher
## 573                                                                                                                                                                                                                                                                                        Separate rooms
## 574                                                                                                                                                                                                                                                                                      Others' paradise
## 575                                                                                                                                                                                                                                                                                   The ultimate Havana
## 576                                                                                                                                                                                                                                                                          The love queen of the Amazon
## 577                                                                                                                                                                                                                                                          A hunger most cruel : selected prose fiction
## 578                                                                                                                                                                                                                                                                 Broken wings : selected prose fiction
## 579                                                                                                                                                                                                                                                                                 Parting of the clouds
## 580                                                                                                                                                                                                                                                                                     An Irish solution
## 581                                                                                                                                                                                                                                                                        Stormy isles : an Azorean tale
## 582                                                                                                                                                                                                                                                                          Waltzes I have not forgotten
## 583                                                                                                                                                                                                                                                 Texas ghost stories : fifty favorites for the telling
## 584                                                                                                                                                                                                                                                                    The prince and other modern fables
## 585                                                                                                                                                                                                                                                                   Of gods and giants: Norse mythology
## 586                                                                                                                                                                                                                                                                                 The mysterious island
## 587                                                                                                                                                                                                                                                                                         The staircase
## 588                                                                                                                                                                                                                                                                                    Balthazar, a novel
## 589                                                                                                                                                                                                                                                                                 The climate of belief
## 590                                                                                                                                                                                                                                                                                               Stories
## 591                                                                                                                                                                                                                                                                              Cry, the beloved country
## 592                                                                                                                                                                                                                                                                                      The pistol poets
## 593                                                                                                                                                                                                                                                                                          An adoration
## 594                                                                                                                                                                                                                                                                        The city of churches : a novel
## 595                                                                                                                                                                                                                                                                                     Wuthering Heights
## 596                                                                                                                                                                                                                                                                                   The distant horizon
## 597                                                                                                                                                                                                                                                                    The river : a tetralogy : part one
## 598                                                                                                                                                                                                                                                                               The lion and the throne
## 599                                                                                                                                                                                                                                                                                Notes from underground
## 600                                                                                                                                                                                                                                                                                            God's work
## 601                                                                                                                                                                                                                                                                               Descent : short stories
## 602                                                                                                                                                                                                                                                                          The astonished man : a novel
## 603                                                                                                                                                                                                                                                                   Meritocracy : a love story, a novel
## 604                                                                                                                                                                                                                                                                                             Japantown
## 605                                                                                                                                                                                                                                                                    Unbroken, the story of a submarine
## 606                                                                                                                                                                                                                                                                                       Out of the blue
## 607                                                                                                                                                                                                                                                            Thistle soup : a ladleful of Scottish life
## 608                                                                                                                                                                                                                                                    Without pain, or, the search for the gene culprits
## 609                                                                                                                                                                                                                                                                                    The turquoise ring
## 610                                                                                                                                                                                                                                                                            The boys in the brownstone
## 611                                                                                                                                                                                                                Master and commander ; Post captain ; H.M.S. Surprise ; The Mauritius command -- books
## 612                                                                                                                                                                                                                                                                             Mary, after all : a novel
## 613                                                                                                                                                                                                                                                    Wonder tales : [six french stories of enchantment]
## 614                                                                                                                                                                                                                                                                                  The same sweet girls
## 615                                                                                                                                                                                                                                                                                          Brother Fish
## 616                                                                                                                                                                                                                                                                                  The vendor of sweets
## 617                                                                                                                                                                                                                                                                                Ruahine : mythic women
## 618                                                                                                                                                                                                                                                                                        Township tales
## 619                                                                                                                                                                                                                                                                  Lovers' knots : a hundred-year novel
## 620                                                                                                                                                                                                                                                                                                 Paint
## 621                                                                                                                                                                                                                                                                                       Guru cigarettes
## 622                                                                                                                                                                                                                                                                                           Pink Palace
## 623                                                                                                                                                                                                                                                           Maria Chapdelaine : a tale of French Canada
## 624                                                                                                                                                                                                                                                                         Lithuanian mythological tales
## 625                                                                                                                                                                                                                                                                                         The mandarins
## 626                                                                                                                                                                                                                                                                                         In Nueva York
## 627                                                                                                                                                                                                                                                                                    Murder in memoriam
## 628                                                                                                                                                                                                                                                                                                Berlin
## 629                                                                                                                                                                                                                                                                                         Short stories
## 630                                                                                                                                                                                                                                                                                    A touch of the sun
## 631                                                                                                                                                                                                                                                                                  The reluctant Tuscan
## 632                                                                                                                                                                                                                                                                                              The club
## 633                                                                                                                                                                                                                                                                                        Homesick creek
## 634                                                                                                                                                                                                                                                                                           The sundial
## 635                                                                                                                                                                                                                                                                                       In Lucia's eyes
## 636                                                                                                                                                                                                                                                                      Engineer Garin and his death ray
## 637                                                                                                                                                                                                                                                                                   Tales of protection
## 638                                                                                                                                                                                                                                                                                         The resthouse
## 639                                                                                                                                                                                                                                                                               Bridge of the Separator
## 640                                                                                                                                                                                                                                                                                            Nappy rash
## 641                                                                                                                                                                                                                                                                        The other side of the mountain
## 642                                                                                                                                                                                                                                                                                  Bulfinch's mythology
## 643                                                                                                                                                                                                                                                                  More stories from the Arabian nights
## 644                                                                                                                                                                                                                                                 The lost first edition of Upton Sinclair's the Jungle
## 645                                                                                                                                                                                                                                                                                                Fiasco
## 646                                                                                                                                                                                                                                                                       Bawdy tales of the Middle Ages;
## 647                                                                                                                                                                                                                                                                                Great suspense stories
## 648                                                                                                                                                                                                                                                                                   Chinese wit & humor
## 649                                                                                                                                                                                                                                                         Mark Brown's wife : a tale of the gold-fields
## 650                                                                                                                                                                                                                                                                                         Cry to heaven
## 651                                                                                                                                                                                                                                                                                        Border country
## 652                                                                                                                                                                                                                                                                                  My father's notebook
## 653                                                                                                                                                                                                                                                                              I am not Jackson Pollock
## 654                                                                                                                                                                                                                                                                                         Afternoon sun
## 655                                                                                                                                                                                                                                                                         Dog tails : and other stories
## 656                                                                                                                                                                                                                                                                             The messenger boy murders
## 657                                                                                                                                                                                                                                                                            Hayri the barber : Surnâmé
## 658                                                                                                                                                                                                                                                                      Socialism is coming, stand aside
## 659                                                                                                                                                                                                                                                                  Fifty years ago : an Australian tale
## 660                                                                                                                                                                                                                                                                                       A perfect match
## 661                                                                                                                                                                                                                                                                                      Arctic submarine
## 662                                                                                                                                                                                                                                                                      The stars of Axuncanny : a novel
## 663                                                                                                                                                                                                                                                                                       Stars are stars
## 664                                                                                                                                                                                                                                                                                        A late divorce
## 665                                                                                                                                                                                                                                                                                    The garlic ballads
## 666                                                                                                                                                                                                                                                                                         Lao folktales
## 667                                                                                                                                                                                                                                                                                Viking myths & legends
## 668                                                                                                                                                                                                                                                                                             Tarantula
## 669                                                                                                                                                                                                                                                                                   Hollywood nocturnes
## 670                                                                                                                                                                                                                                                                   The Dedalus book of Finnish fantasy
## 671                                                                                                                                                                                                                                                                                           Levin's god
## 672                                                                                                                                                                                                                                                                                 Romance of the desert
## 673                                                                                                                                                                                                                                                                          Lost in the garden : a novel
## 674                                                                                                                                                                                                                                                                                            Monkey man
## 675                                                                                                                                                                                                                                                                                     Folktales of Iraq
## 676                                                                                                                                                                                                                          Red star under the Baltic : a Soviet submariner's personal account 1941-1945
## 677                                                                                                                                                                                                                                                                                      Gemilé : a novel
## 678                                                                                                                                                                                                                                                                              The idle years : a novel
## 679                                                                                                                                                                                                                                                                                       This man and me
## 680                                                                                                                                                                                                                                                                                Instant love : fiction
## 681                                                                                                                                                                                                                                                                       The confessions of Arsène Lupin
## 682                                                                                                                                                                                                                                                                                   Love comes tumbling
## 683                                                                                                                                                                                                                                                Lilah : a forbidden love, a people's destiny : a novel
## 684                                                                                                                                                                                                                                                                                          Resurrection
## 685                                                                                                                                                                                                                                                                                           Elite squad
## 686                                                                                                                                                                                                                                                                       Shakespeare's sonnets : a novel
## 687                                                                                                                                                                                                                                                                                                 Fatso
## 688                                                                                                                                                                                                                                                                                             Locked in
## 689                                                                                                                                                                                                                                                                      Blood and circumstance : a novel
## 690                                                                                                                                                                                                                                                                                   Folktales from Iraq
## 691                                                                                                                                                                                                                                                                                     The ripening seed
## 692                                                                                                                                                                                                                                                                              Redeeming love : a novel
## 693                                                                                                                                                                                                                                                                                      Anybody's spring
## 694                                                                                                                                                                                                                                    and William Gaskell, two lectures on the Lancashire dialect -- Vol
## 695                                                                                                                                                                                                                                                                                   Alberta and freedom
## 696                                                                                                                                                                                                                                                                                       A mile of river
## 697                                                                                                                                                                                                                                                                                Madwoman on the bridge
## 698                                                                                                                                                                                                                                                                                   What we are made of
## 699                                                                                                                                                                                                                                                                                    The scarlet plague
## 700                                                                                                                                                                                                                                                                    The dear green place ; & Fur Sadie
## 701                                                                                                                                                                                                                                                          Where three roads meet : the myth of Oedipus
## 702                                                                                                                                                                                                                                                                                           Emma's luck
## 703                                                                                                                                                                                                                                                                            The free negress Elisabeth
## 704                                                                                                                                                                                                                                                                                   Gentlemen : a novel
## 705                                                                                                                                                                                                                                                                                          Four stories
## 706                                                                                                                                                                                                                                                                                    The lost musicians
## 707                                                                                                                                                                                                                                                                            Three dreams on Mount Meru
## 708                                                                                                                                                                                                                                                                               Honey tongues : a novel
## 709                                                                                                                                                                                                                                                                         Hector's talent  for miracles
## 710                                                                                                                                                                                                                                                                                         The love book
## 711                                                                                                                                                                                                                                                                            The diaries of Jane Somers
## 712                                                                                                                                                                                                                                                     The girl who made stars and other Bushman stories
## 713                                                                                                                                                                                                                                                                             Daffodils before swallows
## 714                                                                                                                                                                                                                          Wonder-tales of South Asia : translated from Hindi, Urdu, Nepali and Persian
## 715                                                                                                                                                                                                                                                                                         Umrao Jan Ada
## 716                                                                                                                                                                                                                                                                             The lady of the Aroostook
## 717                                                                                                                                                                                                                                                                                  The left hand of God
## 718                                                                                                                                                                                                                                                                                      Fire in the wind
## 719                                                                                                                                                                                                                                                                                     Bennett's welcome
## 720                                                                                                                                                                                                                                                        The White Leopard : a tale of the African bush
## 721                                                                                                                                                                                                                                                                      Aleck Maury, sportsman : a novel
## 722                                                                                                                                                                                                                                                                      Where am I now - when I need me?
## 723                                                                                                                                                                                                                                                                      Plain & fancy cats, a collection
## 724                                                                                                                                                                                                                                                                                      Hello sweet baby
## 725                                                                                                                                                                                                                                                                                           Condottiere
## 726                                                                                                                                                                                                                                                                                                 UNIAD
## 727                                                                                                                                                                                                                                                                                The murderer invisible
## 728                                                                                                                                                                                                                                                                Moved by love : a novel of remembrance
## 729                                                                                                                                                                                                                                                                     This suitcase is going to explode
## 730                                                                                                                                                                                                                                               The enemy's country; a novel of the American Revolution
## 731                                                                                                                                                                                                                                                                                            Star probe
## 732                                                                                                                                                                                                                                                                                         Amazing grace
## 733                                                                                                                                                                                                                                                                       The witch of Watergate: a novel
## 734                                                                                                                                                                                                                                                             The 13th District; a story of a candidate
## 735                                                                                                                                                                                                                                                                              Listen for the whisperer
## 736                                                                                                                                                                                                                                                                                    Further adventures
## 737                                                                                                                                                                                                                           In answer to the play, For colored girls-- : virtue of the black female sex
## 738                                                                                                                                                                                                                                                                                      Sins of omission
## 739                                                                                                                                                                                                                                                                                Big Ben Hood : a novel
## 740                                                                                                                                                                                                                                                                Tanaquil; or, The hardest thing of all
## 741                                                                                                                                                                                                                                                                                          The shootist
## 742                                                                                                                                                                                                                                                                                      Image of a lover
## 743                                                                                                                                                                                                                                                                                        Fool, be still
## 744                                                                                                                                                                                                                                                                                                Lummox
## 745                                                                                                                                                                                                                                                                                               Walk-in
## 746                                                                                                                                                                                                                                                           A yellow Napoleon; a romance of West Africa
## 747                                                                                                                                                                                                                                                                                   The story of a whim
## 748                                                                                                                                                                                                                                                                                       A place to meet
## 749                                                                                                                                                                                                                                                                                                 Float
## 750                                                                                                                                                                                                                                                                             Greengroundtown : stories
## 751                                                                                                                                                                                                                                                                               Through glass : a novel
## 752                                                                                                                                                                                                                                                                                Morning red; a romance
## 753                                                                                                                                                                                                                                                                            Through one administration
## 754                                                                                                                                                                                                                                                                                            Bylow Hill
## 755                                                                                                                                                                                                                                                                                  Paper moon : a novel
## 756                                                                                                                                                                                                                                                                                       The garden book
## 757                                                                                                                                                                                                                                                                                         Grand opening
## 758                                                                                                                                                                                                                                                                                 Hunting and gathering
## 759                                                                                                                                                                                                                                                                              The calligraphers' night
## 760                                                                                                                                                                                                                                                                                                Safety
## 761                                                                                                                                                                                                                                                                                               I, city
## 762                                                                                                                                                                                                                                                                                             The model
## 763                                                                                                                                                                                                                                                                        A push and a shove : [a novel]
## 764                                                                                                                                                                                                                                                                            The fire-raisers : a novel
## 765                                                                                                                                                                                                                                                                                        Lies : a novel
## 766                                                                                                                                                                                                                                                                                                 Bunty
## 767                                                                                                                                                                                                                                               Nothing to do, nowhere to go : waking up to who you are
## 768                                                                                                                                                                                                                                                                              The unforeseen : a novel
## 769                                                                                                                                                                                                                                                                                     The 42nd parallel
## 770                                                                                                                                                                                                                                                                                 The House of the dead
## 771                                                                                                                                                                                                                                                           Who stole the funny? : a novel of Hollywood
## 772                                                                                                                                                                                                                                                                          The works of Charlotte Smith
## 773                                                                                                                                                                                                                                                                          The works of Charlotte Smith
## 774                                                                                                                                                                                                                                                                                 Bruin sings the blues
## 775                                                                                                                                                                                                                                                                                        The shoe queen
## 776                                                                                                                                                                                                                                              The fortunes and misfortunes of the famous Moll Flanders
## 777                                                                                                                                                                                                                                                                                    The scarlet letter
## 778                                                                                                                                                                                                                                                                              The master of Ballantrae
## 779                                                                                                                                                                                                                                                                                            Quo vadis?
## 780                                                                                                                                                                                                                                                                                     Barchester towers
## 781                                                                                                                                                                                                                                                                                         The possessed
## 782                                                                                                                                                                                                                                                                                 The prisoner of Zenda
## 783                                                                                                                                                                                                                                                                                     Fathers and sons;
## 784                                                                                                                                                                                                                                                                                        Doctor Zhivago
## 785                                                                                                                                                                                                                                                                        Aesop's Fables : a new version
## 786                                                                                                                                                                                                                                                                                          East of Eden
## 787                                                                                                                                                                                                                                                                                         Andersonville
## 788                                                                                                                                                                                                                                                                                 A death in the family
## 789                                                                                                                                                                                                                                               The Brothers Karamazov : a novel in four parts & epilog
## 790                                                                                                                                                                                                                                                                                         Anna Karenina
## 791                                                                                                                                                                                                                                                                                          The Alhambra
## 792                                                                                                                                                                                                                                                                      The Short stories of Oscar Wilde
## 793                                                                                                                                                                                                                                                                  Vanity fair : a novel without a hero
## 794                                                                                                                                                                                                                                                                        Tales of mystery & imagination
## 795                                                                                                                                                                                                                                                          Uncle Tom's cabin ; or, Life among the lowly
## 796                                                                                                                                                                                                                                                                                 On the marble cliffs;
## 797                                                                                                                                                                 On the high uplands : sagas, songs, tales and legends of the Carpathians / $f: translated by H.C. Stevens; illus. by Z. Czermanski. -
## 798                                                                                                                                                                                                                                                                    Folk tales of Nepal : First series
## 799                                                                                                                                                                                                                                                                                  Folktales of Hungary
## 800                                                                                                                                                                                                                                                                              The children of the wind
## 801                                                                                                                                                                                                                                                                                   No crown of laurels
## 802                                                                                                                                                                                                                                                                 The small town in American literature
## 803                                                                                                                                                                                                                                                                                         A green flash
## 804                                                                                                                                                                                                                                                                                 Injury time : a novel
## 805                                                                                                                                                                                                                                                                                               Oh Lily
## 806                                                                                                                                                                                                                    Heloise : a story of love, sex, and metaphysics in with wild and marvelous sixties
## 807                                                                                                                                                                                                                                                                                       The Sligo Piper
## 808                                                                                                                                                                                                                                                                                          The Succubus
## 809                                                                                                                                                                                                                                                                   Memorandum : a story with paintings
## 810                                                                                                                                                                                                                                                                                        Scarred hearts
## 811                                                                                                                                                                                                                                                     Gazelle tracks : a modern Arabic novel from Egypt
## 812                                                                                                                                                                                                                                                                  The long knives are crying : a novel
## 813                                                                                                                                                                                                                                               Breaking Knees : modern Arabic short stories from Syria
## 814                                                                                                                                                                                                                                                               Folktales from the Japanese countryside
## 815                                                                                                                                                                                                                                                                                        Guard of honor
## 816                                                                                                                                                                                                                                                                                            Arrowsmith
## 817                                                                                                                                                                                                                                                                                    Advise and consent
## 818                                                                                                                                                                                                                                                                                  The age of innocence
## 819                                                                                                                                                                                                                                                                    Andersen's Fairy tales and stories
## 820                                                                                                                                                                                                                                                                 Resurrection : a novel in three parts
## 821                                                                                                                                                                                                                                                                       The Tales of Hoffmann : stories
## 822                                                                                                                                                                                                                                                                                     Lincoln : a novel
## 823                                                                                                                                                                                                                                                               The seven voyages of Sindbad the sailor
## 824                                                                                                                                                                                                                                                                                The torrents of spring
## 825                                                                                                                                                                                                                                                                                   Journey in the dark
## 826                                                                                                                                                                                                                                                                         The confessions of Nat Turner
## 827                                                                                                                                                                                                                                                                                        Years of grace
## 828                                                                                                                                                                                                                                                                    Andersen's Fairy tales and stories
## 829                                                                                                                                                                                                                                                                                 Feathers like leather
## 830                                                                                                                                                                                                                                                                   Grace, Tamar & Laszlo the beautiful
## 831                                                                                                                                                                                                                                                                     The magic goblet : a Swedish tale
## 832                                                                                                                                                                                                                                                                                    Murder at midnight
## 833                                                                                                                                                                                                                                                                                        Doctor Zhivago
## 834                                                                                                                                                                                                                                                                                  The way of the women
## 835                                                                                                                                                                                                                                                                                           The big one
## 836                                                                                                                                                                                                                                                                                              Showdown
## 837                                                                                                                                                                                                                                                                          Pieternella, daughter of Eva
## 838                                                                                                                                                                                                                                                                                              Hypatia;
## 839                                                                                                                                                                                                                   Folk tales from a Persian tribe : forty-five tales from Sisakht in Luri and English
## 840                                                                                                                                                                                                                                                                                       The angel maker
## 841                                                                                                                                                                                                                                                                                           Retribution
## 842                                                                                                                                                                                                                                                                                      The burning bush
## 843                                                                                                                                                                                                                                    Norway's best stories; an introduction to modern Norwegian fiction
## 844                                                                                                                                                                                                                                                               Farmor's house : a portrait of an epoch
## 845                                                                                                                                                                                                                                                                        Rachel Jackson, Tennessee girl
## 846                                                                                                                                                                                                                                                                                     Hester and gnomes
## 847                                                                                                                                                                                  Zane Grey: outdoorsman; Zane Grey's best hunting and fishing tales published in commemoration of his centennial year
## 848                                                                                                                                                                                                                      Debauched Hospodar, and Memoirs of a young rakehell.  Translated from the French
## 849                                                                                                                                                                                                                                                                                               Belinda
## 850                                                                                                                                                                                                                                                    The novels:  Love's cross-currents. Lesbia Brandon
## 851                                                                                                                                                                                                                                                                                      Shadow of wealth
## 852                                                                                                                                                                                                                                                                           The Bodley Head Jack London
## 853                                                                                                                                                                                                                                                                                     Framley parsonage
## 854                                                                                                                                                                                                                                                                                         Doctor Thorne
## 855                                                                                                                                                                                                                                                                                   The beach of Falesá
## 856                                                                                                                                                                                                                                                                              The master of Ballantrae
## 857                                                                                                                                                                                                                    Kidnapped, being the memoirs of the adventures of David Balfour in the year MDCCLI
## 858                                                                                                                                                                                                                                                              The turn of the screw; The Aspern papers
## 859                                                                                                                                                                                                                                                                                            Quo vadis?
## 860                                                                                                                                                                                                                                                                        One hundred favorite folktales
## 861                                                                                                                                                                                                                                                                                              Orchards
## 862                                                                                                                                                                                                                                                                                      Threepenny novel
## 863                                                                                                                                                                                                                                                                                         Doctor Thorne
## 864                                                                                                                                                                                                                                                            Michael Kohlhaas; and the Marquise of O --
## 865                                                                                                                                                                                                                                                                                        The day's work
## 866                                                                                                                                                                                                                                                                       Sir Gawain and the Green Knight
## 867                                                                                                                                                                                                                                                                            Mozart's journey to Prague
## 868                                                                                                                                                                                                                                                                    The magic mountain. Der Zauberberg
## 869                                                                                                                                                                                                                                                                                      My cousin Rachel
## 870                                                                                                                                                                                                                                                                                 Fro and other stories
## 871                                                                                                                                                                                                                                                                                             The sibyl
## 872                                                                                                                                                                                                                                                                                   Mastro Don Gesualdo
## 873                                                                                                                                                                                                                                                                 The notebooks of Malte Laurids Brigge
## 874                                                                                                                                                                                                                                                                                               The nun
## 875                                                                                                                                                                                                                                                                            The forsaken army; a novel
## 876                                                                                                                                                                                                                                                                                         Conjugal love
## 877                                                                                                                                                                                                                                                                                      My enemy's enemy
## 878                                                                                                                                                                                                                                                                        Nightmares of an ether-drinker
## 879                                                                                                                                                                                                                                                               Selected shorter writings of Mark Twain
## 880                                                                                                                                                                                                                                                                                          The tin drum
## 881                                                                                                                                                                                                                                                                                    This sporting life
## 882                                                                                                                                                                                                                                                                                 Mark Lambert's supper
## 883                                                                                                                                                                                                                                                                                     The foxglove saga
## 884                                                                                                                                                                                                                                                                                     Path of dalliance
## 885                                                                                                                                                                                                                                                                                      Helena : a novel
## 886                                                                                                                                                                                                                            The bender; pictures from an exhibition of middle class portraits, a novel
## 887                                                                                                                                                                                                                                                                                 The birds of paradise
## 888                                                                                                                                                                                                                                                  The cocotte (Boule de suif) and three other stories;
## 889                                                                                                                                                                                                                                                                                          Jungle Green
## 890                                                                                                                                                                                                                                                                                   Georgian folk tales
## 891                                                                                                                                                                                                                                                                                      Passion and pain
## 892                                                                                                                                                                                                                                             Roberte ce soir and The revocation of the edict of Nantes
## 893                                                                                                                                                                                                                                                                                             The abyss
## 894                                                                                                                                                                                                                                                        The seven that were hanged : and other stories
## 895                                                                                                                                                                                                                                                                        Maggie: a girl of the streets;
## 896                                                                                                                                                                                                                                                    Les liaisons dangereuses [Dangerous acquaintances]
## 897                                                                                                                                                                                                                                                                                               Warlock
## 898                                                                                                                                                                                                                                                                            A passion in Rome; a novel
## 899                                                                                                                                                                                                                                                                                              The city
## 900                                                                                                                                                                                                                                                                                   We are God's Utopia
## 901                                                                                                                                                                                                                                                                               And quiet flows the Don
## 902                                                                                                                                                                                                                                                                                       African genesis
## 903                                                                                                                                                                                           Pierre ; Israel Potter ; The piazza tales ; The confidence-man ; Uncollected prose ; and Billy Budd, sailor
## 904                                                                                                                                                                                                                                                                                     David Copperfield
## 905                                                                                                                                                                                                                                                                                          Odd girl out
## 906                                                                                                                                                                                                                                                                                        The sea change
## 907                                                                                                                                                                                                                                                                                           Black Midas
## 908                                                                                                                                                                                                                                                                                            Yoshe Kalb
## 909                                                                                                                                                                                                                                                                                        Twelve stories
## 910                                                                                                                                                                                                                                                                           My father's house : a novel
## 911                                                                                                                                                                                                                                                                         Gabriela : clove and cinnamon
## 912                                                                                                                                                                                                                                                                                    Devil in the flesh
## 913                                                                                                                                                                                                                                                                           The man who started the war
## 914                                                                                                                                                                                                                                                                                         War and peace
## 915                                                                                                                                                                                                                                                                              The history of Tom Jones
## 916                                                                                                                                                                                                                                                                             The sentimental education
## 917                                                                                                                                                                                                                                                                                             Drunkard;
## 918                                                                                                                                                                                                                                                                                              The ship
## 919                                                                                                                                                                                                                                                                                   Stories and legends
## 920                                                                                                                                                                                                                                                                                     The last of Chéri
## 921                                                                                                                                                                                                                                                                                  His Majesty's U-boat
## 922                                                                                                                                                                                                                                                                                      The tangled web;
## 923                                                                                                                                                                                                                                                                                                Pamela
## 924                                                                                                                                                                                                                                                                                     Path of the storm
## 925                                                                                                                                                                                                                                             Sweden's best stories; an introduction to Swedish fiction
## 926                                                                                                                                                                                                                                                                  Peter Freuchen's Book of the Eskimos
## 927                                                                                                                                                                                                                                                                               A romance of two worlds
## 928                                                                                                                                                                                                                                                                                        Arab folktales
## 929                                                                                                                                                                                                                                                                                   The path of thunder
## 930                                                                                                                                                                                                                                                                 Swami and friends, a novel of Malgudi
## 931                                                                                                                                                                                                                             New Chinese stories; twelve short stories by contemporary Chinese writers
## 932                                                                                                                                                                                                                                                   The explosion; the uprising behind the Iron Curtain
## 933                                                                                                                                                                                                                                                                       Mrs Betsey; or, Widowed and wed
## 934                                                                                                                                                                                                                                                                                  A voyage to Arcturus
## 935                                                                                                                                                                                                                                                                                            Auto-da-fé
## 936                                                                                                                                                                                                                                                                                      The Holy Sinner;
## 937                                                                                                                                                                                                                                                                                          The Minister
## 938                                                                                                                                                                                                                                                                                      The beast in man
## 939                                                                                                                                                                                                                                                                             They fell from God's hand
## 940                                                                                                                                                                                                                                                                                        The charioteer
## 941                                                                                                                                                                                                                                                                                             The hotel
## 942                                                                                                                                                                                                                                                                       Anglo-Saxon attitudes : a novel
## 943                                                                                                                                                                                                                                                                                    Account unsettled;
## 944                                                                                                                                                                                                                                                                    The adventures of Huckleberry Finn
## 945                                                                                                                                                                                                                                                                                          Player piano
## 946                                                                                                                                                                                                                                                                                   The other Alexander
## 947                                                                                                                                                                                                                                                                                The torrents of spring
## 948                                                                                                                                                                                                                                                                                          The patient;
## 949                                                                                                                                                                                                                                                                Henry James: seven stories and studies
## 950                                                                                                                                                                                                                                                                    The mission; or, scenes in Africa;
## 951                                                                                                                                                                                                                                                                                      One for the road
## 952                                                                                                                                                                                                                                                           Saturday lunch with the Brownings : stories
## 953                                                                                                                                                                                                                                                                                           The oracles
## 954                                                                                                                                                                                                                                                                              The Schirmer inheritance
## 955                                                                                                                                                                                                                                                                              The eyes of Max Carrados
## 956                                                                                                                                                                                                                                                              Don't point that thing at me; a thriller
## 957                                                                                                                                                                                                                                                                Human voices : science fiction stories
## 958                                                                                                                                                                                                                                                                        The adventures of one Yitzchok
## 959                                                                                                                                                                                                                                                                           The Promised Land : a novel
## 960                                                                                                                                                                                                                                                                               The last exile, a novel
## 961                                                                                                                                                                                                                                                                           Prose works of Henry Lawson
## 962                                                                                                                                                                                                                                                                                  The King's grey mare
## 963                                                                                                                                                                                                                                             The woman who got on at Jasper Station, and other stories
## 964                                                                                                                                                                                                                                                                                  The strike : a novel
## 965                                                                                                                                                                                                                                                                                 The world of violence
## 966                                                                                                                                                                                                                                                                                    Sincerity divorced
## 967                                                                                                                                                                                                                                                                                Selected short stories
## 968                                                                                                                                                                                                                                                                                  Get ready for battle
## 969                                                                                                                                                                                                                                                                                     Ten thousand eyes
## 970                                                                                                                                                                                                                                                                             Shield and sword [a novel
## 971                                                                                                                                                                                                                                                                             Shield and sword [a novel
## 972                                                                                                                                                                                                                                                                      Seven great British short novels
## 973                                                                                                                                                                                                                                                                           The Bodley Head Jack London
## 974                                                                                                                                                                                                                                                                  Singing winds; stories of gipsy life
## 975                                                                                                                                                                                                                                                                                      Afghan adventure
## 976                                                                                                                                                                                                                                                                                   The greatest gamble
## 977                                                                                                                                                                                                                                                                               Scorched crop : a novel
## 978                                                                                                                                                                                                                                                                        Castle Rackrent ; The absentee
## 979                                                                                                                                                                                                                        Two novelettes : Revolt of the fishermen of Santa Barbara, A price on his head
## 980                                                                                                                                                                                                                                                                                   The odds against us
## 981                                                                                                                                                                                                                                                                                     Beatrice; a novel
## 982                                                                                                                                                                                                                                                                               A day no pigs would die
## 983                                                                                                                                                                                                                                                                                           Witch world
## 984                                                                                                                                                                                                                                                                                        Japanese tales
## 985                                                                                                                                                                                                                       The cat walk : a translation into English of Hermann Sudermann's Der katzensteg
## 986                                                                                                                                                                                                                                                                                                   War
## 987                                                                                                                                                                                                                                                                                       The white guard
## 988                                                                                                                                                                                                                                                                                The king of the fields
## 989                                                                                                                                                                                                                                                              The lonely sea : collected short stories
## 990                                                                                                                                                                                                                                                                                            The pledge
## 991                                                                                                                                                                                                                                                                                        Mary : a novel
## 992                                                                                                                                                                                                                                                                           Homecoming : three novellas
## 993                                                                                                                                                                                                                                                                                   The mulberry forest
## 994                                                                                                                                                                                                                                                                                             Southtrap
## 995                                                                                                                                                                                                                                                                            The spectacle at the tower
## 996                                                                                                                                                                                                                                                                                  Farewell to the King
## 997                                                                                                                                                                                                                                                                                The confidential agent
## 998                                                                                                                                                                                                                                                                              The history of Tom Jones
## 999                                                                                                                                                                                                                                                                                             The abyss
## 1000                                                                                                                                                                                                                                                                                            Pope Joan
## 1001                                                                                                                                                                                                                                                              Riceyman steps, and Elsie and the child
## 1002                                                                                                                                                                                                                                                                 The night visitor, and other stories
## 1003                                                                                                                                                                                                                                                                                              Far cry
## 1004                                                                                                                                                                                                                                                          A woman of the Pharisees : (La Pharisienne)
## 1005                                                                                                                                                                                                                                                                                      Living together
## 1006                                                                                                                                                                                                                                                                                          Wolf Solent
## 1007                                                                                                                                                                                                                                                                        A man and two women : stories
## 1008                                                                                                                                                                                                                                                                          The witch and other stories
## 1009                                                                                                                                                                                                                                                                                          The rat-pit
## 1010                                                                                                                                                                                                                                                                                   The Radetzky march
## 1011                                                                                                                                                                                                                                                         The Penguin complete novels of George Orwell
## 1012                                                                                                                                                                                                                                                                                        Spark of life
## 1013                                                                                                                                                                                                                                                                                  Searching for Caleb
## 1014                                                                                                                                                                                                                                                                                         Moon country
## 1015                                                                                                                                                                                                                                                                                UFO's in South Africa
## 1016                                                                                                                                                                                                                                                                                 My sweet-orange tree
## 1017                                                                                                                                                                                                                                                                          A night of serious drinking
## 1018                                                                                                                                                                                                                                                          The desert of love = (Le désert de l'amour)
## 1019                                                                                                                                                                                                                                                                                      The still storm
## 1020                                                                                                                                                                                                                                                               Collected stories of Guy de Maupassant
## 1021                                                                                                                                                                                                                                                                       The little disturbances of man
## 1022                                                                                                                                                                                                                                                                                    A pier and a band
## 1023                                                                                                                                                                                                                                                                               Young Henry of Navarre
## 1024                                                                                                                                                                                                                                                                                    Monimbó : a novel
## 1025                                                                                                                                                                                                                                                                                               Friday
## 1026                                                                                                                                                                                                                                                                                     Working bullocks
## 1027                                                                                                                                                                                                                                                                    A prayer for Kateřina Horovitzova
## 1028                                                                                                                                                                                                                                                                                Short Sicilian novels
## 1029                                                                                                                                                                                                                                                                                     The troll garden
## 1030                                                                                                                                                                                                                                                                                        Fiela's child
## 1031                                                                                                                                                                                                                                                                                          The sponger
## 1032                                                                                                                                                                                                                                                                                             The oath
## 1033                                                                                                                                                                                                                                                                                        The scapegoat
## 1034                                                                                                                                                                                                                                                                           Maigret and the pickpocket
## 1035                                                                                                                                                                                                                                                                     Wild Saturday, and other stories
## 1036                                                                                                                                                                                                                                                                                              Swallow
## 1037                                                                                                                                                                                                                                                                                  Audition for murder
## 1038                                                                                                                                                                                                                                                                          The Penguin Kenneth Grahame
## 1039                                                                                                                                                                                                                                                                                          Cruel tales
## 1040                                                                                                                                                                                                                                                                      The mind-body problem : a novel
## 1041                                                                                                                                                                                                                                                         Babi Yar : a document in the form of a novel
## 1042                                                                                                                                                                                                                                                                                The four great novels
## 1043                                                                                                                                                                                                                                                                                         Hide my eyes
## 1044                                                                                                                                                                                                                                                                                       The conquerors
## 1045                                                                                                                                                                                                                      Three Russian masters : passages from the works of Turgenev, Leskov and Chekhov
## 1046                                                                                                                                                                                                                                             At the foot of blue mountains : stories by Tajik authors
## 1047                                                                                                                                                                                                                                                                      That awful mess on via Merulana
## 1048                                                                                                                                                                                                                                                                             The Master and Margarita
## 1049                                                                                                                                                                                                                                                                                              The law
## 1050                                                                                                                                                                                                                                                                                                Smoke
## 1051                                                                                                                                                                                                                                                                                     A bed of flowers
## 1052                                                                                                                                                                                                                                                                                        The bachelors
## 1053                                                                                                                                                                                                                                                                                     The sleepwalkers
## 1054                                                                                                                                                                                                                                                                       The black monk & other stories
## 1055                                                                                                                                                                                                                                                                                             Triptych
## 1056                                                                                                                                                                                                                                                                   The blue bird ; and, The betrothal
## 1057                                                                                                                                                                                                                                       Honey on bread : short stories : [translated from the Russian]
## 1058                                                                                                                                                                                                                           Shoot! (Si gira); the notebooks of Serafino Gubbio, cinematograph operator
## 1059                                                                                                                                                                                                                                                        A light in the distance : stories about Lenin
## 1060                                                                                                                                                                                                                                                                       Wives at war and other stories
## 1061                                                                                                                                                                                                                                                                                   The house in Paris
## 1062                                                                                                                                                                                                                                                                           Tart is the apple; a novel
## 1063                                                                                                                                                                                                                                                                                    The investigation
## 1064                                                                                                                                                                                                                                                                                   Novel with cocaine
## 1065                                                                                                                                                                                                                                                                           Memoirs found in a bathtub
## 1066                                                                                                                                                                                                                               The storyteller of Marrakesh : based on traditional tales from Morocco
## 1067                                                                                                                                                                                                                                                                                         The casualty
## 1068                                                                                                                                                                                                                                                                      Stabilization of Guadalupe Ruin
## 1069                                                                                                                                                                                                                                                                                        The wild dogs
## 1070                                                                                                                                                                                                                                                                                           The outlaw
## 1071                                                                                                                                                                                                                                                                               The late Mattia Pascal
## 1072                                                                                                                                                      The engineer of human souls : an entertainment on the old themes of life, women, fate, dreams, the working class, secret agents, love and death
## 1073                                                                                                                                                                                                                                                                   The schoolmaster and other stories
## 1074                                                                                                                                                                                                                                                                                             The wind
## 1075                                                                                                                                                                                                                                                                            The house that was Eureka
## 1076                                                                                                                                                                                                                                                                                    Call of the heart
## 1077                                                                                                                                                                                                                                                                                 Fire on the mountain
## 1078                                                                                                                                                                                                                                                                                     The beast in man
## 1079                                                                                                                                                                                                                                                                                         Another life
## 1080                                                                                                                                                                                                                                                                                      A city solitary
## 1081                                                                                                                                                                                                                                                                                      The last castle
## 1082                                                                                                                                                                                                                                                                                            Seraphita
## 1083                                                                                                                                                                                                                                                                                    Two strange tales
## 1084                                                                                                                                                                                                                                                                             El Angel's last conquest
## 1085                                                                                                                                                                                                                                                                                   Robbery under arms
## 1086                                                                                                                                                                                                                                                                                        Farai's girls
## 1087                                                                                                                                                                                                                                                                                     The painted lady
## 1088                                                                                                                                                                                                                              The Bram Stoker bedside companion : 10 stories by the author of Dracula
## 1089                                                                                                                                                                                                                                                                              Bukhara : reminiscences
## 1090                                                                                                                                                                                                                                                                                      Gilles & Jeanne
## 1091                                                                                                                                                                                                                                                                                        The harvester
## 1092                                                                                                                                                                                                                                                                                               Shoot!
## 1093                                                                                                                                                                                                                                                                                       Doctor Zhivago
## 1094                                                                                                                                                                                                                                                                                           Moving out
## 1095                                                                                                                                                                                                                                                                                  Women are different
## 1096                                                                                                                                                                                                                                                                                   The Star Chernobyl
## 1097                                                                                                                                                                                                                                                                                         Water margin
## 1098                                                                                                                                                                                                                                                                                 Ukrainian folk tales
## 1099                                                                                                                                                                                                                                                                                         Yellow fever
## 1100                                                                                                                                                                                                                                                           Henry Lawson : stories for senior students
## 1101                                                                                                                                                                                                                                                                                      Out of the fire
## 1102                                                                                                                                                                                                                                                                         Tales from the Malay quarter
## 1103                                                                                                                                                                                                                                                                                   Maigret has doubts
## 1104                                                                                                                                                                                                                                                                  The sacrament of the present moment
## 1105                                                                                                                                                                                                                                                                               The James Joyce murder
## 1106                                                                                                                                                                                                                                                                                      North and South
## 1107                                                                                                                                                                                                                                                                                   The spider's house
## 1108                                                                                                                                                                                                                                                                           An item from the late news
## 1109                                                                                                                                                                                                                                                                                        War and peace
## 1110                                                                                                                                                                                                                                                               The Nigger of the Narcissus -- Typhoon
## 1111                                                                                                                                                                                                                                                                                             Nostromo
## 1112                                                                                                                                                                                                                   The tower at the edge of the world : a poetic mosaic novel about my earliest youth
## 1113                                                                                                                                                                                                                         Blood brothers : the adventures of two cossacks on land, sea and under water
## 1114                                                                                                                                                                                                                                                                               Resurrection : a novel
## 1115                                                                                                                                                                                                                                                                                        The bystander
## 1116                                                                                                                                                                                                                                                                                       Apprenticeship
## 1117                                                                                                                                                                                                                                                                                   Behind the curtain
## 1118                                                                                                                                                                                                                                                                                 Tales from Mauritius
## 1119                                                                                                                                                                                                                                                                                    Göngu-Hrolfs saga
## 1120                                                                                                                                                                                                                                                                                          The acolyte
## 1121                                                                                                                                                                                                                                                                             The man-eater of Malgudi
## 1122                                                                                                                                                                                                                                                               One day in the life of Ivan Denisovich
## 1123                                                                                                                                                                                                                                                                                      The demon lover
## 1124                                                                                                                                                                                                                                                           A madman's defense = Le plaidoyer d'un fou
## 1125                                                                                                                                                                                                                                                                                     The first circle
## 1126                                                                                                                                                                                                                                                                                         The graduate
## 1127                                                                                                                                                                                                                                                                                              Stories
## 1128                                                                                                                                                                                                                                                                              The fable and the flesh
## 1129                                                                                                                                                                                                                                                        Fairy tales of the Slav peasants and herdsmen
## 1130                                                                                                                                                                                                                                                                                   John Ruskin's wife
## 1131                                                                                                                                                                                                                                                                                 Not into clean hands
## 1132                                                                                                                                                                                                                                                                                   Without mannerisms
## 1133                                                                                                                                                                                                                                                                                             Lifeboat
## 1134                                                                                                                                                                                                                                                                                   The cotton-pickers
## 1135                                                                                                                                                                                                                                                                          The hunted / Elmore Leonard
## 1136                                                                                                                                                                                                                                                                                           The square
## 1137                                                                                                                                                                                                                                                                                The garden of weapons
## 1138                                                                                                                                                                                                                                                                        The ward of our lady of mercy
## 1139                                                                                                                                                                                                                                      Now the volcano : an anthology of Latin American gay literature
## 1140                                                                                                                                                                                                                                                                                  Claude's confession
## 1141                                                                                                                                                                                                                                                                                   It's a battlefield
## 1142                                                                                                                                                                                                                            The school for wives ; Robert ; Geneviève : or, The unfinished confidence
## 1143                                                                                                                                                                                                                                                                Strait is the gate = La porte étroite
## 1144                                                                                                                                                                                                                                                                              Mt. Taesong (legendary)
## 1145                                                                                                                                                                                                                            King William the Wanderer : an old British saga, from Old French versions
## 1146                                                                                                                                                                                                                                               Malice aforethought : the story of a commonplace crime
## 1147                                                                                                                                                                                                                                                                                 Virgin soil upturned
## 1148                                                                                                                                                                                                                                                                           Underground out of Holland
## 1149                                                                                                                                                                                                                                                                        The temptation of Jack Orkney
## 1150                                                                                                                                                                                                                                                                            The mayor of Casterbridge
## 1151                                                                                                                                                                                                                                                                                     Rise up in anger
## 1152                                                                                                                                                                                                    Robbery under arms : a story of life and adventure in the bush and in the goldfields of Australia
## 1153                                                                                                                                                                                                                                                                               A mixture of frailties
## 1154                                                                                                                                                                                                                                                                                     The rainy season
## 1155                                                                                                                                                                                                                                                                                        The precipice
## 1156                                                                                                                                                                                                                                                                             A common story : a novel
## 1157                                                                                                                                                                                                                                                                           The deathless and the dead
## 1158                                                                                                                                                                                                                                                                  Trooper Peter Halket of Mashonaland
## 1159                                                                                                                                                                                                                                                                The fallen curtain, and other stories
## 1160                                                                                                                                                                                                                                                                            The tenth Simenon omnibus
## 1161                                                                                                                                                                                                                                                             The other woman : selected short stories
## 1162                                                                                                                                                                                                                                                                               Kolera kolej : a novel
## 1163                                                                                                                                                                                                                                                        The fiery angel : a sixteenth century romance
## 1164                                                                                                                                                                                                                                                                                     Beyond the glass
## 1165                                                                                                                                                                                                                                                                                         Ikael Torass
## 1166                                                                                                                                                                                                         The best of Roald Dahl : stories from Over to you, Someone like you, Kiss kiss, Switch bitch
## 1167                                                                                                                                                                                                                                                                                     A dirge too soon
## 1168                                                                                                                                                                                                                                                     The diary of a madman, and other tales of horror
## 1169                                                                                                                                                                                                                                            Giovanni Boccaccio's Il filocolo : or, The labors of love
## 1170                                                                                                                                                                                                                                                                        The virility factor : a novel
## 1171                                                                                                                                                                                          The book of Dene : containing the traditions and beliefs of Chipewyan, Dogrib, Slavey, and Loucheux peoples
## 1172                                                                                                                                                                                                                                                                                               Agatha
## 1173                                                                                                                                                                                                                                                                                       A haunted land
## 1174                                                                                                                                                                                                                                                        But the dead are many : a novel in fugue form
## 1175                                                                                                                                                                                                                                                                                               Utopia
## 1176                                                                                                                                                                                                                                                                                        The cornermen
## 1177                                                                                                                                                                                                                                                                                     Lover in the sky
## 1178                                                                                                                                                                                                                                             Greeks bearing gifts : the epics of Achilles and Ulysses
## 1179                                                                                                                                                                                                                                                                                       Highland fling
## 1180                                                                                                                                                                                                                                                                                   My mother's people
## 1181                                                                                                                                                                                                                                                                                        Jenny Treibel
## 1182                                                                                                                                                                                                                            Les Onze mille verges : or, The amorous adventures of Prince Mony Vibescu
## 1183                                                                                                                                                                                                        Hallucinations : being an account of the life and adventures of Friar Servando Teresa de Mier
## 1184                                                                                                                                                                                                                                                                                       City of Spades
## 1185                                                                                                                                                                                                                                                             Contemporary portraits and other stories
## 1186                                                                                                                                                                             The fifth pestilence, together with The history of the tinkling cymbal and sounding brass, Ivan Semyonovitch Stratilatov
## 1187                                                                                                                                                                                                                                                                                          The martyrs
## 1188                                                                                                                                                                                                                                                                                           April lady
## 1189                                                                                                                                                                                                                                                                                The men from Pretoria
## 1190                                                                                                                                                                                                                                                                                  Confessions of Zeno
## 1191                                                                                                                                                                                                                                                                    Altneuland = Old-new land : novel
## 1192                                                                                                                                                                                                                                                                                The soul of the robot
## 1193                                                                                                                                                                                                                                                                        The diary of a country priest
## 1194                                                                                                                                                                                                                                                                             The portable Saul Bellow
## 1195                                                                                                                                                                                                                                                               Merry tales and three Shrovetide plays
## 1196                                                                                                                                                                                                                                                                                 Tales from Sacchetti
## 1197                                                                                                                                                                                                                                                                                             The aloe
## 1198                                                                                                                                                                                                                                                                                                Ilona
## 1199                                                                                                                                                                                                                                                                    Livingstone's companions: stories
## 1200                                                                                                                                                                                                                                                                                     Voices of Africa
## 1201                                                                                                                                                                                                                                                                                       Mansfield Park
## 1202                                                                                                                                                                                                                                                                                     A burnt-out case
## 1203                                                                                                                                                                                                                                                                                      The householder
## 1204                                                                                                                                                                                                                                                                              Hickory, dickory, death
## 1205                                                                                                                                                                                                                                                                                     The chalk giants
## 1206                                                                                                                                                                                                                                                                                 The stone bridal bed
## 1207                                                                                                                                                                                                                                                                                   A summer to decide
## 1208                                                                                                                                                                                                                                                                                     A kind of loving
## 1209                                                                                                                                                                                                                                                                                                  Kim
## 1210                                                                                                                                                                                                                                                                                 The song of the lark
## 1211                                                                                                                                                                                                                                                       God's pauper : St. Francis of Assisi : a novel
## 1212                                                                                                                                                                                                                                                                       The acceptance world : a novel
## 1213                                                                                                                                                                                                                                                                                      Synnv̲ ̌Solbakken
## 1214                                                                                                                                                                                                                                                                                   Inside Mr. Enderby
## 1215                                                                                                                                                                                                                                                                               The rouge of the north
## 1216                                                                                                                                                                                                                                                                          Prose works of Henry Lawson
## 1217                                                                                                                                                                                                                                                                           Futility and other animals
## 1218                                                                                                                                                                                                                                                                                             Villette
## 1219                                                                                                                                                                                                                                                                                  Death in the clouds
## 1220                                                                                                                                                                                                                                      Man without a shadow : the diary of an existentialist : a novel
## 1221                                                                                                                                                                                                                                                                             To every birth its blood
## 1222                                                                                                                                                                                                                                                                                      Anatolian tales
## 1223                                                                                                                                                                                                                                                                                  The madness of Didi
## 1224                                                                                                                                                                                                                                                                               Prayer for an assassin
## 1225                                                                                                                                                                                                                                                                                        War and peace
## 1226                                                                                                                                                                                                                                                                                   Twenty years after
## 1227                                                                                                                                                                                                                                                                             A dreambook for our time
## 1228                                                                                                                                                                                                                                                                                    On the black hill
## 1229                                                                                                                                                                                                                                                    During the reign of the Queen of Persia : a novel
## 1230                                                                                                                                                                                                                                                      The Love that was : stories of Estonian writers
## 1231                                                                                                                                                                                                                                                                                       Caleb Williams
## 1232                                                                                                                                                                                                                                                                                                 Axël
## 1233                                                                                                                                                                                                                                                                                            Moonfleet
## 1234                                                                                                                                                                                                                                                                                     The marble dance
## 1235                                                                                                                                                                                                                                                                        Maigret and the Calame report
## 1236                                                                                                                                                                                                                                                                                      The Pegasus man
## 1237                                                                                                                                                                                                                                                                                            Real lies
## 1238                                                                                                                                                                                                                                                       The fur country : a romance of the high Arctic
## 1239                                                                                                                                                                                                                                                                                       Lilian's story
## 1240                                                                                                                                                                                                                                                                                          Bloodfather
## 1241                                                                                                                                                                                                                        The imposters : the truth and the lies about their travels through the Amazon
## 1242                                                                                                                                                                                                                                                           TASS is authorized to announce-- : a novel
## 1243                                                                                                                                                                                                                                               The sorrows of the young Werther : (and other stories)
## 1244                                                                                                                                                                                                                                                                                 The kaiser's coolies
## 1245                                                                                                                                                                                                                                                                                       The thunderers
## 1246                                                                                                                                                                                                                                                                                  Regards to the czar
## 1247                                                                                                                                                                                                                                                                                   Talks with a devil
## 1248                                                                                                                                                                                                                                                 The great fortune : volume one of The Balkan trilogy
## 1249                                                                                                                                                                                                                                                                                           3 x Handke
## 1250                                                                                                                                                                                                                                                                             Folk-tales from Igboland
## 1251                                                                                                                                                                                                                                                                                 The complete stories
## 1252                                                                                                                                                                                                                                                                    Stamboul train : an entertainment
## 1253                                                                                                                                                                                                                                                                                    Red gas : a novel
## 1254                                                                                                                                                                                                                                                                            The keeper of antiquities
## 1255                                                                                                                                                                                                                                                                                Blue eyes, black hair
## 1256                                                                                                                                                                                                                                                               The winter of our discontent : a novel
## 1257                                                                                                                                                                                                                                                                               The climate of courage
## 1258                                                                                                                                                                                                                                                                                    The day in shadow
## 1259                                                                                                                                                                                                                                                                     The secret agent : a simple tale
## 1260                                                                                                                                                                                                                                                                                        The pure land
## 1261                                                                                                                                                                                                                                                                The autumn ball : scenes of city life
## 1262                                                                                                                                                                                                                                                                                              Redcoat
## 1263                                                                                                                                                                                                                                                                                            Moby Dick
## 1264                                                                                                                                                                                                                    Conversations with Lord Byron on perversion, 163 years after His Lordship's death
## 1265                                                                                                                                                                                                                                                                                        A love affair
## 1266                                                                                                                                                                                                                                                                                  The living hothouse
## 1267                                                                                                                                                                                                                                                                               Man and arms : a novel
## 1268                                                                                                                                                                                                                                               Possessed, or, The secret of Myslotch : a Gothic novel
## 1269                                                                                                                                                                                                                                                 An introduction to the life and works of John Bunyan
## 1270                                                                                                                                                                                                                                                                                          The charmer
## 1271                                                                                                                                                                                                                                                                             Darkness casts no shadow
## 1272                                                                                                                                                                                                                                                                           The man in the monkey suit
## 1273                                                                                                                                                                                                                                                                                 A tale of two cities
## 1274                                                                                                                                                                                                                                                      Narratives of the wreck of the whale-ship Essex
## 1275                                                                                                                                                                                       History and legend in Romanian short stories and tales ; translated by Ana Cartianu ; foreword by Mihai Zamfir
## 1276                                                                                                                                                                                                                                                                             Legends from the Outback
## 1277                                                                                                                                                                                                                                       Whispering in the reeds : South African folk tales and legends
## 1278                                                                                                                                                                                                                                                                         Favourite folktales of China
## 1279                                                                                                                                                                                                                                                           The golden bird : folk tales from Slovenia
## 1280                                                                                                                                                                                                                                                                                      Beijing legends
## 1281                                                                                                                                                                                                                                                     The wonderful sea horse, and other Persian tales
## 1282                                                                                                                                                                                                                                           Celtic tales : legends of tall warriors & old enchantments
## 1283                                                                                                                                                                                                                                                                  Arctic twilight : old Finnish tales
## 1284                                                                                                                                                                                                                                   Fireside tales of the Traveller children : twelve Scottish stories
## 1285                                                                                                                                                                                                                                   A Mountain of gems : fairy tales of the peoples of the Soviet land
## 1286                                                                                                                                                                                                                                                                                 Estonian fairy tales
## 1287                                                                                                                                                                                                                                  Ancient tales in modern Japan : an anthology of Japanese folk tales
## 1288                                                                                                                                                                                                                                   The long & the short & the tall : a collection of Australian yarns
## 1289                                                                                                                                                                                                                                                  The black cloth : a collection of African folktales
## 1290                                                                                                                                                                                                                                                                      Fairy tales from Czechoslovakia
## 1291                                                                                                                                                                                                                                                                      Fairy tales from Czechoslovakia
## 1292                                                                                                                                                                                                                                                                             Folk tales from Roumania
## 1293                                                                                                                                                                                                The trials and tribulations of Little Red Riding Hood : versions of the tale in sociocultural context
## 1294                                                                                                                                                                                                                                                                 Welsh legends and folk-tales, retold
## 1295                                                                                                                                                                                                                                                                                      Noli me tangere
## 1296                                                                                                                                                                                                                                                                           Tales from the Arab tribes
## 1297                                                                                                                                                                                                                                                                The Oral literature of the Banyakyusa
## 1298                                                                                                                                                                                                                                                         Kalila and Dimna : selected fables of Bidpai
## 1299                                                                                                                                                                                                                                                                            Folk tales of the borders
## 1300                                                                                                                                                                                                                                          Elves, trolls and elemental beings : Icelandic folktales II
## 1301                                                                                                                                                                                                                                        Adventures, outlaws and past events : Icelandic folktales III
## 1302                                                                                                                                                                                                                                                         Once upon a time; forty Hungarian folk-tales
## 1303                                                                                                                                                                                                                                        Siamese tales old and new: The four riddles and other stories
## 1304                                                                                                                                                                                                                                                                      Rumanian bird and beast stories
## 1305                                                                                                                                                                                                                                                 The magic fiddler and other legends of French Canada
## 1306                                                                                                                                                                                                                                              Rabbi Eizik : Hasidic stories about the Zaddik of Kallo
## 1307                                                                                                                                                                                                            Traditional tales of old Korea : a mixture of legend and history of Korea's colorful past
## 1308                                                                                                                                                                                                            Traditional tales of old Korea : a mixture of legend and history of Korea's colorful past
## 1309                                                                                                                                                                                                                                     The hunter's cave: a book of stories based on African folk-tales
## 1310                                                                                                                                                                                                                                                                                Indonesian folk tales
## 1311                                                                                                                                                                                                                                                                     Serbian folk-lore; popular tales
## 1312                                                                                                                                                                                                                                                                       Heroes of folk tale and legend
## 1313                                                                                                                                                                                                                                                     The story bag; a collection of Korean folk tales
## 1314                                                                                                                                                                                                                                        The people of the sea; a journey in search of the seal legend
## 1315                                                                                                                                                                                                                                                                                New Guinea folk-tales
## 1316                                                                                                                                                                                                                                                                                     Czech folk tales
## 1317                                                                                                                                                                                                                                                                                Russian popular tales
## 1318                                                                                                                                                                                                                                                                      Stories from Babylon and Persia
## 1319                                                                                                                                                                                                                                                                                        Mountain path
## 1320                                                                                                                                                                                                                                                                  Across the land from ghost to ghost
## 1321                                                                                                                                                                                                                                                                                       Zuni mythology
## 1322                                                                                                                                                                                                                                           Hong Kong tale-spinners; a collection of tales and ballads
## 1323                                                                                                                                                                                                                                                                   Three Märchen of E. T. A. Hoffmann
## 1324                                                                                                                                                                                                               The death-thorn; magic, superstitions, and beliefs of urban Indians in Panama and Peru
## 1325                                                                                                                                                                                                                                                                                    Persian folktales
## 1326                                                                                                                                                                                                                                                                King Arthur; tales of the Round Table
## 1327                                                                                                                                                                                                                                                    The Northmen talk; a choice of tales from Iceland
## 1328                                                                                                                                                                                                                                                                Told in the market place; forty tales
## 1329                                                                                                                                                                                                                                   Japanese tales of mystery & imagination, by Edogawa Rampo [pseud.]
## 1330                                                                                                                                                                                                                                                                                     The African saga
## 1331                                                                                                                                                                                                                                           Our children of the sun; a suite of Inca legends from Peru
## 1332                                                                                                                                                                                                                                     The snow queen, and other tales. A new selection and translation
## 1333                                                                                                                                                                  Yule-tide stories; a collection of Scandinavian and north German popular tales and traditions, from the Swedish, Danish, and German
## 1334                                                                                                                                                                                                                                                                           Stories of the Middle Ages
## 1335                                                                                                                                                                                                                                                       Bawdy tales from the courts of medieval France
## 1336                                                                                                                                                                                                                                                                      Armenian folk-tales and fables;
## 1337                                                                                                                                                                                                                                                                               Tales from the Basotho
## 1338                                                                                                                                                                                                                                                                                Folk tales from Korea
## 1339                                                                                                                                                                                                                                China's dirtiest trickster; folklore about Hsü Wen-chʻang (1521-1593)
## 1340                                                                                                                                                                                                                                                                                  Indaba, my children
## 1341                                                                                                                                                                                                                                                      Mead Moondaughter, & other Icelandic folk tales
## 1342                                                                                                                                                                                                                                                                               Fables and fairy tales
## 1343                                                                                                                                                                                                                                                                               Fables and fairy tales
## 1344                                                                                                                                                                                                                                                  The life and opinions of Tristram Shandy, gentleman
## 1345                                                                                                                                                                                                                                                  The simpleton of Naples and other Italian folktales
## 1346                                                                                                                                                                                                                                                                        Women in ancient Indian tales
## 1347                                                                                                                                                                                                                                                                                    Italian folktales
## 1348                                                                                                                                                                                                                                                 The twelve dancing princesses, and other fairy tales
## 1349                                                                                                                                                                                   Beauties, beasts, and enchantment : classic French fairy tales ; translated and with an introduction by Jack Zipes
## 1350                                                                                                                                                                                                                                                         Quiet flows the Don : a novel in two volumes
## 1351                                                                                                                                                                                                                                                         Quiet flows the Don : a novel in two volumes
## 1352                                                                                                                                                                                                                                                                                      Startide rising
## 1353                                                                                                                                                                                                                                                                                           Son of man
## 1354                                                                                                                                                                                                                                                                                                Elisa
## 1355                                                                                                                                                                                                                                                                               Alice of old Vincennes
## 1356                                                                                                                                                                                                                                                                                    Monsignor Quixote
## 1357                                                                                                                                                                                                                                                                                       Roads to glory
## 1358                                                                                                                                                                                                                                                                                          King Rother
## 1359                                                                                                                                                                                                                                                                                  El sen̄or presidente
## 1360                                                                                                                                                                                                              War and peace; the Maude translation, backgrounds and sources [and] essays in criticism
## 1361                                                                                                                                                                                                                      Tales of times now past : sixty-two stories from a medieval Japanese collection
## 1362                                                                                                                                                                                                                                                                                             Germinal
## 1363                                                                                                                                                                                                                                                              The adventures of Hajji Baba of Ispahan
## 1364                                                                                                                                                                                                                                                                                  The house of mirth;
## 1365                                                                                                                                                                                                                                                                                             Ceremony
## 1366                                                                                                                                                                                                      Bread givers : a novel : a struggle between a father of the Old World and a daughter of the New
## 1367                                                                                                                                                                                                                                                                           One arm, and other stories
## 1368                                                                                                                                                                                                                                                                 The complete fairy tales and stories
## 1369                                                                                                                                                                                                                                                                       All quiet on the western front
## 1370                                                                                                                                                                                                                                                                   Into the millennium (the criminals
## 1371                                                                                                                                                                                                                                                                       the like of it now happens (II
## 1372                                                                                                                                                                                                                                                              Tolstoy's tales of courage and conflict
## 1373                                                                                                                                                                                                                                                                         Limestone, and other stories
## 1374                                                                                                                                                                                                                                                                                         The Recluse;
## 1375                                                                                                                                                                                                                                                                                    Life is elsewhere
## 1376                                                                                                                                                                                                                                                                               Scenes from a marriage
## 1377                                                                                                                                                                                                                                                                                        Heat and dust
## 1378                                                                                                                                                                                                                                                                        Symposium and other dialogues
## 1379                                                                                                                                                                                                                                                                                 Stories and episodes
## 1380                                                                                                                                                                                                                                                                             The radiance of the king
## 1381                                                                                                                                                                                                                                                                                King Lazarus; a novel
## 1382                                                                                                                                                                                                                                                                         Gabriela, clove and cinnamon
## 1383                                                                                                                                                                                                                                                                                      Weep not, child
## 1384                                                                                                                                                                                                                                                A sort of introduction. The like of it now happens (I
## 1385                                                                                                                                                                                                                                                                                          Middlemarch
## 1386                                                                                                                                                                                                                                                                                    The golden orchid
## 1387                                                                                                                                                                                                                                                                            Stories of three decades;
## 1388                                                                                                                                                                                                                                                                                        This immortal
## 1389                                                                                                                                                                                                                                                                                  An American tragedy
## 1390                                                                                                                                                                                                                                                                       Job, the story of a simple man
## 1391                                                                                                                                                                                                                                                                                Maigret and the ghost
## 1392                                                                                                                                                                                                                                                                         The bleeding heart : a novel
## 1393                                                                                                                                                                                                                                                                          Short stories, five decades
## 1394                                                                                                                                                                                                                                                                             Too much flesh and Jabez
## 1395                                                                                                                                                                                                                                                                             Dream children : stories
## 1396                                                                                                                                                                                                                                                                          Modern Korean short stories
## 1397                                                                                                                                                                                                                                                                      The path to the nest of spiders
## 1398                                                                                                                                                                                                                                                                                  On heroes and tombs
## 1399                                                                                                                                                                                                                                                                                Loitering with intent
## 1400                                                                                                                                                                                                                                                                      The return of Philip Latinovicz
## 1401                                                                                                                                                                                                                                                                           The diary of a young girl;
## 1402                                                                                                                                                                                                                                                                       The little disturbances of man
## 1403                                                                                                                                                                                                                                                                        The dean's December : a novel
## 1404                                                                                                                                                                                                                                                                                           Five women
## 1405                                                                                                                                                                                                                                                                                            The trial
## 1406                                                                                                                                                                                                                                                       Two minutes of silence; selected short stories
## 1407                                                                                                                                                                                                                                                                                     Iron in the soul
## 1408                                                                                                                                                                                                                                                                                     The third ear. -
## 1409                                                                                                                                                                                                                                                                                      Time of silence
## 1410                                                                                                                                                                                                                                                                                       The lost steps
## 1411                                                                                                                                                                                                                                                                             A horse of another color
## 1412                                                                                                                                                                                                                                                                                  The captain's table
## 1413                                                                                                                                                                                                                                                                               There goes Davey Cohen
## 1414                                                                                                                                                                                          A critical edition of Sir Richard Fanshawe's 1647 translation of Giovanni Battista Guarini's Il pastor fido
## 1415                                                                                                                                                                                                                                                                                       The big fellow
## 1416                                                                                                                                                                                                                                                                          The dance of the wild mouse
## 1417                                                                                                                                                                                                                                                                                      Ol' prophet Nat
## 1418                                                                                                                                                                                                                                                                               The frost and the fire
## 1419                                                                                                                                                                                                                                                                                         Pink flannel
## 1420                                                                                                                                                                                                                                                                                       Caro : a novel
## 1421                                                                                                                                                                                                                                                                                           Miss Brown
## 1422                                                                                                                                                                                                                                                                            Trumpet for a walled city
## 1423                                                                                                                                                                                                                                                                           The Bellamy saga : a novel
## 1424                                                                                                                                                                                                                                                                                  This company of men
## 1425                                                                                                                                                                                                                                                                                    Idols on the path
## 1426                                                                                                                                                                                                                                                                                    A house in Peking
## 1427                                                                                                                                                                                                                                                                                          Titus alone
## 1428                                                                                                                                                                                                                                                                                  Major Dane's garden
## 1429                                                                                                                                                                                                                                                                            A man in charge : a novel
## 1430                                                                                                                                                                                                                                                                                    The winter people
## 1431                                                                                                                                                                                                                                                                                     The old believer
## 1432                                                                                                                                                                                                                                                                              The low roads : a novel
## 1433                                                                                                                                                                                                                                                                              Pericles on 31st Street
## 1434                                                                                                                                                                                                                                                                                       Vida : a novel
## 1435                                                                                                                                                                                                                                                                                       Complete works
## 1436                                                                                                                                                                                                                           Prose romances: The murders in the Rue Morgue and The man that was used up
## 1437                                                                                                                                                                                                                                                                            The Frederik Pohl omnibus
## 1438                                                                                                                                                                                                                                                                                            Starburst
## 1439                                                                                                                                                                                                                                                                          The age of the pussyfoot. -
## 1440                                                                                                                                                                                                                                                                                 Alternating currents
## 1441                                                                                                                                                                                                                                                                                   The lilywhite boys
## 1442                                                                                                                                                                                                                                                                           The enigma of Conrad Stone
## 1443                                                                                                                                                                                                                                                                             The instrument : a novel
## 1444                                                                                                                                                                                                                                                      Lovey Childs, a Philadelphian's story : a novel
## 1445                                                                                                                                                                                                                                                                           The Grand Portage, a novel
## 1446                                                                                                                                                                                                                                                                      As far as my feet will carry me
## 1447                                                                                                                                                                                                                                                                                        The long view
## 1448                                                                                                                                                                                                                                                                          The solid mandala : a novel
## 1449                                                                                                                                                                                                                                                          The holy terrors. With illus. by the author
## 1450                                                                                                                                                                                                                                                                               Selected short stories
## 1451                                                                                                                                                                                                                                                                              Reincarnation in Venice
## 1452                                                                                                                                                                                                                                                                                      Day of judgment
## 1453                                                                                                                                                                                                                                                                                          Malone dies
## 1454                                                                                                                                                                                                                                                                      The loved and the lost, a novel
## 1455                                                                                                                                                                                                                                                                                      The masterpiece
## 1456                                                                                                                                                                                                                                                                                    Tombs of blue ice
## 1457                                                                                                                                                                                                                                                  Notes from the underground and The grand inquititor
## 1458                                                                                                                                                                                                                                                                                  The whispering land
## 1459                                                                                                                                                                                                                                                                                         The seraglio
## 1460                                                                                                                                                                                                                                                                    The sunflowers, and other stories
## 1461                                                                                                                                                                                                                                                                                      Magnus: a novel
## 1462                                                                                                                                                                                                                                                                                    Despair : a novel
## 1463                                                                                                                                                                                                                                                                            This day's death, a novel
## 1464                                                                                                                                                                                                                                                                   Maigret's pipe : seventeen stories
## 1465                                                                                                                                                                                                                                                                                     The human season
## 1466                                                                                                                                                                                                                                                                                Exile and the kingdom
## 1467                                                                                                                                                                                                                                                                       Sri Sumarah, and other stories
## 1468                                                                                                                                                                                                                                                                                    One deadly summer
## 1469                                                                                                                                                                                                                                                                           Keep the aspidistra flying
## 1470                                                                                                                                                                                                                                                                                          Cosmicomics
## 1471                                                                                                                                                                                                                                                                                  Ten North Frederick
## 1472                                                                                                                                                                                                                       Mountain standard time: Main line west, Far from Cibola [and] The common heart
## 1473                                                                                                                                                                                                                                                                              The adventures; a novel
## 1474                                                                                                                                                                                                                                                                                    The rich pay late
## 1475                                                                                                                                                                                                                                                                                     The godfather. -
## 1476                                                                                                                                                                                                                                                                                       The dark arena
## 1477                                                                                                                                                                                                                                                                                 Land without justice
## 1478                                                                                                                                                                                                                                                                           The prisoners of Combine D
## 1479                                                                                                                                                                                                                                                                                      Thyrza : a tale
## 1480                                                                                                                                                                                                                                                                                    Isabel Clarendon;
## 1481                                                                                                                                                                                                                                                                                 The midnight plumber
## 1482                                                                                                                                                                                                                                                                                An accomplished woman
## 1483                                                                                                                                                                                                                                  Fielding Gray: the fourth novel of the 'Alms for oblivion' sequence
## 1484                                                                                                                                                                                                                                                                                     Seasons of anomy
## 1485                                                                                                                                                                                                                                                                       Ship Island, and other stories
## 1486                                                                                                                                                                                                                                                                                     The public image
## 1487                                                                                                                                                                                                                                                                                  The tyranny of love
## 1488                                                                                                                                                                                                                                                                            The village in the jungle
## 1489                                                                                                                                                                                                                                                                                     Why I am so beat
## 1490                                                                                                                                                                                                                                                                    A canticle for Leibowitz: a novel
## 1491                                                                                                                                                                                                                                                                        The sleep of reason : a novel
## 1492                                                                                                                                                                                                                                               The last mystery of Edgar Allan Poe : the Troy dossier
## 1493                                                                                                                                                                                                                            Barozzi : or, The Venetian sorceress : a romance of the sixteenth century
## 1494                                                                                                                                                                                                                                                                                         Forget Harry
## 1495                                                                                                                                                                                                                                                                                  The old manor house
## 1496                                                                                                                                                                                                                                                                              The story of the weasel
## 1497                                                                                                                                                                                                                                                                                    Lazarus in Vienna
## 1498                                                                                                                                                                                                                                                                                   In fear of silence
## 1499                                                                                                                                                                                                                                                                                A morning to remember
## 1500                                                                                                                                                                                                                                                                        Some parts in the single life
## 1501                                                                                                                                                                                                                                                                        The opportunity of a lifetime
## 1502                                                                                                                                                                                                                                                                              Looking for the general
## 1503                                                                                                                                                                                                                                                                           The death of the detective
## 1504                                                                                                                                                                                                                                                                                        The middleman
## 1505                                                                                                                                                                                                                                                                                 Angel city : a novel
## 1506                                                                                                                                                                                                                                                                                The collected edition
## 1507                                                                                                                                                                                                                                                                               The lily in the valley
## 1508                                                                                                                                                                                                                                                                              The heart of the matter
## 1509                                                                                                                                                                                                                                                                                   It's a battlefield
## 1510                                                                                                                                                                                                                                                                              The heart of the matter
## 1511                                                                                                                                                                                                                                                        Doctor Fischer of Geneva : or, The bomb party
## 1512                                                                                                                                                                                                                                                                                       Stamboul train
## 1513                                                                                                                                                                                                                                                                                 Travels with my Aunt
## 1514                                                                                                                                                                                                                                                                        Travels with my aunt; a novel
## 1515                                                                                                                                                                                                                                                                                              Slammer
## 1516                                                                                                                                                                                                                                                                                 The entity : a novel
## 1517                                                                                                                                                                                                                                                                                 Shadow of my brother
## 1518                                                                                                                                                                                                                                                                                Settlers of the marsh
## 1519                                                                                                                                                                                                                                                    A search for America; the odyssey of an immigrant
## 1520                                                                                                                                                                                                                                                                                  Fruits of the earth
## 1521                                                                                                                                                                                                                                                                                            The Kiowa
## 1522                                                                                                                                                                                                                          Tales from the margin. The selected short stories of Frederick Philip Grove
## 1523                                                                                                                                                                                                                                                           This is Moscow speaking, and other stories
## 1524                                                                                                                                                                                                                                                                                        The treatment
## 1525                                                                                                                                                                                                                                                                                 The paragon; a novel
## 1526                                                                                                                                                                                                                                                                                         Star witness
## 1527                                                                                                                                                                                                                                            Le Mirliton, a novel based on the life of Aristide Bruant
## 1528                                                                                                                                                                                                                                                                                             Vanished
## 1529                                                                                                                                                                                                                                        Three novels: Rule golden, Natural state, [and] The dying man
## 1530                                                                                                                                                                                                                                                                              Nothing to do with love
## 1531                                                                                                                                                                                                                                                                       Close to the village : [novel]
## 1532                                                                                                                                                                                                                                                                           The whole world is outside
## 1533                                                                                                                                                                                                                                                                           The revolutionary; a novel
## 1534                                                                                                                                                                                                                                                                             Save the whale : a novel
## 1535                                                                                                                                                                                                                                                                                            Mandragon
## 1536                                                                                                                                                                                                                                                                           The studhorse man; a novel
## 1537                                                                                                                                                                                                                                                                                   Badlands : a novel
## 1538                                                                                                                                                                                                                                                                                         The betrayal
## 1539                                                                                                                                                                                                                                                                          But we are exiles : a novel
## 1540                                                                                                                                                                                                                                                                    Christmas at Fontaine's : a novel
## 1541                                                                                                                                                                                                                                                                             The dream and the desert
## 1542                                                                                                                                                                                                                                                                                      The green house
## 1543                                                                                                                                                                                                                                                                                      The pea-pickers
## 1544                                                                                                                                                                                                                                                                                          Blanket boy
## 1545                                                                                                                                                                                                                                                                                              Hurrish
## 1546                                                                                                                                                                                                                                                                         Happiness, and other stories
## 1547                                                                                                                                                                                                                                                                    The great wave, and other stories
## 1548                                                                                                                                                                                                                                                                                     Selected stories
## 1549                                                                                                                                                                                                                                                                                  Envoy to new worlds
## 1550                                                                                                                                                                                                                                                       The house in November; a science fiction novel
## 1551                                                                                                                                                                                                                                                                                      The stone angel
## 1552                                                                                                                                                                                                                                                                                              Stories
## 1553                                                                                                                                                                                                                                                                                      Fifteen stories
## 1554                                                                                                                                                                                                                                                                                      The liberty lad
## 1555                                                                                                                                                                                                                                                                                         The deserter
## 1556                                                                                                                                                                                                                                                                                The great white queen
## 1557                                                                                                                                                                                                                                                                      Love or whatever it is; a novel
## 1558                                                                                                                                                                                                                                                                                      African stories
## 1559                                                                                                                                                                                           The everything man; being an unauthorised account of some incidents in the life of Glenville Rice Sherrard
## 1560                                                                                                                                                                                                                                                                             The primal yoke, a novel
## 1561                                                                                                                                                                                                                                                                                   The Purcell papers
## 1562                                                                                                                                                                                                                                                                                   The passion artist
## 1563                                                                                                                                                                                                                                                                                        Small changes
## 1564                                                                                                                                                                                                                                                                    Beyond recall (Unwiederbringlich)
## 1565                                                                                                                                                                                                                                                                                      By nature equal
## 1566                                                                                                                                                                                                                                                                                  The duke's children
## 1567                                                                                                                                                                                                                                                                         When Harlie was one; a novel
## 1568                                                                                                                                                                                                                                                                                  The conservationist
## 1569                                                                                                                                                                                                                                                                                  The habit of loving
## 1570                                                                                                                                                                                                                                                                                    Fantastic stories
## 1571 Falstaff : being the Acta domini Johannis Fastolfe, or Life and valiant deeds of Sir John Faustoff, or The hundred days war, as told by Sir John Fastolf, K. G., to his secretaries, William Worcester, Stephen Scrope, Fr Brackley, Christopher Hanson, Luke Nanton, John Bussard, and Peter Basset
## 1572                                                                                                                                                                                                                                                                                               Merlin
## 1573                                                                                                                                                                                                                                                               Dangerous visions; 33 original stories
## 1574                                                                                                                                                                                                                                                             Family : a novel in the form of a memoir
## 1575                                                                                                                                                                                                                                                           Towards the silver crests of the Himalayas
## 1576                                                                                                                                                                                                                                                                             The serpent and the rope
## 1577                                                                                                                                                                                                                                                                          Sadeq Hedayat, an anthology
## 1578                                                                                                                                                                                                                                                                                           The agunah
## 1579                                                                                                                                                                                                                                                                                             Mirgorod
## 1580                                                                                                                                                                                                                                                                                    The well, a novel
## 1581                                                                                                                                                                                                                                                                        The shrine, and other stories
## 1582                                                                                                                                                                                                                                                                                   Best short stories
## 1583                                                                                                                                                                                                                                                                                              Drought
## 1584                                                                                                                                                                                                                                                                                    Coming up for air
## 1585                                                                                                                                                                                                                                                              Death of a chieftain, and other stories
## 1586                                                                                                                                                                                                                                                                                     Less than angels
## 1587                                                                                                                                                                                                                                                                           Night at the Mocking Widow
## 1588                                                                                                                                                                                                                                                                                    The investigation
## 1589                                                                                                                                                                                                                                                                                        Phineas Redux
## 1590                                                                                                                                                                                                                                                                            Invitation to a beheading
## 1591                                                                                                                                                                                                                                                                                  We too are drifting
## 1592                                                                                                                                                                                                                                                                                    The game of kings
## 1593                                                                                                                                                                                                                                 First trilogy: Herself surprised. To be a pilgrim. The horse's mouth
## 1594                                                                                                                                                                                                                                                                The tree of dreams, and other stories
## 1595                                                                                                                                                                                                                                                                                           18 stories
## 1596                                                                                                                                                                                                                                                                                  The Mandelbaum gate
## 1597                                                                                                                                                                                                                                                                    The steel bird, and other stories
## 1598                                                                                                                                                                                                                                                      The death ship; the story of an American sailor
## 1599                                                                                                                                                                                                                                                                                 Twilight in Djakarta
## 1600                                                                                                                                                                                                                                                                                      Antonio in love
## 1601                                                                                                                                                                                                                                                                          Lovey, a very special child
## 1602                                                                                                                                                                                                                                  Woman in two worlds; : a personal story of psychological experience
## 1603                                                                                                                                                                                                                                                     Fathers and sons ; A nest of the gentry : novels
## 1604                                                                                                                                                                                                                                                                    Masters of the modern short story
## 1605                                                                                                                                                                                                                                              The clansman; an historical romance of the Ku Klux Klan
## 1606                                                                                                                                                                                                                                                             Modern Japanese literature, an anthology
## 1607                                                                                                                                                                                                                                                                                             Midnight
## 1608                                                                                                                                                                                                                                                                                     Darkness at noon
## 1609                                                                                                                                                                                                                                                           The loneliness of the long-distance runner
## 1610                                                                                                                                                                                                                                                                                  The portable Conrad
## 1611                                                                                                                                                                                                                                                                                        The iron heel
## 1612                                                                                                                                                                                                                                                                                Foundation and empire
## 1613                                                                                                                                                                                                                                                                      No country without grandfathers
## 1614                                                                                                                                                                                                                                                                         One damn thing after another
## 1615                                                                                                                                                                                                                                                                      The vengeance and other stories
## 1616                                                                                                                                                                                                                                                                                   The bleaching yard
## 1617                                                                                                                                                                                                                                                                                     Threepenny novel
## 1618                                                                                                                                                                                                                                                                        Short stories of Arefin Badal
## 1619                                                                                                                                                                                                                                                                                     The broken sword
## 1620                                                                                                                                                                                                                                                           Maggie Muggins, or, Spring in Earl's court
## 1621                                                                                                                                                                                                                                                               The cornet-player who betrayed Ireland
## 1622                                                                                                                                                                                                                                                                The best short stories of John Buchan
## 1623                                                                                                                                                                                                                                                                                 Imago bird : a novel
## 1624                                                                                                                                                                                                                                                                Possessed, or, The secret of Myslotch
## 1625                                                                                                                                                                                                                                                                                       Lunatic villas
## 1626                                                                                                                                                                                                                                                                                    Gon̈gu-Hrolfs saga
## 1627                                                                                                                                                                                                                                                                                    I and you and she
## 1628                                                                                                                                                                                                                                                Money for Maria and Borrowed time : two village tales
## 1629                                                                                                                                                                                                                              The Courtesan's jewel box : Chinese stories of the Xth-XVIIth centuries
## 1630                                                                                                                                                                                                                                                                                               Crisis
## 1631                                                                                                                                                                                                                                                                                               Gemini
## 1632                                                                                                                                                                                                                                                                              Tales from the calendar
## 1633                                                                                                                                                                                                                                                                                         The air cage
## 1634                                                                                                                                                                                                                                                                                   The price of glory
## 1635                                                                                                                                                                                                                                                                                A handful of darkness
## 1636                                                                                                                                                                                                                                                                           Hue and cry; short stories
## 1637                                                                                                                                                                                                                                                           Frontline report : a journalist's notebook
## 1638                                                                                                                                                                                                                                                                  Chekhov, the early stories, 1883-88
## 1639                                                                                                                                                                                                                                                       The king in the golden mask and other writings
## 1640                                                                                                                                                                                                                                                                        The merry-go-round in the sea
## 1641                                                                                                                                                                                                                                                                                The samurai : a novel
## 1642                                                                                                                                                                                                                                                                                   A washed-out dream
## 1643                                                                                                                                                                                                                                                                Oranges for the son of Alexander Levy
## 1644                                                                                                                                                                                                                                                                                     Letter by letter
## 1645                                                                                                                                                                                                                                                                                     Selected stories
## 1646                                                                                                                                                                                                                                                 What do you think yourself? : Scottish short stories
## 1647                                                                                                                                                                                                                                                                                   Against the stream
## 1648                                                                                                                                                                                                                                                                                          Ethan Frome
## 1649                                                                                                                                                                                                                                           The custom of the country; with an introd. by Blake Nevius
## 1650                                                                                                                                                                                                                                                                               The lily in the valley
## 1651                                                                                                                                                                                                                                                                                 Complete fairy tales
## 1652                                                                                                                                                                                                                                                                                    Uncle Tom's cabin
## 1653                                                                                                                                                                                                                                                       The silent witness : a polygraphist's casebook
## 1654                                                                                                                                                                                                                                                                   Radical Zen : the sayings of Jōshū
## 1655                                                                                                                                                                                                                                                                                   War with the newts
## 1656                                                                                                                                                                                                                                                                Twenty thousand leagues under the sea
## 1657                                                                                                                                                                                                                                                                                 The portable Chekhov
## 1658                                                                                                                                                                                                                                                                                      The ice people;
## 1659                                                                                                                                                                                                                                                                                       A charmed life
## 1660                                                                                                                                                                                                                                                                                         The red pony
## 1661                                                                                                                                                                                                                                                                                                A man
## 1662                                                                                                                                                                                                                                                                                        The islanders
## 1663                                                                                                                                                                                                                                                                                         The shipyard
## 1664                                                                                                                                                                                                                                                                         Thirty seconds over New York
## 1665                                                                                                                                                                                                                                                                                Spinsters in jeopardy
## 1666                                                                                                                                                                                                                                                                                     Hellstrom's Hive
## 1667                                                                                                                                                                                                                                                                                    Fortress besieged
## 1668                                                                                                                                                                                                                                                                                      The dice of war
## 1669                                                                                                                                                                                                                                                                           The saint of the atom bomb
## 1670                                                                                                                                                                                                                                                                                    No sweetness here
## 1671                                                                                                                                                                                                                                                                                    Ten steps to hope
## 1672                                                                                                                                                                                                                                                                                           Eye of cat
## 1673                                                                                                                                                                                                                                                        The non-existent knight & The cloven viscount
## 1674                                                                                                                                                                                                                                                  A sort of introduction . The like of it now happens
## 1675                                                                                                                                                                                                                                                                                               Moscow
## 1676                                                                                                                                                                Vienna 1900 - games with love and death : the stories which formed the basis of the TV serial devised and dramatized by Robert Muller
## 1677                                                                                                                                                                                                                                                                                  Dancers in mourning
## 1678                                                                                                                                                                                                                                                                                              Players
## 1679                                                                                                                                                                                                                                                                            The charterhouse of Parma
## 1680                                                                                                                                                                                                                                                                                    Posthumous pieces
## 1681                                                                                                                                                                                                                                                                             The travels of Lao Tsʻan
## 1682                                                                                                                                                                                                                                               The new Atlantis and other novellas of science fiction
## 1683                                                                                                                                                                                                                                               Ulhwa, the shaman : a novel of Korea and three stories
## 1684                                                                                                                                                                                                                                                                                  Twenty four stories
## 1685                                                                                                                                                                                                                                                           Like birds, like fishes, and other stories
## 1686                                                                                                                                                                                                                                                                                          Full circle
## 1687                                                                                                                                                                                                                                                                                   Return to laughter
## 1688                                                                                                                                                                                                                                          The world of Dunnet Landing, a Sarah Orne Jewett collection
## 1689                                                                                                                                                                                                                                                              The Guermantes way. Cities of the plain
## 1690                                                                                                                                                                                                                                                             The captive. The fugitive. Time regained
## 1691                                                                                                                                                                                                                                                                                       The burnt ones
## 1692                                                                                                                                                                                                                                                                                  Wonderland; a novel
## 1693                                                                                                                                                                                                                                                                                         The mischief
## 1694                                                                                                                                                                                                                                                                                            The bride
## 1695                                                                                                                                                                                                                                                                    Antar : a Bedoueen romance (1819)
## 1696                                                                                                                                                                                                                                                                                      The olive grove
## 1697                                                                                                                                                                                                                                            The Body and the dream : French erotic fiction, 1464-1900
## 1698                                                                                                                                                                                                                                                                     Scenes from later life : a novel
## 1699                                                                                                                                                                                                                                                                   The special subunit : two novellas
## 1700                                                                                                                                                                                                         The best of Roald Dahl : stories from Over to you, Someone like you, Kiss kiss, Switch bitch
## 1701                                                                                                                                                                                                                                                                               Sweet prince : a novel
## 1702                                                                                                                                                                                                                                                                                       A place to die
## 1703                                                                                                                                                                                                                                                          The Last of the Empire : a Senegalese novel
## 1704                                                                                                                                                                                                                                                                                         The children
## 1705                                                                                                                                                                                                                                                                                          A rare cure
## 1706                                                                                                                                                                                                                                                         House visits : a collection of short stories
## 1707                                                                                                                                                                                                                                                                            The uncle & other stories
## 1708                                                                                                                                                                                                                                                            The nightingale echo : new Soviet stories
## 1709                                                                                                                                                                                                                                                                                 The Stoletov dossier
## 1710                                                                                                                                                                                                                                                                         Batouala; a true Black novel
## 1711                                                                                                                                                                                                                                                                The money-order; with, White genesis;
## 1712                                                                                                                                                                                                                                                                                 Ring roads : a novel
## 1713                                                                                                                                                                                                                                                                          Mist : Creature of darkness
## 1714                                                                                                                                                                                                                                                                                      Marthanda Varma
## 1715                                                                                                                                                                                                                                                                                     Praxis : a novel
## 1716                                                                                                                                                                                                                                                                                     Novels and tales
## 1717                                                                                                                                                                                                                      Anna Karenina; translated by Constance Garnett, with an introd. by Henri Troyat
## 1718                                                                                                                                                                                                                                                                                    Unancestral voice
## 1719                                                                                                                                                                                                                                     Scenes from the bathhouse, and other stories of Communist Russia
## 1720                                                                                                                                                                                                                                                                              Tales of Pirx the pilot
## 1721                                                                                                                                                                                                                                                     Rabbits, crabs, etc. : stories by Japanese women
## 1722                                                                                                                                                                                                                                                                                       The Immoralist
## 1723                                                                                                                                                                                                                                                                             The moon and the bonfire
## 1724                                                                                                                                                                                                                                                                                      A sparrow falls
## 1725                                                                                                                                                                                                                                                                                 Cold river : a novel
## 1726                                                                                                                                                                                                                                                                      The palace of shattered vessels
## 1727                                                                                                                                                                                                                                                                                     A wayside tavern
## 1728                                                                                                                                                                                                                                                                               Twenty years a-growing
## 1729                                                                                                                                                                                                                                                                                 The vendor of sweets
## 1730                                                                                                                                                                                                                                                                                               Godric
## 1731                                                                                                                                                                                                                                                                       Cast the first stone : a novel
## 1732                                                                                                                                                                                                                                                                    Selected stories of Lu Hsun pseud
## 1733                                                                                                                                                                                                                                                                                          The shackle
## 1734                                                                                                                                                                                                                                                                                     Claudine married
## 1735                                                                                                                                                                                                                                                                                 The painter of signs
## 1736                                                                                                                                                                                                                                                         The voyeur. $f: Translated by Richard Howard
## 1737                                                                                                                                                                                                                                                                                     Zorba the Greek;
## 1738                                                                                                                                                                                                                                                           In and out of Never-Never Land; 22 stories
## 1739                                                                                                                                                                                                                                                                                         The tin drum
## 1740                                                                                                                                                                                                                                                    The housebreaker of Shady Hill, and other stories
## 1741                                                                                                                                                                                                                                                                      The shroud and 20 other stories
## 1742                                                                                                                                                                                                                                                                                Stories of a lifetime
## 1743                                                                                                                                                                                                                                                                              The living and the dead
## 1744                                                                                                                                                                                                                                                           Faithful Ruslan : the story of a guard dog
## 1745                                                                                                                                                                                                                                                                                 The family Carnovsky
## 1746                                                                                                                                                                                                                                                                                       Each man's son
## 1747                                                                                                                                                                                                                                                                                       The ivory grin
## 1748                                                                                                                                                                                                                                                      Jeremy Poldark : a novel of Cornwall, 1790-1791
## 1749                                                                                                                                                                                                                                                                                         Water margin
## 1750                                                                                                                                                                                                                                                                                       The changeling
## 1751                                                                                                                                                                                                                                                                                   There will be time
## 1752                                                                                                                                                                                                                                                                                The merman's children
## 1753                                                                                                                                                                                                                                                                         The word for world is forest
## 1754                                                                                                                                                                                                                                                                                    Proteus : a novel
## 1755                                                                                                                                                                                                                                                                                   Midaq Alley, Cairo
## 1756                                                                                                                                                                                                                                                                               Cities of the interior
## 1757                                                                                                                                                                                                                                                                 Red dirt marijuana, and other tastes
## 1758                                                                                                                                                                                                                                                             Cock Robin; or A fight for male survival
## 1759                                                                                                                                                                                                                                                                              A book of short stories
## 1760                                                                                                                                                                                                                                                                                    The middle ground
## 1761                                                                                                                                                                                                                                                                                   Creation : a novel
## 1762                                                                                                                                                                                                                                                                             The deeps of deliverance
## 1763                                                                                                                                                                                                                                                                                            The trial
## 1764                                                                                                                                                                                                                                                                                         Hidden faces
## 1765                                                                                                                                                                                                                                                                                                Steps
## 1766                                                                                                                                                                                                                                                                                      Ladders to fire
## 1767                                                                                                                                                                                                                                                                           A spy in the house of love
## 1768                                                                                                                                                                                                                                                                           Lord of the flies, a novel
## 1769                                                                                                                                                                                                                                                                                    The red carnation
## 1770                                                                                                                                                                                                                                                                                        Winter danger
## 1771                                                                                                                                                                                                                                                                    Diary of a Russian schoolteacher;
## 1772                                                                                                                                                                                                                                                                                          The leopard
## 1773                                                                                                                                                                          The Russian garland of fairy tales : being Russian folk legends : translated from a collection of chap-books made in Moscow
## 1774                                                                                                                                                                                                                                                                        The death of Mr. Baltisberger
## 1775                                                                                                                                                                                                                                                         A landed proprietor. The cossacs. Sevastopol
## 1776                                                                                                                                                                                                                                                                                        Short stories
## 1777                                                                                                                                                                                                                                                                                  The book of the sea
## 1778                                                                                                                                                                                                               The city and the pillar revised; including an essay: Sex and the law, and An afterword
## 1779                                                                                                                                                                                                                                                  Chuckle with Chekhov : a selection of comic stories
## 1780                                                                                                                                                                                                                                                                                     The wooden horse
## 1781                                                                                                                                                                                                                                          Southern mail and Night flight / Antoine de Saint-Exupéry ;
## 1782                                                                                                                                                                                                                                                                                          The Yeshiva
## 1783                                                                                                                                                                                                                                                                                 The magic striptease
## 1784                                                                                                                                                                                                                                                                           Go tell it on the mountain
## 1785                                                                                                                                                                                                                                                                                       Young Törless;
## 1786                                                                                                                                                                                                                                                                                 The rice-sprout song
## 1787                                                                                                                                                                                                                                                                            Old-new land (Altneuland)
## 1788                                                                                                                                                                                                                                                                                     The Roman enigma
## 1789                                                                                                                                                                                                                                                                                      Brave new world
## 1790                                                                                                                                                                                                                                                                                      The onion field
## 1791                                                                                                                                                                                                                                                                                               Kokoro
## 1792                                                                                                                                                                                                                                                                           Selected satires of Lucian
## 1793                                                                                                                                                                                                                                                                  Ripening : selected work, 1927-1980
## 1794                                                                                                                                                                                                                                                                                           I am a cat
## 1795                                                                                                                                                                                                                                                                              To the end of the world
## 1796                                                                                                                                                                                                                                                                                            The magus
## 1797                                                                                                                                                                                                                                                                                 Moravagine: a novel;
## 1798                                                                                                                                                                                                                                                                                             Mine boy
## 1799                                                                                                                                                                                                                                                                                      The dragon lord
## 1800                                                                                                                                                                                                                                                                               São Bernardo : a novel
## 1801                                                                                                                                                                                                                                                                      Where the air is clear, a novel
## 1802                                                                                                                                                                                                                                                                           In plain Russian : stories
## 1803                                                                                                                                                                                                                                                                          Animal farm : a fairy story
## 1804                                                                                                                                                                                                                                                Volsunga saga: the story of the Volsungs and Niblungs
## 1805                                                                                                                                                                                                                                                         The life and adventures of Martin Chuzzlewit
## 1806                                                                                                                                                                                                                                          Widow, nun and courtesan; three novelettes from the Chinese
## 1807                                                                                                                                                                                                                                                                  Old people and the things that pass
## 1808                                                                                                                                                                                                                                                                   The lively anatomy of God; stories
## 1809                                                                                                                                                                                                                                                                        Memoirs of a good-for-nothing
## 1810                                                                                                                                                                                                                                              Best short stories. With an introd. by James T. Farrell
## 1811                                                                                                                                                                                                                                                 The Knightly Quest: a novella & twelve short stories
## 1812                                                                                                                                                                                                                                                        The adventures of Gurudeva, and other stories
## 1813                                                                                                                                                                                                                                                                                        Silver's city
## 1814                                                                                                                                                                                                                                                    Catastrophe: the strange stories of Dino Buzzati;
## 1815                                                                                                                                                                                                                                                                                  The beginning place
## 1816                                                                                                                                                                                                                                                                         When the kissing had to stop
## 1817                                                                                                                                                                                                                                                           Selected stories of Sholom Aleichem, pseud
## 1818                                                                                                                                                                                                                                                      The woman who had two navels : a Filipino novel
## 1819                                                                                                                                                                                                                                                                 Candide, Zadig, and selected stories
## 1820                                                                                                                                                                                                                                                                                  Casualties of peace
## 1821                                                                                                                                                                                                                                                                         Girls in their married bliss
## 1822                                                                                                                                                                                                                                                                    August is a wicked month, a novel
## 1823                                                                                                                                                                                                                                                                             Short novels and stories
## 1824                                                                                                                                                                                                                                                                                      Selected prose;
## 1825                                                                                                                                                                                                                                                                             The chronicle of the Cid
## 1826                                                                                                                                                                                                                                                                          Early in the summer of 1970
## 1827                                                                                                                                                                                                                                                                                              Stories
## 1828                                                                                                                                                                                                                                    Coronation/ $f: Translated from the Spanish by Jocasta Goodwin. -
## 1829                                                                                                                                                                                                                                                                         Famous Chinese short stories
## 1830                                                                                                                                                                                                                                                                                 Journey without maps
## 1831                                                                                                                                                                                                                                                                                            The thief
## 1832                                                                                                                                                                                                                                                                                           The castle
## 1833                                                                                                                                                                                                                                                                                                Works
## 1834                                                                                                                                                                                                                                                Auschwitz inferno : the testimony of a Sonderkommando
## 1835                                                                                                                                                                                                                                                                                     The first circle
## 1836                                                                                                                                                                                                                                                                                  The complete poetry
## 1837                                                                                                                                                                                                                                                             The tale of Genji : a novel in six parts
## 1838                                                                                                                                                                                                                                                                Sinning with Annie, and other stories
## 1839                                                                                                                                                                                                                                                                                              Malevil
## 1840                                                                                                                                                                                                                                                                                           Hurry home
## 1841                                                                                                                                                                                                                                                                     Snow-image and uncollected tales
## 1842                                                                                                                                                                                                                                                                    The American claimant manuscripts
## 1843                                                                                                                                                                                                                                                                                  The man of property
## 1844                                                                                                                                                                                                                                                                        Leaf storm, and other stories
## 1845                                                                                                                                                                                                                                                                                           Prisons. -
## 1846                                                                                                                                                                                                                                                                    St. Urbain's horseman; a novel. -
## 1847                                                                                                                                                                                                                                                                                           The castle
## 1848                                                                                                                                                                                                                                                                    The story of the seven princesses
## 1849                                                                                                                                                                                                                                                                                          The pilgrim
## 1850                                                                                                                                                                                                                                                                                   Fairoaks : a novel
## 1851                                                                                                                                                                                                                                                        Beasts of the southern wild and other stories
## 1852                                                                                                                                                                                                                                                                                    Claudine in Paris
## 1853                                                                                                                                                                                                                                                                              A ripple from the storm
## 1854                                                                                                                                                                                                                                                                              A ripple from the storm
## 1855                                                                                                                                                                                                                                                   The story of a non-marrying man, and other stories
## 1856                                                                                                                                                                                                                            Satan, his psychotherapy and cure by the unfortunate Dr. Kassler, J.S.P.S
## 1857                                                                                                                                                                                                                                                                           Flight from a dark equator
## 1858                                                                                                                                                                                                                                                                           The tenth year of the ship
## 1859                                                                                                                                                                                                                                                                                                  Eva
## 1860                                                                                                                                                                                                                                                                                            The limit
## 1861                                                                                                                                                                                                                                 The little Ottleys: Love's shadow. Tenterhooks. Love at second sight
## 1862                                                                                                                                                                                                                                                                                                 Eric
## 1863                                                                                                                                                                                                                                                              The gambler, Bobok [and] A nasty story;
## 1864                                                                                                                                                                                                                                                                             The master and Margarita
## 1865                                                                                                                                                                                                                                      The forgotten soldier. Translated from the French by Lily Emmet
## 1866                                                                                                                                                                                                                                                                                        The Decameron
## 1867                                                                                                                                                                                                                                                                                      The malefactors
## 1868                                                                                                                                                                                                                                                                            The moon and the bonfires
## 1869                                                                                                                                                                                                                                                           Warleggan : a novel of Cornwall, 1792-1793
## 1870                                                                                                                                                                                                                                                           Ah Q and others; selected stories of Lusin
## 1871                                                                                                                                                                                                                                                                         The greatest crime : a novel
## 1872                                                                                                                                                                                                                                                                                  The sirens of Titan
## 1873                                                                                                                                                                                                                                                                                             Madhouse
## 1874                                                                                                                                                                                                                                                                                       Ralph the heir
## 1875                                                                                                                                                                                                                                                                                    The twelve chairs
## 1876                                                                                                                                                                                                                                                                               Daughter of the legend
## 1877                                                                                                                                                                                                                                                                                  Come, gentle spring
## 1878                                                                                                                                                                                                                                                                                   Powers of attorney
## 1879                                                                                                                                                                                                                                                                                          This Sunday
## 1880                                                                                                                                                                                                                                                                      Touch the water, touch the wind
## 1881                                                                                                                                                                                                                                                                                    The price of salt
## 1882                                                                                                                                                                                                                                                                                     More Roman tales
## 1883                                                                                                                                                                                                                                                                       Lady Godiva, and other stories
## 1884                                                                                                                                                                                                                                                                                     Adam resurrected
## 1885                                                                                                                                                                                                                                       The "cultural revolution" : a close-up : an eyewitness account
## 1886                                                                                                                                                                                                                                                                                      The Issa Valley
## 1887                                                                                                                                                                                                                                                                                 Crime and punishment
## 1888                                                                                                                                                                                                                                                                               More pricks than kicks
## 1889                                                                                                                                                                                                                                                                                   The Continental Op
## 1890                                                                                                                                                                                                                                                                            The war between the Tates
## 1891                                                                                                                                                                                                                                                                                        In iron years
## 1892                                                                                                                                                                                                                                                                                Know nothing, a novel
## 1893                                                                                                                                                                                                                                                                      Where late the sweet birds sang
## 1894                                                                                                                                                                                                                                                                                    The Megstone plot
## 1895                                                                                                                                                                                                                                                                                     Jude the obscure
## 1896                                                                                                                                                                                                                                                                                                  Oh!
## 1897                                                                                                                                                                                                                                               The counterfeiters; with Journal of The counterfeiters
## 1898                                                                                                                                                                                                                                                                                         Buddenbrooks
## 1899                                                                                                                                                                                                                                                                                       Home to Harlem
## 1900                                                                                                                                                                                                                                              Tara͡s Bulba, the classic epic of the Ukrainian Cossacks
## 1901                                                                                                                                                                                                                                                     Look homeward, angel; a story of the buried life
## 1902                                                                                                                                                                                                                                                                                 The sword of Aldones
## 1903                                                                                                                                                                                                                                                    Hāji Āghā : portrait of an Iranian confidence man
## 1904                                                                                                                                                                                                                                                                                       Scoop, a novel
## 1905                                                                                                                                                                                                                                                                                      The ugupu bird;
## 1906                                                                                                                                                                                                                                                                                Pornografia: a novel;
## 1907                                                                                                                                                                                                                                                                                           The sowers
## 1908                                                                                                                                                                                                                                                                             The shipkiller : a novel
## 1909                                                                                                                                                                                                                                                                             The corrida at San Feliu
## 1910                                                                                                                                                                                                                                                              The clairvoyant goat, and other stories
## 1911                                                                                                                                                                                                                                                                                        Maiden Castle
## 1912                                                                                                                                                                                                                                                                                          The inmates
## 1913                                                                                                                                                                                                                                                                                          Wolf Solent
## 1914                                                                                                                                                                                                                                                                              What's become of Waring
## 1915                                                                                                                                                                                                                                                                                            Venusberg
## 1916                                                                                                                                                                                                                                                                              What's become of Waring
## 1917                                                                                                                                                                                                                                                                                   The thousand fires
## 1918                                                                                                                                                                                                                                                                                         Winged seeds
## 1919                                                                                                                                                                                                                                                                                     Working bullocks
## 1920                                                                                                                                                                                                                                                                           N'goola, and other stories
## 1921                                                                                                                                                                                                                                                                                         The pioneers
## 1922                                                                                                                                                                                                                                                                                 The buffalo soldiers
## 1923                                                                                                                                                                                                                                                 All that false instruction : a novel of lesbian love
## 1924                                                                                                                                                                                                                                                                                   Passages : a novel
## 1925                                                                                                                                                                                                                                                                             Gargantua and Pantagruel
## 1926                                                                                                                                                                                                                                                                                   Tidefall : a novel
## 1927                                                                                                                                                                                                                                  The Italian. or, The confessional of the Black Penitents: a romance
## 1928                                                                                                                                                                                                                                                                                               Reflex
## 1929                                                                                                                                                                                                                                                                The history of Sir Charles Grandison;
## 1930                                                                                                                                                                                                                                                                    Lives of short duration : a novel
## 1931                                                                                                                                                                                                                                                                                         Holy secrets
## 1932                                                                                                                                                                                                                                                                                   A woman of Bangkok
## 1933                                                                                                                                                                                                                                                                        The acrobat and other stories
## 1934                                                                                                                                                                                                                                                                                Son of a smaller hero
## 1935                                                                                                                                                                                                                                                                              The light in the forest
## 1936                                                                                                                                                                                                                                                                                   The dark peninsula
## 1937                                                                                                                                                                                                                                                                                    The right trumpet
## 1938                                                                                                                                                                                                                                                                                              Rocking
## 1939                                                                                                                                                                                                                                                                              This child's gonna live
## 1940                                                                                                                                                                                                                                                                         The winter after this summer
## 1941                                                                                                                                                                                                                                                                                           Edens lost
## 1942                                                                                                                                                                                                                                                                                   Parktilden Village
## 1943                                                                                                                                                                                                                                                                  Among the Dangs : ten short stories
## 1944                                                                                                                                                                                                                                                                                        Vietnam nurse
## 1945                                                                                                                                                                                                                                                                                 The Dick Gibson show
## 1946                                                                                                                                                                                                                                                                        Stanley Elkin's greatest hits
## 1947                                                                                                                                                                                                                                                                 One basket; thirty-one short stories
## 1948                                                                                                                                                                                                                                                                     Samskara = A rite for a dead man
## 1949                                                                                                                                                                                                                                                                                                Going
## 1950                                                                                                                                                                                                                                                                                 The man who got away
## 1951                                                                                                                                                                                                                                                                              Praise the human season
## 1952                                                                                                                                                                                      Nicholas Crabbe; or, The one and the many, a romance, by Fr. Rolfe (Baron Corvo) With an introd. by Cecil Woolf
## 1953                                                                                                                                                                                                                                                                                       The gasteropod
## 1954                                                                                                                                                                                                                                                                             On Spider Creek :a novel
## 1955                                                                                                                                                                                                                               The confession of a child of the century by Samuel Heather; a novel. -
## 1956                                                                                                                                                                                                                                                               Nine months in the life of an old maid
## 1957                                                                                                                                                                                                                                                                                            Crossings
## 1958                                                                                                                                                                                                                                                       The delectable mountains, and other narratives
## 1959                                                                                                                                                                                                                                                                               The sword of the golem
## 1960                                                                                                                                                                                                                                                                              The shame of our wounds
## 1961                                                                                                                                                                                                                                                                                             The orgy
## 1962                                                                                                                                                                                                                                                                  Favours : a novel by Bernice Rubens
## 1963                                                                                                                                                                                                                                                                                   Something of value
## 1964                                                                                                                                                                                                                                                                                     Top of the world
## 1965                                                                                                                                                                                                              Clancy, my friend, my friend: a picaresque story of the thirties down the Old Kent Road
## 1966                                                                                                                                                                                          Princess Pamela : being the personal journal of Miss Pamela Summerfield of Berkeley Square, Mayfair, London
## 1967                                                                                                                                                                                                                                                                           The day in shadow; a novel
## 1968                                                                                                                                                                                                                                                                                         A small fire
## 1969                                                                                                                                                                                                                                                 The Nightclerk : being his perfectly true confession
## 1970                                                                                                                                                                                                                                                                                   The gentle infidel
## 1971                                                                                                                                                                                                                                                                                     The fell of dark
## 1972                                                                                                                                                                                                                                                                   The Islar, a narrative of Lang III
## 1973                                                                                                                                                                                                                                                                              Faithful are the wounds
## 1974                                                                                                                                                                                                                                                                                         War memorial
## 1975                                                                                                                                                                                                                                                                                      Half moon haven
## 1976                                                                                                                                                                                                                                                                          "---and ladies of the club"
## 1977                                                                                                                                                                                                                                                                        The laughing matter : a novel
## 1978                                                                                                                                                                                                                                                               The vertical ladder, and other stories
## 1979                                                                                                                                                                                                                                           Son of the gamblin' man : the youth of an artist : a novel
## 1980                                                                                                                                                                                                                                                                                         Slogum House
## 1981                                                                                                                                                                                                                                                                                        Freezing down
## 1982                                                                                                                                                                                                                                                              The complete works of Homer : the Iliad
## 1983                                                                                                                                                                                                                                                                               Vlemk, the box-painter
## 1984                                                                                                                                                                                                                                                                     Briefing for a descent into Hell
## 1985                                                                                                                                                                                                                                                                        Death on the installment plan
## 1986                                                                                                                                                                                                                                                                    I sing the body electric! Stories
## 1987                                                                                                                                                                                                                                                                               The werewolf; Varulven
## 1988                                                                                                                                                                                                                                                                                              Solaris
## 1989                                                                                                                                                                                                                                                                                And never said a word
## 1990                                                                                                                                                                                                                                                                                The place of the lion
## 1991                                                                                                                                                                                                                                                                                Other people's houses
## 1992                                                                                                                                                                                                                                                  The red room: scenes of artistic and literary life;
## 1993                                                                                                                                                                                                                                                                            The man who fell to Earth
## 1994                                                                                                                                                                                                                                                                  The confidence man: his masquerade;
## 1995                                                                                                                                                                                                                                                                                      Thousand cranes
## 1996                                                                                                                                                                                                                                       The fugitive mind : the early development of an autistic child
## 1997                                                                                                                                                                                                                                                                               The betrothed; a novel
## 1998                                                                                                                                                                                                                                                                         Childhood, boyhood and youth
## 1999                                                                                                                                                                                                                                                                                             The wars
## 2000                                                                                                                                                                                                                                                                          Famous last words : a novel
## 2001                                                                                                                                                                                                                                                                                 The butterfly plague
## 2002                                                                                                                                                                                                                                                                               Back to China, a novel
## 2003                                                                                                                                                                                                                                                                       The second Stone; a love story
## 2004                                                                                                                                                                                                                                                                                         At Freddie's
## 2005                                                                                                                                                                                                                                                                               In the bunker; a novel
## 2006                                                                                                                                                                                                                                                                                     The cubical city
## 2007                                                                                                                                                                                                                                                                                 Mosquitoes : a novel
## 2008                                                                                                                                                                                                                                                                                          The mansion
## 2009                                                                                                                                                                                                                                                 The violins of Saint-Jacques: a tale of the Antilles
## 2010                                                                                                                                                                                                                                                                    Destiny; or, The Chief's daughter
## 2011                                                                                                                                                                                                                                                                              The story of Lola Gregg
## 2012                                                                                                                                                                                                                                                                                    Flags in the dust
## 2013                                                                                                                                                                                                                                                                        Sanctuary : the original text
## 2014                                                                                                                                                                                                                                                                       Uncle Willy, and other stories
## 2015                                                                                                                                                                                                                                                                                        Soldier's pay
## 2016                                                                                                                                                                                                                                                                                 A star in the family
## 2017                                                                                                                                                                                                                                                                                Passport for Jennifer
## 2018                                                                                                                                                                                                                                                                                               Tomboy
## 2019                                                                                                                                                                                                                                                                                         Lilo's dairy
## 2020                                                                                                                                                                                                                                 Alone against tomorrow; stories of alienation in speculative fiction
## 2021                                                                                                                                                                                                                                                                                 The 28th day of Elul
## 2022                                                                                                                                                                                                                                                                            Summer ends now : stories
## 2023                                                                                                                                                                                                                                                                                   No clouds of glory
## 2024                                                                                                                                                                                                                                                                   Doublefields; memories and stories
## 2025                                                                                                                                                                                                                                                                                    Train to Pakistan
## 2026                                                                                                                                                                                                                                                                                       Divided heaven
## 2027                                                                                                                                                                                                                                                                                  Long after midnight
## 2028                                                                                                                                                                                                                                                                                    Some came running
## 2029                                                                                                                                                                                                                                                                East of the sun and west of the moon;
## 2030                                                                                                                                                                                                                                                         Dance of the happy shades, and other stories
## 2031                                                                                                                                                                                                                                                                     Adam, and, The train: two novels
## 2032                                                                                                                                                                                                                                                                                   Decision at Delphi
## 2033                                                                                                                                                                                                                                                                    Saturday night and Sunday morning
## 2034                                                                                                                                                                                                                                                                               Seven tears for Apollo
## 2035                                                                                                                                                                                                                                                                  The Venus of Ille and other stories
## 2036                                                                                                                                                                                                                                                                                Adam, where art thou?
## 2037                                                                                                                                                                                                                                                                               The laughing policeman
## 2038                                                                                                                                                                                                                                                                       The novels of Dashiell Hammett
## 2039                                                                                                                                                                                                                                                                                  Carnival confession
## 2040                                                                                                                                                                                                                                                                                            Gargoyles
## 2041                                                                                                                                                                                                                              Fenland chronicle: recollections of William Henry and Kate Mary Edwards
## 2042                                                                                                                                                                                                                                                                              The master of Hestviken
## 2043                                                                                                                                                                                                                                                                                       Horrible tango
## 2044                                                                                                                                                                                                                                                   Night and silence, who is here? an American comedy
## 2045                                                                                                                                                                                                                                                                             The undiscovered country
## 2046                                                                                                                                                                                                                                                                                      Turkish delight
## 2047                                                                                                                                                                                                                                                                                    The king must die
## 2048                                                                                                                                                                                                                                                                                      The ambassadors
## 2049                                                                                                                                                                                                                                                                                            Treblinka
## 2050                                                                                                                                                                                                                                    Strange things happen here : twenty-six short stories and a novel
## 2051                                                                                                                                                                                                                                           Autobiography of Maxim Gorky [Book three]: My universities
## 2052                                                                                                                                                                                                                                                                                       The Artamonovs
## 2053                                                                                                                                                                                                                                                                                        Foma Gordeyev
## 2054                                                                                                                                                                                                                                                             The kiss and The duel, and other stories
## 2055                                                                                                                                                                                                                                                                       The darling, and other stories
## 2056                                                                                                                                                                                                                                                                                         Select tales
## 2057                                                                                                                                                                                                                                                         The Odyssey of Homer done into English prose
## 2058                                                                                                                                                                                                                                                                                   The Oxford Chekhov
## 2059                                                                                                                                                                                                                                                                                 Fathers and children
## 2060                                                                                                                                                                                                                                                                                  On the eve; a novel
## 2061                                                                                                                                                                                                                                                                  True history, and Lucius or the ass
## 2062                                                                                                                                                                                                                                                                                    Surgery and crime
## 2063                                                                                                                                                                                                                                                                     The wanderer (Le grand Meaulnes)
## 2064                                                                                                                                                                                                                                                                          Pamela; or, Virtue rewarded
## 2065                                                                                                                                                                                                                                                                                         A wild thing
## 2066                                                                                                                                                                                                                                                                                   The guide; a novel
## 2067                                                                                                                                                                                                                                                                                   Pinktoes : a novel
## 2068                                                                                                                                                                                                                                                                  Land without thunder; short stories
## 2069                                                                                                                                                                                                                                                                                        A happy death
## 2070                                                                                                                                                                                                                                                                               The Princess of Clèves
## 2071                                                                                                                                                                                                                                                            Where the jackals howl, and other stories
## 2072                                                                                                                                                                                                                                                                                     Laugh a defiance
## 2073                                                                                                                                                                                                                                                                            The time of Adam; stories
## 2074                                                                                                                                                                                                                                                                                             The hack
## 2075                                                                                                                                                                                                                                                                                             Carnival
## 2076                                                                                                                                                                                                                                                                                      The forever war
## 2077                                                                                                                                                                                                                                                                                     Threepenny novel
## 2078                                                                                                                                                                                                                                The fifth queen: The fifth queen, Privy seal, The fifth queen crowned
## 2079                                                                                                                                                                                                                                                                                        : Some do not
## 2080                                                                                                                                                                                                                                                                                           Once a spy
## 2081                                                                                                                                                                                                                                                                                   North to yesterday
## 2082                                                                                                                                                                                                                                                       The sixth column; a singular tale of our times
## 2083                                                                                                                                                                                                                                                                                  The fortune tellers
## 2084                                                                                                                                                                                                                                                                                            The beast
## 2085                                                                                                                                                                                                                                                                             An Artist and a magician
## 2086                                                                                                                                                                                                                                                                            The noble enemy : a novel
## 2087                                                                                                                                                                                                                                                                                 Owls do cry, a novel
## 2088                                                                                                                                                                                                                                                                  The reservoir, stories and sketches
## 2089                                                                                                                                                                                                                                                               Snowman, snowman, fables and fantasies
## 2090                                                                                                                                                                                                                                        Memoirs of a Victorian gentleman, William Makepeace Thackeray
## 2091                                                                                                                                                                                                                                                                                The day of the jackal
## 2092                                                                                                                                                                                                                                                        Jim Mundy : a novel of the American Civil War
## 2093                                                                                                                                                                                                                                                                                         The corridor
## 2094                                                                                                                                                                                                                                                                                        The castaways
## 2095                                                                                                                                                                                                                                                                              Tree of dark reflection
## 2096                                                                                                                                                                                                                                                                                           The Jesuit
## 2097                                                                                                                                                                                                                                                                 The art of living, and other stories
## 2098                                                                                                                                                                                                                                                                                              Jocelyn
## 2099                                                                                                                                                                                                                                                                              The Nostradamus traitor
## 2100                                                                                                                                                                                                                                                                              The wreckage of Agathon
## 2101                                                                                                                                                                                                                                                                                       The family man
## 2102                                                                                                                                                                                                                                                                                      The shadow line
## 2103                                                                                                                                                                                                                                                                                  Hold back the night
## 2104                                                                                                                                                                                                                                                                                           City block
## 2105                                                                                                                                                                                                                                                                                   Slaves of the lamp
## 2106                                                                                                                                                                                                                                                                               Road through the woods
## 2107                                                                                                                                                                                                                                                                                     Pandora; a novel
## 2108                                                                                                                                                                                                                                                                                      Pork and others
## 2109                                                                                                                                                                                                                                                                                      The major works
## 2110                                                                                                                                                                                                                                                                                           Valparaiso
## 2111                                                                                                                                                                                                                                                                           A mother's kisses, a novel
## 2112                                                                                                                                                                                                                                                                                Black angels; stories
## 2113                                                                                                                                                                                                                                                                        The legend of Daniel Williams
## 2114                                                                                                                                                                                                                                                                                            The rabbi
## 2115                                                                                                                                                                                                                                      Ambrose's vision : sketches towards the creation of a cathedral
## 2116                                                                                                                                                                                                                                                                           Old Red, and other stories
## 2117                                                                                                                                                                                                                                                                                    Hammett : a novel
## 2118                                                                                                                                                                                                                                                                   The paratrooper of Mechanic Avenue
## 2119                                                                                                                                                                                                                                                               Not for publication, and other stories
## 2120                                                                                                                                                                                                                                                     The soft voice of the serpent, and other stories
## 2121                                                                                                                                                                                                                                                                                     A time for Paris
## 2122                                                                                                                                                                                                                                                                                              The lie
## 2123                                                                                                                                                                                                                                                                              A game of hide-and-seek
## 2124                                                                                                                                                                                                                                                                                     Ulterior motives
## 2125                                                                                                                                                                                                                                                                                     The finished man
## 2126                                                                                                                                                                                                                                                                                  Murgatreud's empire
## 2127                                                                                                                                                                                                                                                                                           The heyday
## 2128                                                                                                                                                                                                                                                                                      A net for Venus
## 2129                                                                                                                                                                                                                                                                Death in Don Mills : a murder mystery
## 2130                                                                                                                                                                                                                                                                                 Cabbagetown; a novel
## 2131                                                                                                                                                                                                                                                                             The silence on the shore
## 2132                                                                                                                                                                                                                                                                                             Gertrude
## 2133                                                                                                                                                                                                                                                                                     Forbidden colors
## 2134                                                                                                                                                                                                                                                                                      Peter Camenzind
## 2135                                                                                                                                                                                                                                                                        World's end and other stories
## 2136                                                                                                                                                                                                                                                                                     Novels and tales
## 2137                                                                                                                                                                                                                                                             The lively image : 4 myths in literature
## 2138                                                                                                                                                                                                                                                                                   The London embassy
## 2139                                                                                                                                                                                                                                                              The peaceable kingdom; an American saga
## 2140                                                                                                                                                                                                                              Refiner's fire : The life and adventures of Marshall Pearl, a foundling
## 2141                                                                                                                                                                                                                                                                                 Vile bodies; a novel
## 2142                                                                                                                                                                                                                                                                                A house of gentlefolk
## 2143                                                                                                                                                                                                                                                                                   The tanker Derbent
## 2144                                                                                                                                                                                                                                                                                    Medieval romances
## 2145                                                                                                                                                                                                                                                                                    An actor prepares
## 2146                                                                                                                                                                                                                                                                                         The elephant
## 2147                                                                                                                                                                                                                                                                                       Glory; a novel
## 2148                                                                                                                                                                                                                                                   Safe conduct; an autobiography, and other writings
## 2149                                                                                                                                                                                                                                                                                      Inter ice age 4
## 2150                                                                                                                                                                                                                                                                                Nine stories, 1855-63
## 2151                                                                                                                                                                                                                                                                                         The wanderer
## 2152                                                                                                                                                                                                                                                                                               Mutant
## 2153                                                                                                                                                                                  The cosmic carnival of Stanisław Lem : an anthology of entertaining stories by the modern master of science fiction
## 2154                                                                                                                                                                                                                                                                                               Cosmos
## 2155                                                                                                                                                                                                                                                                            Time of parting: a novel;
## 2156                                                                                                                                                                                                                                                                               The captain's daughter
## 2157                                                                                                                                                                                                                                                                                              Oblomov
## 2158                                                                                                                                                                                                                                      One thousand souls. Translated from the Russian by Ivy Litvinov
## 2159                                                                                                                                                                                                                                             The good soldier Švejk and his fortunes in the World War
## 2160                                                                                                                                                                                                                                                                                       Night and hope
## 2161                                                                                                                                                                                                                                                                       A ship named Hope: two novels;
## 2162                                                                                                                                                                                                                                                                                      The walnut door
## 2163                                                                                                                                                                                                                               Definitely maybe : a manuscript discovered under unusual circumstances
## 2164                                                                                                                                                                                                                                                                             The Makepeace experiment
## 2165                                                                                                                                                                                                                                        The life and extraordinary adventures of Private Ivan Chonkin
## 2166                                                                                                                                                                                                                                                                    Anthology of Soviet short stories
## 2167                                                                                                                                                                                                                                                                           Lenin in Zurich : chapters
## 2168                                                                                                                                                                                                                                                                                            Sara Dane
## 2169                                                                                                                                                                                                                                                                    The eagle and the raven : a novel
## 2170                                                                                                                                                                                                                                                                            Autumnal knight : stories
## 2171                                                                                                                                                                                                                                                                                                Works
## 2172                                                                                                                                                                                                                                                                                             Futility
## 2173                                                                                                                                                                                                                                                                     The murder of Aziz Khan: a novel
## 2174                                                                                                                                                                                                                                                                                        Siberian road
## 2175                                                                                                                                                                                                                                                                     Reflections on a mountain summer
## 2176                                                                                                                                                                                                                                                                                    The new ancestors
## 2177                                                                                                                                                                                                                                                                             The lady and the unicorn
## 2178                                                                                                                                                                                                                                                                                The optimist; a novel
## 2179                                                                                                                                                                                                                                                            A schoolmaster with the Blackfeet Indians
## 2180                                                                                                                                                                                                                                                                                       Pincher Martin
## 2181                                                                                                                                                                                                                                                                The man from Greek and Roman, a novel
## 2182                                                                                                                                                                                                                                                                   Five legs ; Communion : two novels
## 2183                                                                                                                                                                                                                                                                             American chrome; a novel
## 2184                                                                                                                                                                                                                                                                          Vanquish the angel, a novel
## 2185                                                                                                                                                                                                                                                                              The rise of Gerry Logan
## 2186                                                                                                                                                                                                                                                               The director's wife, and other stories
## 2187                                                                                                                                                                                                                                                                                            The comic
## 2188                                                                                                                                                                                                                                                                      A bad streak, and other stories
## 2189                                                                                                                                                                                                                                                                           Ashes and petals : a novel
## 2190                                                                                                                                                                                                                                                                                       Ways of loving
## 2191                                                                                                                                                                                                                                                                                             Sunburst
## 2192                                                                                                                                                                                                                                                                              Modern Chinese stories;
## 2193                                                                                                                                                                                                                                                                  Schoolmaster Ni Huan-chih; : [novel
## 2194                                                                                                                                                                                                                                                                                           The Family
## 2195                                                                                                                                                                                                     Let us die fighting : the struggle of the Herero and Nama against German imperialism (1884-1915)
## 2196                                                                                                                                                                                                                                                                                       Tomorrow's Eve
## 2197                                                                                                                                                                                                                                                                     The devil in the flesh: a novel;
## 2198                                                                                                                                                                                                                                                                                  Confessions of Zeno
## 2199                                                                                                                                                                                                                                                                                    The long way home
## 2200                                                                                                                                                                                                                                                                                           Two worlds
## 2201                                                                                                                                                                                                                                                                                      Orbit unlimited
## 2202                                                                                                                                                                                                                                                                            The obscene bird of night
## 2203                                                                                                                                                                                                                                                                                The traitors; a novel
## 2204                                                                                                                                                                                                                                                          The flight of Ikaros; a journey into Greece
## 2205                                                                                                                                                                                                                                                                             If he hollers let him go
## 2206                                                                                                                                                                                                                                                                                        House of gold
## 2207                                                                                                                                                                                                                                                                   The adventures of Huckleberry Finn
## 2208                                                                                                                                                                                                                        The Charlotte Perkins Gilman reader : The yellow wallpaper, and other fiction
## 2209                                                                                                                                                                                                                                                            Death in Venice, and seven other stories;
## 2210                                                                                                                                                                                                                                                                                              Odyssey
## 2211                                                                                                                                                                                                                                                                             Little novels of Sicily;
## 2212                                                                                                                                                                                                                                                                                        A happy death
## 2213                                                                                                                                                                                                                                                                                                Earth
## 2214                                                                                                                                                                                                                                                                                   The sound of waves
## 2215                                                                                                                                                                                                                                                                                             Furioso;
## 2216                                                                                                                                                                                                                                                                                      The Summer book
## 2217                                                                                                                                                                                                                                                   Dangerous acquaintances = Les liaisons dangereuses
## 2218                                                                                                                                                                                                                                                         Four romantic tales from 19th century German
## 2219                                                                                                                                                                                                                                                                                Envy, and other works
## 2220                                                                                                                                                                                                                                                                                     The midnight fox
## 2221                                                                                                                                                                                                                                                                                         Three novels
## 2222                                                                                                                                                                                                                                                                           The goatibex constellation
## 2223                                                                                                                                                                                                                                                                                  Brotherly love [by]
## 2224                                                                                                                                                                                                                                                                                        Tortilla Flat
## 2225                                                                                                                                                                                                                                                                                    Welcome to Xanadu
## 2226                                                                                                                                                                                                                                                                                              Trinity
## 2227                                                                                                                                                                                                                                                                                    After the banquet
## 2228                                                                                                                                                                                                                                                                                      The sinful ones
## 2229                                                                                                                                                                                                                                                                                   A hero of our time
## 2230                                                                                                                                                                                                                                                                                  The blood of others
## 2231                                                                                                                                                                                                                                                                                  Ambiguous adventure
## 2232                                                                                                                                                                                                                                                                             Golden Ophelia : a novel
## 2233                                                                                                                                                                                                                                                                                     Novels and tales
## 2234                                                                                                                                                                                                                                                                                     Reasons of state
## 2235                                                                                                                                                                                                                                                                                          Child Ellen
## 2236                                                                                                                                                                                                                                                                                The bull from the sea
## 2237                                                                                                                                                                                                                                                             The abortion: an historical romance 1966
## 2238                                                                                                                                                                                                                                                                                   A Ulysses too many
## 2239                                                                                                                                                                                                                                                                                         Car; a novel
## 2240                                                                                                                                                                                                                                                                                    Epitaph for a spy
## 2241                                                                                                                                                                                                                                                         The ballroom of romance and other stories. -
## 2242                                                                                                                                                                                                                                                                                     The other woman;
## 2243                                                                                                                                                                                                                                                     The hundred tales (Les cent nouvelles nouvelles)
## 2244                                                                                                                                                                                                                                                                              The gods are not mocked
## 2245                                                                                                                                                                                                                                                      The illusionless man; fantasies and meditations
## 2246                                                                                                                                                                                                                                                         Master and man, and other parables and tales
## 2247                                                                                                                                                                                                                                                                                    Collected stories
## 2248                                                                                                                                                                                                                                                                                         Ancuta's Inn
## 2249                                                                                                                                                                                                                                  Love and war; adventures from the Firuz shāh nāma of Sheikh Bighami
## 2250                                                                                                                                                                                                                                                                               First family : a novel
## 2251                                                                                                                                                                                                                     Chosen pages from Lu Hsun [pseud.] the literary mentor of the Chinese Revolution
## 2252                                                                                                                                                                                                                                                            The people of Seldwyla, and Seven legends
## 2253                                                                                                                                                                                                                                                                                            Lying low
## 2254                                                                                                                                                                                                                                                                                        Coup de Grâce
## 2255                                                                                                                                                                                                                                                                                          The hatchet
## 2256                                                                                                                                                                                                                                                                                       Pilgrim at sea
## 2257                                                                                                                                                                                                                                                                                         The Watsons;
## 2258                                                                                                                                                                                                                                                                                         The survivor
## 2259                                                                                                                                                                                                                                                                                A lantern in her hand
## 2260                                                                                                                                                                                                                                                                                              Warlock
## 2261                                                                                                                                                                                                                                                                                      The golden road
## 2262                                                                                                                                                                                                                                                                             Silicon valley : a novel
## 2263                                                                                                                                                                                                                                                                       Why are we in Vietnam? A novel
## 2264                                                                                                                                                                                                                                                                                     Novels and tales
## 2265                                                                                                                                                                                                                                                                                     Novels and tales
## 2266                                                                                                                                                                                                                                                                                Other people's worlds
## 2267                                                                                                                                                                                                                                                                                  The love department
## 2268                                                                                                                                                                                                                                                                          The film of memory, a novel
## 2269                                                                                                                                                                                                                                                                               A god against the gods
## 2270                                                                                                                                                                                                                                                                     The she-devils (Les diaboliques)
## 2271                                                                                                                                                                                                                                                                The best short stories of John Buchan
## 2272                                                                                                                                                                                                                                                                             The son of the bondwoman
## 2273                                                                                                                                                                                                                                                                   Explosion in a cathedral : a novel
## 2274                                                                                                                                                                                                                                                                                   The devil's agent;
## 2275                                                                                                                                                                                                                                                                           Paradise, & other stories;
## 2276                                                                                                                                                                                                                                                        The empty canvas [by] Alberto Moravia [pseud]
## 2277                                                                                                                                                                                                                                                                                    Chemmeen; a novel
## 2278                                                                                                                                                                                                                          The gates of the forest / $f: translated from the French by Frances Frenaye
## 2279                                                                                                                                                                                                                                                                                            The sibyl
## 2280                                                                                                                                                                                                                                                                               The death of Ahasuerus
## 2281                                                                                                                                                                                                                                                                                  Talks with a devil;
## 2282                                                                                                                                                                                                                                                                         Destination Biafra : a novel
## 2283                                                                                                                                                                                                                                                                          Lokotown, and other stories
## 2284                                                                                                                                                                                                                                                                                        The scavenger
## 2285                                                                                                                                                                                                                                                                         Death is part of the process
## 2286                                                                                                                                                                                                                                                                                 The crucible of time
## 2287                                                                                                                                                                                                                                                                           The complete short stories
## 2288                                                                                                                                                                                                                                                              The railway accident, and other stories
## 2289                                                                                                                                                                                                                                                                              The battle lost and won
## 2290                                                                                                                                                                                                                                                                                   Friends and heroes
## 2291                                                                                                                                                                                                                                                           Love and other stories of Yokomitsu Riichi
## 2292                                                                                                                                                                                                                                                                                       Island priest;
## 2293                                                                                                                                                                                                                                                                The Wandering Jew, and other stories;
## 2294                                                                                                                                                                                                                                              When things of the spirit come first : five early tales
## 2295                                                                                                                                                                                                                                                           Stories of the Chinese People's Volunteers
## 2296                                                                                                                                                                                                                                                                                Children of the frost
## 2297                                                                                                                                                                                                                                                                                                 Miau
## 2298                                                                                                                                                                                                                                            An anthology of Persian prose, from Beihaqui [and others]
## 2299                                                                                                                                                                                                             Gestapu : Indonesian short stories on the abortive Communist coup of 30th September 1965
## 2300                                                                                                                                                                                                                                                                               The proud and the free
## 2301                                                                                                                                                                                                                                                                                  Seven short stories
## 2302                                                                                                                                                                                                                                                     Him with his foot in his mouth and other stories
## 2303                                                                                                                                                                                                                                                                               Cities of the interior
## 2304                                                                                                                                                                                                                                                                                 The tale of Asa Bean
## 2305                                                                                                                                                                                                                                                                             The eyes of the interred
## 2306                                                                                                                                                                                                                                                                          Taking care : short stories
## 2307                                                                                                                                                                                                                                                                                      Lancet, a novel
## 2308                                                                                                                                                                                                                                                                            The loved and the unloved
## 2309                                                                                                                                                                                                                                                                               Woman of the Pharisees
## 2310                                                                                                                                                                                                                                                                 The mountain inn, and other stories;
## 2311                                                                                                                                                                                                                                                                                The twenty-fifth hour
## 2312                                                                                                                                                                                                                                                                                               Verdun
## 2313                                                                                                                                                                                                                                                                   Portrait of a man unknown, a novel
## 2314                                                                                                                                                                                                                                                                                           The hermit
## 2315                                                                                                                                                                                                                                                                                         Face to face
## 2316                                                                                                                                                                                                                                                                                  The joker, a novel;
## 2317                                                                                                                                                                                                                                                    Return to the château, preceded by A girl in love
## 2318                                                                                                                             Tieta, the goat girl : or, The return of the prodigal daughter : melodramatic serial novel in five sensational episodes, with a touching epilogue, thrills and suspense!
## 2319                                                                                                                                                                                                                                                                        A stronger climate; 9 stories
## 2320                                                                                                                                                                                                                                                                                      Operation Chaos
## 2321                                                                                                                                                                                                                                                                                   Toilers of the sea
## 2322                                                                                                                                                                                                                                                                                          A man apart
## 2323                                                                                                                                                                                                                                                                                        Camel Xiangzi
## 2324                                                                                                                                                                                                                                                                         Contemporary Chinese stories
## 2325                                                                                                                                                                                                                                                                              Stories of China at war
## 2326                                                                                                                                                                                                                                                                                    Village in August
## 2327                                                                                                                                                                                                                                                                      No man knows the night; a novel
## 2328                                                                                                                                                                                                                                                                                  Anne Frank's diary;
## 2329                                                                                                                                                                                                                                                                                         Four novels:
## 2330                                                                                                                                                                                                                                                                                  Legends of our time
## 2331                                                                                                                                                                                                                                                                                 The selves of Quinte
## 2332                                                                                                                                                                                                                                                                                        The Decameron
## 2333                                                                                                                                                                                                                                                                                       The Decameron;
## 2334                                                                                                                                                                                                                                                                                   The iron staircase
## 2335                                                                                                                                                                                                                                                                                             The move
## 2336                                                                                                                                                                                                                                                                                                Betty
## 2337                                                                                                                                                                                                                                                                                   Bound to violence;
## 2338                                                                                                                                                                                                                                                                                    On the black hill
## 2339                                                                                                                                                                                                                                                                            Bertolt Brecht, 1921-1946
## 2340                                                                                                                                                                                                                                                                Twenty-thousand leagues under the sea
## 2341                                                                                                                                                                                                                                                                                 Kind are her answers
## 2342                                                                                                                                                                                                                                                                                  A tiger for Malgudi
## 2343                                                                                                                                                                                                                                                                                            Chingling
## 2344                                                                                                                                                                                                                                                                                   The new centurions
## 2345                                                                                                                                                                                                                The necklace of Princess Fiorimonde and other stories; being the complete fairy tales
## 2346                                                                                                                                                                                                                 Cocktails at Somoza's : a reporter's sketchbook of events in revolutionary Nicaragua
## 2347                                                                                                                                                                                                                                                                                Doctor Glas : a novel
## 2348                                                                                                                                                                                                                                                                The smell of bread, and other stories
## 2349                                                                                                                                                                                                                                                                               Stories from the Bible
## 2350                                                                                                                                                                                                                                                                                          The Odyssey
## 2351                                                                                                                                                                                                                                                                                       The immoralist
## 2352                                                                                                                                                                                                                                                                                              Jubilee
## 2353                                                                                                                                                                                                                                                                           Street of riches. Introd.:
## 2354                                                                                                                                                                                                                                                                           Family occasions : a novel
## 2355                                                                                                                                                                                                                                                                                          Running dog
## 2356                                                                                                                                                                                                                                                                      Stories for late night drinkers
## 2357                                                                                                                                                                                                                                                                                       The immoralist
## 2358                                                                                                                                                                                                                                                                                Dreams; short stories
## 2359                                                                                                                                                                                                                                                                                        Man's estate;
## 2360                                                                                                                                                                                                                                                                             The planetarium, a novel
## 2361                                                                                                                                                                                                                                                                                            The names
## 2362                                                                                                                                                                                                                                                                       Four stories by Ingmar Bergman
## 2363                                                                                                                                                                                                                                                                              Money and other stories
## 2364                                                                                                                                                                                                                                                                  Absent without leave : two novellas
## 2365                                                                                                                                                                                                                                                                            Dutch Shea, Jr. : a novel
## 2366                                                                                                                                                                                                                                                           "We never make mistakes"; two short novels
## 2367                                                                                                                                                                                                                                                   The saint : a fictional biography of Thomas Becket
## 2368                                                                                                                                                                                                                                                 Fortunata and Jacinta: two stories of married women;
## 2369                                                                                                                                                                                                                                                                                       Fifth business
## 2370                                                                                                                                                                                                                                                                               The railway guerrillas
## 2371                                                                                                                                                                                                                                                                                     Novels and tales
## 2372                                                                                                                                                                                                                                                                                       Doctor Zhivago
## 2373                                                                                                                                                                                                                                                                  Not of this time, not of this place
## 2374                                                                                                                                                                                                                                                                        Memoirs of a good-for-nothing
## 2375                                                                                                                                                                                                                                                                              The testament : a novel
## 2376                                                                                                                                                                                                                                                                         Count d'Orgel opens the ball
## 2377                                                                                                                                                                                                                                                                    Nervous people, and other satires
## 2378                                                                                                                                                                                                                     Evenings near the village of Dikanka; stories published by bee-keeper Rudi Panko
## 2379                                                                                                                                                                                                                                                                                   The country cousin
## 2380                                                                                                                                                                                                                                               Tales of Melvil's mouser; or, Much ado about libraries
## 2381                                                                                                                                                                                                                                                                            Daddy was a number runner
## 2382                                                                                                                                                                                                                                                                                                 Xala
## 2383                                                                                                                                                                                                                                                                     Mist (Niebla) a tragicomic novel
## 2384                                                                                                                                                                                                                                                God bless you, Mr. Rosewater; or, Pearls before swine
## 2385                                                                                                                                                                                                    The apple in the dark $f: translated from the Portuguese, with an introduction by Gregory Rabassa
## 2386                                                                                                                                                                                                                                                                                          Family ties
## 2387                                                                                                                                                                                                                                                                           Women : or, Pour et contre
## 2388                                                                                                                                                                                                                                                                 The sad geraniums, and other stories
## 2389                                                                                                                                                                                                                                                                               Voices of a summer day
## 2390                                                                                                                                                                                                                                                                                      The cancer ward
## 2391                                                                                                                                                                                                                                                                                       Havoc. Hærværk
## 2392                                                                                                                                                                                                                                                                                   Papa, you're crazy
## 2393                                                                                                                                                                                                                                                                     Bitter herbs; a little chronicle
## 2394                                                                                                                                                                                                                                                                           Tyorkin & the stovemakers;
## 2395                                                                                                                                                                                                                                                                                     Span of the year
## 2396                                                                                                                                                                                                                                                                                         Counterpoint
## 2397                                                                                                                                                                                                                                                                                       I looked right
## 2398                                                                                                                                                                                                                                                De Sade quartet [four stories from Contes et fabliaux
## 2399                                                                                                                                                                                                                                                                                This gentle companion
## 2400                                                                                                                                                                                                                                                                                   Strait is the gate
## 2401                                                                                                                                                                                                                                                                                   Tales of my people
## 2402                                                                                                                                                                                                                                                                                          Cancer ward
## 2403                                                                                                                                                                                                                                                                       The darling, and other stories
## 2404                                                                                                                                                                                                                                                                               Stalking the nightmare
## 2405                                                                                                                                                                                                                                                                Writers in the new Cuba: an anthology
## 2406                                                                                                                                                                                                                                                                                A death in the family
## 2407                                                                                                                                                                                                                                                                                         Pedro Páramo
## 2408                                                                                                                                                                                                                                                                                      Scavenger's son
## 2409                                                                                                                                                                                                                                                                                         Vishakanyaka
## 2410                                                                                                                                                                                                                                                                         The Sunday of life : a novel
## 2411                                                                                                                                                                                                                                                                                 The legacy : a novel
## 2412                                                                                                                                                                                                                                                                                 Lying woman; a novel
## 2413                                                                                                                                                                                                                                                                                    The disappearance
## 2414                                                                                                                                                                                                                                                                               Three weeks in October
## 2415                                                                                                                                                                                                                                                                                    The Cambodia file
## 2416                                                                                                                                                                                                                                                                            The old woman and the cow
## 2417                                                                                                                                                                                                                                                                                                  334
## 2418                                                                                                                                                                                                                                                                                  Rungs of the ladder
## 2419                                                                                                                                                                                                                                                                                       Zero : a novel
## 2420                                                                                                                                                                                                                                                                                         The iron rod
## 2421                                                                                                                                                                                                                                                                                  Aswathama : a novel
## 2422                                                                                                                                                                                                                                                                           In the prison of her skin;
## 2423                                                                                                                                                                                                                                                       God's pauper : St. Francis of Assisi : a novel
## 2424                                                                                                                                                                                                                                              When things of the spirit come first : five early tales
## 2425                                                                                                                                                                                                                                                                                              Stories
## 2426                                                                                                                                                                                                                                                                The locked room; the story of a crime
## 2427                                                                                                                                                                                                                                                                                   The abominable man
## 2428                                                                                                                                                                                                                                    Thinking it over : 30 stories from the German Democratic Republic
## 2429                                                                                                                                                                                                                                                                                    Jealousy; a novel
## 2430                                                                                                                                                                                                                                                                                          The prodigy
## 2431                                                                                                                                                                                                                                     The betrothed, "I Promessi sposi" : a tale of XVII century Milan
## 2432                                                                                                                                                                                                                                                                                            The sibyl
## 2433                                                                                                                                                                                                                                      Pilgrim at sea $f: translated from the Swedish by Naomi Walford
## 2434                                                                                                                                                                                                                                                                              The Tupamaro guerrillas
## 2435                                                                                                                                                                                                                                             The betrothed, (I Promessi sposi); by Alessandro Manzoni
## 2436                                                                                                                                                                                                                                                                                         Schelmuffsky
## 2437                                                                                                                                                                                                                                                                              The journey to the East
## 2438                                                                                                                                                                                                                                                                          Early in the summer of 1970
## 2439                                                                                                                                                                                                                                                                                     The heart-keeper
## 2440                                                                                                                                                                                                                                                                               Three days and a child
## 2441                                                                                                                                                                                                                                                                                            Poor folk
## 2442                                                                                                                                                                                                                                                                 Over by the river, and other stories
## 2443                                                                                                                                                                                                                                The wilderness of ice: part two of The adventures of Captain Hatteras
## 2444                                                                                                                                                                                                                    White nights, and other stories, translated from the Russian by Constance Garnett
## 2445                                                                                                                                                                                                                                                                    Shadowed paths [and other stories
## 2446                                                                                                                                                                                                                                            The banner of the Upright Seven, and Ursula; two novellas
## 2447                                                                                                                                                                                                                                                                      The confessions of Arsène Lupin
## 2448                                                                                                                                                                                                                                                         The cat's pajamas & Witch's milk; two novels
## 2449                                                                                                                                                                                                                                                                                  The neon wilderness
## 2450                                                                                                                                                                                                                                                            A madman's defense; Le plaidoyer d'un fou
## 2451                                                                                                                                                                                                                                                The house of the sleeping beauties and other stories;
## 2452                                                                                                                                                                                                                                                                                     Herod's children
## 2453                                                                                                                                                                                                                                                                             La maison de rendez-vous
## 2454                                                                                                                                                                                                                                                                                      At Lady Molly's
## 2455                                                                                                                                                                                                                                                    The golden casket; Chinese novellas two millennia
## 2456                                                                                                                                                                                                                                                                                         The heritage
## 2457                                                                                                                                                                                                                                                                               The city in the Sahara
## 2458                                                                                                                                                                                                                                                                             Into the Niger bend.--pt
## 2459                                                                                                                                                                                                                                                                                      Young shoulders
## 2460                                                                                                                                                                                                                                                        The magicians; the occult in fact and fiction
## 2461                                                                                                                                                                                                                                                                                              One day
## 2462                                                                                                                                                                                                                                                                        Tambourines to glory; a novel
## 2463                                                                                                                                                                                                                                                                           Peasants and other stories
## 2464                                                                                                                                                                                                                                                                                      Sword at sunset
## 2465                                                                                                                                                                                                                                                                       Secret lives and other stories
## 2466                                                                                                                                                                                                                                                                               More pricks than kicks
## 2467                                                                                                                                                                                                                                                                                                Tales
## 2468                                                                                                                                                                                                                                                                               The world in the attic
## 2469                                                                                                                                                                                                                                                                                     The pool of fire
## 2470                                                                                                                                                                                                                                                                                                 1934
## 2471                                                                                                                                                                                                                                                                                  The face of another
## 2472                                                                                                                                                                                                                                                                           Modern Iraqi short stories
## 2473                                                                                                                                                                                                                                                                                        The inspector
## 2474                                                                                                                                                                                                                                                                                        The Bad Lands
## 2475                                                                                                                                                                                                                                                                              The emigrants, a novel:
## 2476                                                                                                                                                                                                                                                                               The late Mattia Pascal
## 2477                                                                                                                                                                                                                                                                                   Ashes and diamonds
## 2478                                                                                                                                                                                                                                                                                  Requiem for Naʾaman
## 2479                                                                                                                                                                                                                                                                       Stories from a Ming collection
## 2480                                                                                                                                                                                                                                                                                        Short stories
## 2481                                                                                                                                                                                                                                                                                              Tristan
## 2482                                                                                                                                                                                                                          Unto a good land, a novel; translated from the Swedish by Gustaf Lannestock
## 2483                                                                                                                                                                                                                                                                                           The hermit
## 2484                                                                                                                                                                                                                                                                            Sara Videbeck. The chapel
## 2485                                                                                                                                                                                                                                                                   Hearing secret harmonies : a novel
## 2486                                                                                                                                                                                                                                                                                   Best short stories
## 2487                                                                                                                                                                                                                                                                                         The wanderer
## 2488                                                                                                                                                                                                                                                                                       The dark angel
## 2489                                                                                                                                                                                                                                                                          Russian stories and legends
## 2490                                                                                                                                                                                                                                                                           The eighth day of the week
## 2491                                                                                                                                                                                                                                                                                  Next stop--paradise
## 2492                                                                                                                                                                                                                                                                       Kronk; a science fiction novel
## 2493                                                                                                                                                                                                                                                                                The unreasoning heart
## 2494                                                                                                                                                                                                                                                                               The well of loneliness
## 2495                                                                                                                                                                                                                   Nobody : or, The disgospel according to Maria Dementnaya = Nikto : a samizdat text
## 2496                                                                                                                                                                                                                                                                        The walker, and other stories
## 2497                                                                                                                                                                                                                                                                        The acceptance world, a novel
## 2498                                                                                                                                                                                                                                                                                     The change-child
## 2499                                                                                                                                                                                                                                                                   Acquainted with the night; a novel
## 2500                                                                                                                                                                                                                                                                             The city & the mountains
## 2501                                                                                                                                                                                                                                                                                        An alien heat
## 2502                                                                                                                                                                                                                                                           The daughter; the diary of an Israeli girl
## 2503                                                                                                                                                                                                                                                                       Winning a wife & other stories
## 2504                                                                                                                                                                                                                                                                                         What is man?
## 2505                                                                                                                                                                                                                                                                                       The good light
## 2506                                                                                                                                                                                                                                                 The early science fiction stories of Thomas M. Disch
## 2507                                                                                                                                                                                                                                                                           Children are civilians too
## 2508                                                                                                                                                                                                                                                                                       The snow queen
## 2509                                                                                                                                                                                                                                                                      Short novels and other writings
## 2510                                                                                                                                                                                                                                                                                            Two women
## 2511                                                                                                                                                                                                                                                                                     Asahel : a novel
## 2512                                                                                                                                                                                                                                               The mountain inn, and other stories; a new translation
## 2513                                                                                                                                                                                                                                                                                          Effi Briest
## 2514                                                                                                                                                                                                                                                              Marcovaldo, or, The seasons in the city
## 2515                                                                                                                                                                                                                                                                         The Garies and their friends
## 2516                                                                                                                                                                                                                                                                                       Madame Bovary;
## 2517                                                                                                                                                                                                                                                                                 Crime and punishment
## 2518                                                                                                                                                                                                                                                                                       Tribal justice
## 2519                                                                                                                                                                                                                                     From Camelot to Joyous Guard. The Old French La Mort le roi Artu
## 2520                                                                                                                                                                                                                                                                       The last letter home : a novel
## 2521                                                                                                                                                                                                                                                                                          The omnibus
## 2522                                                                                                                                                                                                                                                                 All men are brothers (Shui hu chuan)
## 2523                                                                                                                                                                                                                                                                                           I am a cat
## 2524                                                                                                                                                                                                                                                                  The Chaneysville incident : a novel
## 2525                                                                                                                                                                                                                                                                                       Italian fables
## 2526                                                                                                                                                                                                                                                     Slaves of love and other Norwegian short stories
## 2527                                                                                                                                                                                                                                                               Complete short stories & Three fat men
## 2528                                                                                                                                                                                                                                                                                 A glass of blessings
## 2529                                                                                                                                                                                                                                                                           The disappearance of Odile
## 2530                                                                                                                                                                                                                                                                                      The neighbours;
## 2531                                                                                                                                                                                                                                                                                 The bells of Bicêtre
## 2532                                                                                                                                                                                                                                                                                   Five times Maigret
## 2533                                                                                                                                                                                                                                                                         The house of Quai Notre Dame
## 2534                                                                                                                                                                                                                                                                                           The abyss;
## 2535                                                                                                                                                                                                                                                                                        Jenny Treibel
## 2536                                                                                                                                                                                                                                                                                          The prodigy
## 2537                                                                                                                                                                                                                                                        SS-GB : Nazi-occupied Britain, 1941 : a novel
## 2538                                                                                                                                                                                                                                                                                         South Street
## 2539                                                                                                                                                                                                                                                                                           The family
## 2540                                                                                                                                                                                                                                                                           A sort of introduction. bk
## 2541                                                                                                                                                                                                                                                              A portrait of the artist as a young man
## 2542                                                                                                                                                                                                                                                                                               Vijaya
## 2543                                                                                                                                                                                                                                                                         Chandranath (Queen's gambit)
## 2544                                                                                                                                                                                                                                                                     The real life of Domingos Xavier
## 2545                                                                                                                                                                                                                                                                                    King rat, a novel
## 2546                                                                                                                                                                                                                                   Clotelle; or, The colored heroine, : a tale of the Southern States
## 2547                                                                                                                                                                                                    Dearest Father; stories and other writings / $f: Translated by Ernst Kaiser and Eithne Wilkins. -
## 2548                                                                                                                                                                                                                                                                             The keepers of the house
## 2549                                                                                                                                                                                                                                                                       The last convertible : a novel
## 2550                                                                                                                                                                                                                                                                              Wright Morris: a reader
## 2551                                                                                                                                                                                                                                                                                  Journey without end
## 2552                                                                                                                                                                                                                                                                                  The burned bramble;
## 2553                                                                                                                                                                                                                                                                       Sketches from a hunter's album
## 2554                                                                                                                                                                                                                                                      Memory and agony : Dutch stories from Indonesia
## 2555                                                                                                                                                                                                                                                                            The loved and the unloved
## 2556                                                                                                                                                                                 Midland; twenty-five years of fiction and poetry selected from the writing workshops of the State University of Iowa
## 2557                                                                                                                                                                                                                                                                                       Voss : a novel
## 2558                                                                                                                                                                                                                                                                          A people betrayed : a novel
## 2559                                                                                                                                                                                                                                                                                             Babel-17
## 2560                                                                                                                                                                                                                                                                                             The lake
## 2561                                                                                                                                                                                                                                                                               The eagle of the Ninth
## 2562                                                                                                                                                                                                                                                                                 The cosmological eye
## 2563                                                                                                                                                                                                                                                                                        Days of hope;
## 2564                                                                                                                                                                                                                                  Description of a struggle / $f: translated by Tania and James Stern
## 2565                                                                                                                                                                                                                                                                                                 Ruth
## 2566                                                                                                                                                                                                                                                                                      The face of war
## 2567                                                                                                                                                                                                                                                                 Insatiability : a novel in two parts
## 2568                                                                                                                                                                                                                                The unknown Chekhov: stories and other writings hitherto untranslated
## 2569                                                                                                                                                                                                                                                                                    Novels, 1871-1880
## 2570                                                                                                                                                                                                                                                                                  Bunter's last fling
## 2571                                                                                                                                                                                                                                                                    The man who gave the Beatles away
## 2572                                                                                                                                                                                                                                                  The Chinese gold murders; a Chinese detective story
## 2573                                                                                                                                                                                                                                                                                   A strange marriage
## 2574                                                                                                                                                                                                                                                                                       Remember Ruben
## 2575                                                                                                                                                                                                                                                                                The winds of Darkover
## 2576                                                                                                                                                                                                                                                                                             The Liar
## 2577                                                                                                                                                                                                                                                                           Against the wind : stories
## 2578                                                                                                                                                                                                                                                                         Rashomon, and other stories;
## 2579                                                                                                                                                                                                                                                                                       The compromise
## 2580                                                                                                                                                                                                                                                                              Maigret right and wrong
## 2581                                                                                                                                                                                                                                                                          The quilt and other stories
## 2582                                                                                                                                                                                                                                                                                 Affairs of the heart
## 2583                                                                                                                                                                                               Tales from the Arab tribes; a collection of the stories told by the Arab tribes of the lower Euphrates
## 2584                                                                                                                                                                                                                                                                              The ten thousand things
## 2585                                                                                                                                                                                                                                                                The vizier's elephant; three novellas
## 2586                                                                                                                                                                                                                                                                                   The Maltese falcon
## 2587                                                                                                                                                                                                                                                                                          Malone dies
## 2588                                                                                                                                                                                                                                                       The emperor's pearl, a Chinese detective story
## 2589                                                                                                                                                                                                                                                                                 The three musketeers
## 2590                                                                                                                                                                                                                                                                                   The Oxford Chekhov
## 2591                                                                                                                                                                                                                                                                                   The Oxford Chekhov
## 2592                                                                                                                                                                                                                                                                                   The Chinese bandit
## 2593                                                                                                                                                                                                                                                                                       Bread and wine
## 2594                                                                                                                                                                                                                                                                                    49 days : a novel
## 2595                                                                                                                                                                                                                                                                           The kiss and other stories
## 2596                                                                                                                                                                                                                                                                             The three-cornered world
## 2597                                                                                                                                                                                                                                                                                    Jealousy, a novel
## 2598                                                                                                                                                                                                                                                                                   Beauty and sadness
## 2599                                                                                                                                                                                                                                                                                    Chemmeen; a novel
## 2600                                                                                                                                                                                                                                                                                     Lucky Kristoffer
## 2601                                                                                                                                                                                                                                                                                     Roll, Shenandoah
## 2602                                                                                                                                                                                                                                                                                   The Mezentian Gate
## 2603                                                                                                                                                                                                                                                                                   The tennis players
## 2604                                                                                                                                                                                                                                                                                      The inquisitors
## 2605                                                                                                                                                                                                                                                                                   Ashes and diamonds
## 2606                                                                                                                                                                                                                                                                                   Gods of riverworld
## 2607                                                                                                                                                                                                                                                 Different : an anthology of homosexual short stories
## 2608                                                                                                                                                                                                                                                                                 The greatest gamble;
## 2609                                                                                                                                                                                                                                                                                     The time masters
## 2610                                                                                                                                                                                                                                                                                             The earl
## 2611                                                                                                                                                                                                                                                                  The origin of the Brunists: a novel
## 2612                                                                                                                                                                                                                                                                                        The dynamiter
## 2613                                                                                                                                                                                                                                                                         The broken nest; (Nashtanir)
## 2614                                                                                                                                                                                                                                                                            Levitation, five fictions
## 2615                                                                                                                                                                                                                                                                                      The stone cross
## 2616                                                                                                                                                                                                                                                                     The Romance of Tristan and Isolt
## 2617                                                                                                                                                                                                                                                                                     Life in the tomb
## 2618                                                                                                                                                                                                                                                             The death of the novel and other stories
## 2619                                                                                                                                                                                                                                                                                        The satyricon
## 2620                                                                                                                                                                                                                                                                        I want to live; short stories
## 2621                                                                                                                                                                                                                                                                    The thirteenth labour of Hercules
## 2622                                                                                                                                                                                                                                                                                  Agatha Moudio's son
## 2623                                                                                                                                                                                                                                                                                       The conquerors
## 2624                                                                                                                                                                                                                                                                          God is not a fish inspector
## 2625                                                                                                                                                                                                                                                                        Alexander the Great : a novel
## 2626                                                                                                                                                                                                                                                                                     The black marble
## 2627                                                                                                                                                                                                                                                                                      Kalki : a novel
## 2628                                                                                                                                                                                                                                                                               The brothers Karamazov
## 2629                                                                                                                                                                                                                                                                                          Juniper Loa
## 2630                                                                                                                                                                                                                                                                                     The violent land
## 2631                                                                                                                                                                                                                                           The secret history of the Lord of Musashi ; and, Arrowroot
## 2632                                                                                                                                                                                                                                                                                  The shattered chain
## 2633                                                                                                                                                                                                                            Twice twenty-two: The golden apples of the sun. A medicine for melancholy
## 2634                                                                                                                                                                                                                                                                        Maigret and the wine merchant
## 2635                                                                                                                                                                                                                                                                                    Secret rendezvous
## 2636                                                                                                                                                                                                                                                                                      Dear fatherland
## 2637                                                                                                                                                                                                          Barabbas; translated by Alan Blair, with a pref. by Lucien Maury and a letter by André Gide
## 2638                                                                                                                                                                                                                                             Finding the center; narrative poetry of the Zuñi Indians
## 2639                                                                                                                                                                                                                                                                                         Two captains
## 2640                                                                                                                                                                                                                                                 Molloy; Malone dies and The unnamable : three novels
## 2641                                                                                                                                                                                                                                                                                 The seizure of power
## 2642                                                                                                                                                                                                                                                                                   L'abbé C : a novel
## 2643                                                                                                                                                                                                                                                                            One day in the "New Life"
## 2644                                                                                                                                                                                                                                                                Perpetua and the habit of unhappiness
## 2645                                                                                                                                                                                                                                                                               Meek heritage; a novel
## 2646                                                                                                                                                                                                                                                                                   Hymn of the spirit
## 2647                                                                                                                                                                                                                                                                              The son of mad Mat Lela
## 2648                                                                                                                                                                                                                                                                  The man in the gray flannel suit II
## 2649                                                                                                                                                                                                                                                                          No refuge : science-fiction
## 2650                                                                                                                                                                                                                                                                                           Hal Porter
## 2651                                                                                                                                                                                                                                                                                     Kavanagh; a tale
## 2652                                                                                                                                                                                                                                                              Tell me, Bella: a selection of stories;
## 2653                                                                                                                                                                                                                                                                                           Affliction
## 2654                                                                                                                                                                                                                                                           The Caine mutiny : a novel of World War II
## 2655                                                                                                                                                                                                                                                                               The dramaturges of Yan
## 2656                                                                                                                                                                                                                                                                                 Three mint lollipops
## 2657                                                                                                                                                                                                                                      No time for tombstones; life and death in the Vietnamese jungle
## 2658                                                                                                                                                                                                                                                                                       A simple story
## 2659                                                                                                                                                                                                                                                                A shameful revenge, and other stories
## 2660                                                                                                                                                                                                                                                                                      Road to nowhere
## 2661                                                                                                                                                                                                                                                                                         Five seasons
## 2662                                                                                                                                                                                                                                                                                     Women of Messina
## 2663                                                                                                                                                                                                                                                                               Five thousand runaways
## 2664                                                                                                                                                                                                                                                                                       The silent cry
## 2665                                                                                                                                                                                                                                                                                  Maigret and the bum
## 2666                                                                                                                                                                                                                                                                                     Selected stories
## 2667                                                                                                                                                                                                                                                                                   The happy warriors
## 2668                                                                                                                                                                                                                                                                                         São Bernardo
## 2669                                                                                                                                                                                                                                                                                           Belchamber
## 2670                                                                                                                                                                                                                                                                        The last temptation of Christ
## 2671                                                                                                                                                                                                                                                                                      Paris interlude
## 2672                                                                                                                                                                                                                                                                                     The beast in man
## 2673                                                                                                                                                                                                                                                                                            The dwarf
## 2674                                                                                                                                                                                                                                                                              Wings; prose and poetry
## 2675                                                                                                                                                                                                                                                                                   Darkness in summer
## 2676                                                                                                                                                                                                                                                                      Across Paris, and other stories
## 2677                                                                                                                                                                                                                                                           God's world; an anthology of short stories
## 2678                                                                                                                                                                                                                   Two Spanish picaresque novels: Lazarillo de Tormes, anon; The swindler (El buscón)
## 2679                                                                                                                                                                                                                                                                                  God bless the child
## 2680                                                                                                                                                                                                                                                                                         I, Lars Hård
## 2681                                                                                                                                                                                                                                                                                            Nostromo;
## 2682                                                                                                                                                                                                                                                                                             Free air
## 2683                                                                                                                                                                                                                                                                 The sky above hell and other stories
## 2684                                                                                                                                                                                                                                                                                          Plague ship
## 2685                                                                                                                                                                                Typee : a peep at Polynesian life ; Omoo : a narrative of adventures in the South Seas ; Mardi : and a voyage thither
## 2686                                                                                                                                                                                                                                                                       Round the world in eighty days
## 2687                                                                                                                                                                                                                                                                                             The mute
## 2688                                                                                                                                                                                                                                                                                         Queen's play
## 2689                                                                                                                                                                                                                                                                                   Such is my beloved
## 2690                                                                                                                                                                                                                                                                   A fine and private place : a novel
## 2691                                                                                                                                                                                                                                                                                          World's end
## 2692                                                                                                                                                                                                                                                                              The admiral's wolf pack
## 2693                                                                                                                                                                                                                                                                          Live bait and other stories
## 2694                                                                                                                                                                                                                                                                                         Conjure wife
## 2695                                                                                                                                                                                                                                                                             The guinea pigs; a novel
## 2696                                                                                                                                                                                                                                                                                  Claudine at school;
## 2697                                                                                                                                                                                                                                                                                        Short stories
## 2698                                                                                                                                                                                                                                                                  Lyonesse : book I, Suldrun's garden
## 2699                                                                                                                                                                                                                                                                                     Game in diamonds
## 2700                                                                                                                                                                                                                                                                  Autumn in spring, and other stories
## 2701                                                                                                                                                                                                                                                                                  Flowers of darkness
## 2702                                                                                                                                                                                                                                                             Night flights : stories new and selected
## 2703                                                                                                                                                                                                                                                                               No harvest but a thorn
## 2704                                                                                                                                                                                                                                                        The woman who could not read, and other tales
## 2705                                                                                                                                                                                                                                                                          Hardwater country : stories
## 2706                                                                                                                                                                                                                                                                   Somerset dreams and other fictions
## 2707                                                                                                                                                                                                                                                   Daredevils of Sassoun : the Armenian national epic
## 2708                                                                                                                                                                                                                                                                                                Earth
## 2709                                                                                                                                                                                                                                                                                          Poor George
## 2710                                                                                                                                                                                                                                                                                   The heart of a man
## 2711                                                                                                                                                                                                                                                                                           The others
## 2712                                                                                                                                                                                                                                                                 Maigret and the man on the boulevard
## 2713                                                                                                                                                                                                                                                                                          Aunt Jeanne
## 2714                                                                                                                                                                                                                                                                                       Take these men
## 2715                                                                                                                                                                                                                                                                                      Petals of blood
## 2716                                                                                                                                                                                                                                                                             The return of Lady Brace
## 2717                                                                                                                                                                                                                                                                Fingers in the door and other stories
## 2718                                                                                                                                                                                                                                                                          A stranger came to the farm
## 2719                                                                                                                                                                                                                                                                                 Weights and measures
## 2720                                                                                                                                                                                                                                                                                           Correction
## 2721                                                                                                                                                                                                                                                                    Clinton Street, and other stories
## 2722                                                                                                                                                                                                                                                                                         The parasite
## 2723                                                                                                                                                                                                                                                                                             The ogre
## 2724                                                                                                                                                                                                                                                                                  The snow was black;
## 2725                                                                                                                                                                                                                                       The clans of darkness: Scottish stories of fantasy and horror;
## 2726                                                                                                                                                                                                                                                                                    What did it mean?
## 2727                                                                                                                                                                                                                                                                                      A double affair
## 2728                                                                                                                                                                                                                                                                                      Peter the First
## 2729                                                                                                                                                                                                                                                                                Russian comic fiction
## 2730                                                                                                                                                                                                                                                                            A certain smile : a novel
## 2731                                                                                                                                                                                                                                                           The grass widow : a Father Dowling mystery
## 2732                                                                                                                                                                                                                                 The school for wives. Robert. Geneiève, or The unfinished confidence
## 2733                                                                                                                                                                                                                                                                                Welcome to Hard Times
## 2734                                                                                                                                                                                                                                                                            The dark room of Damocles
## 2735                                                                                                                                                                                                                                                            The Vatican cellars. Les caves du Vatican
## 2736                                                                                                                                                                                                                                                                                   The cart : a novel
## 2737                                                                                                                                                                                                                                                                                        Universe 3. -
## 2738                                                                                                                                                                                                                                                                                         Superluminal
## 2739                                                                                                                                                                                                                                                                                     The draft dodger
## 2740                                                                                                                                                                                                                                                                               Inside black Hollywood
## 2741                                                                                                                                                                                                                                                                                    Destination, void
## 2742                                                                                                                                                                                                                                                     The figure on the boundary line : selected prose
## 2743                                                                                                                                                                                                                                                                                      Time after time
## 2744                                                                                                                                                                                                                                                                         In constant flight : stories
## 2745                                                                                                                                                                                                                                                                                      One day of life
## 2746                                                                                                                                                                                                                                                                                          Swann's way
## 2747                                                                                                                                                                                                                                                               One day in the life of Ivan Denisovich
## 2748                                                                                                                                                                                                                                                                                     Human landscapes
## 2749                                                                                                                                                                                                                                                                                   Von Ryan's Express
## 2750                                                                                                                                                                                                                                                           Vietnamese women in society and revolution
## 2751                                                                                                                                                                                                                                                                                       The rising sun
## 2752                                                                                                                                                                                                                                                                           The legacy & other stories
## 2753                                                                                                                                                                                                                                                                                                Zazie
## 2754                                                                                                                                                                                                                                                                  Alive and dead in Indiana : stories
## 2755                                                                                                                                                                                                                                                                      Something wicked this way comes
## 2756                                                                                                                                                                                                                                                       The Stone of truth, and other Irish folk tales
## 2757                                                                                                                                                                                                                                                                             Riceyman steps : a novel
## 2758                                                                                                                                                                                                                                                                                             Corduroy
## 2759                                                                                                                                                                                                                                                                                         Tempest-tost
## 2760                                                                                                                                                                                                                                                                                      Tirant lo Blanc
## 2761                                                                                                                                                                                                                                                                                    The great fortune
## 2762                                                                                                                                                                                                                                                              His monkey wife, or, Married to a chimp
## 2763                                                                                                                                                                                                                                                                                The spoils of Poynton
## 2764                                                                                                                                                                                                                                                                        The Macdermots of Ballycloran
## 2765                                                                                                                                                                                                                                                      Selected short stories of Isaac Bashevis Singer
## 2766                                                                                                                                                                                                                                                                                    A hall of mirrors
## 2767                                                                                                                                                                                                                                                                                         In the storm
## 2768                                                                                                                                                                                                                                                                        Two winters and three summers
## 2769                                                                                                                                                                                                                                                                                The tree of knowledge
## 2770                                                                                                                                                                                                                                                                                           The family
## 2771                                                                                                                                                                                                                                    In the long run we are all dead : a macroeconomics murder mystery
## 2772                                                                                                                                                                                                                                                                           The weather in the streets
## 2773                                                                                                                                                                                                                                                                                          Roman tales
## 2774                                                                                                                                                                                                                                                                                          Dead souls;
## 2775                                                                                                                                                                                                                                                                                        Hunter's horn
## 2776                                                                                                                                                                                                                                                                                   The twilight years
## 2777                                                                                                                                                                                                                                         Letters from the underworld. The gentle maiden. The landlady
## 2778                                                                                                                                                                                                                                                                                     Decline and fall
## 2779                                                                                                                                                                                             The Iliad and the Odyssey : the heroic story of the Trojan War [and] the fabulous adventures of Odysseus
## 2780                                                                                                                                                                                                                                                                               Hannibal and the bears
## 2781                                                                                                                                                                                                                                                             The long ships; a saga of the Viking age
## 2782                                                                                                                                                                                                                                         Among women only. Translated from the Italian by D. D. Paige
## 2783                                                                                                                                                                                                                                                                                    The black obelisk
## 2784                                                                                                                                                                                                                                                                                              Inferno
## 2785                                                                                                                                                                                                                                                                             Maigret's boyhood friend
## 2786                                                                                                                                                                                                                                                                                   A soldier's legacy
## 2787                                                                                                                                                                                                                                                                                       The book class
## 2788                                                                                                                                                                                                                                                                                   Carpenter's gothic
## 2789                                                                                                                                                                                                                                                                                           Blind love
## 2790                                                                                                                                                                                                                                                                        The Iowa Baseball Confederacy
## 2791                                                                                                                                                                                                                                                                                  All we need of hell
## 2792                                                                                                                                                                                                                                                                                  The blue flame-tree
## 2793                                                                                                                                                                                                                                                                                      The ring master
## 2794                                                                                                                                                                                                                                                                                 Last notes from home
## 2795                                                                                                                                                                                                                                                         Wandering in the garden, waking from a dream
## 2796                                                                                                                                                                                                                                                                           A place on Earth : a novel
## 2797                                                                                                                                                                                                                                                                             Myself, Christopher Wren
## 2798                                                                                                                                                                                                                                                                       The white birch-tree : a novel
## 2799                                                                                                                                                                                                                                                                                     The bushtrackers
## 2800                                                                                                                                                                                                                                                  Ventures into the deep : the thrill of scuba diving
## 2801                                                                                                                                                                                                                                                                            In the time of Greenbloom
## 2802                                                                                                                                                                                                                                                                                               Mulata
## 2803                                                                                                                                                                                                                                                                                         The Unicorn;
## 2804                                                                                                                                                                                                                                    The burn : a novel in three books : late sixties, early seventies
## 2805                                                                                                                                                                                                                                                                                          Other women
## 2806                                                                                                                                                                                                                                                                                          Spring snow
## 2807                                                                                                                                                                                                                                                                                Bouvard and Pecuchet;
## 2808                                                                                                                                                                                                                                                                              Birthplace of the winds
## 2809                                                                                                                                                                                                                                                                                            Decadence
## 2810                                                                                                                                                                                                                             The ingenious gentleman Don Quixote de la Mancha : complete in two parts
## 2811                                                                                                                                                                                                                                                                          The stories of John Cheever
## 2812                                                                                                                                                                                                                                                                             Tonka, and other stories
## 2813                                                                                                                                                                                                                                                                           The soldier's art: a novel
## 2814                                                                                                                                                                                                                                                                                 Six days in Marapore
## 2815                                                                                                                                                                                                                                                                              The power and the glory
## 2816                                                                                                                                                                                                    That summer in Paris; memories of tangled friendships with Hemingway, Fitzgerald, and some others
## 2817                                                                                                                                                                                                                                                                              The fifth son : a novel
## 2818                                                                                                                                                                                                                                                                                      The Raj quartet
## 2819                                                                                                                                                                                                                                                                         King, queen, knave : a novel
## 2820                                                                                                                                                                                                                                                                   Selected works of Lu Hsun [pseud.]
## 2821                                                                                                                                                                                                                                                                                          The assault
## 2822                                                                                                                                                                                                                                                                             Family dancing : stories
## 2823                                                                                                                                                                                                                                                                        The riding mistress : a novel
## 2824                                                                                                                                                                                                                                                                         The Twyborn affair : a novel
## 2825                                                                                                                                                                                                                                                            The celestial railroad, and other stories
## 2826                                                                                                                                                                                                                                                                              Stories and prose poems
## 2827                                                                                                                                                                                                                                                The wine of eternity : short stories from the Latvian
## 2828                                                                                                                                                                                                                                                                                            Solitudes
## 2829                                                                                                                                                                                                                                                                                     The trial begins
## 2830                                                                                                                                                                                                                                            The call-girls: a tragi-comedy with prologue and epilogue
## 2831                                                                                                                                                                                                                                                                          The view from Pompey's Head
## 2832                                                                                                                                                                                                                                                                             Gerald's party : a novel
## 2833                                                                                                                                                                                                                                                                                    The Flanders road
## 2834                                                                                                                                                                                                                                                                               The curate's awakening
## 2835                                                                                                                                                                                                                                                In the city was a garden; a housing project chronicle
## 2836                                                                                                                                                                                                                                                                                         Childhood /]
## 2837                                                                                                                                                                                                                                                                   A cadre school life : six chapters
## 2838                                                                                                                                                                                                                                                                                     Novels and tales
## 2839                                                                                                                                                                                                                                                                Told in confidence, and other stories
## 2840                                                                                                                                                                                                                                                                                       Conquered city
## 2841                                                                                                                                                                                                                                                                                A winter in the hills
## 2842                                                                                                                                                                                                     St. Petersburg / $f: translated with an introduction by John Cournos ; foreword by George Reavey
## 2843                                                                                                                                                                                                                                                                                          Tengu child
## 2844                                                                                                                                                                                                                                                                                         The bridges;
## 2845                                                                                                                                                                                                                                                      "The factory ship" and "The absentee landlord."
## 2846                                                                                                                                                                                                                                                                                                 Ruan
## 2847                                                                                                                                                                                                                                                                                   Asimov's mysteries
## 2848                                                                                                                                                                                                                                                                                             Brothers
## 2849                                                                                                                                                                                                                                                                   Snowball berry red & other stories
## 2850                                                                                                                                                                                                                                                                                             Chapayev
## 2851                                                                                                                                                                                                                                                                                     Novels and tales
## 2852                                                                                                                                                                                                                                                     The Begum's fortune. [Translated from the French
## 2853                                                                                                                                                                                                                                                                                                   We
## 2854                                                                                                                                                                                                                                                                          A country doctor's notebook
## 2855                                                                                                                                                                                                                                                                       St. Urbain's horseman; a novel
## 2856                                                                                                                                                                                                                                                                                       Rogue in space
## 2857                                                                                                                                                                                                                                                                                       Beware of pity
## 2858                                                                                                                                                                                                                                                         Lord Arthur Savile's crime and other stories
## 2859                                                                                                                                                                                                                                                                               The death of the heart
## 2860                                                                                                                                                                                                                                                              The narrative works of Hartmann von Aue
## 2861                                                                                                                                                                                                                                                             In a far distant land : selected stories
## 2862                                                                                                                                                                                                                                                                                          Effi Briest
## 2863                                                                                                                                                                                                                                                                                The thing at the door
## 2864                                                                                                                                                                                                                                                                          View of dawn in the tropics
## 2865                                                                                                                                                                                                                                                                                 As a man grows older
## 2866                                                                                                                                                                                                                                                                  The little comedy and other stories
## 2867                                                                                                                                                                                                                                                                                        Little novels
## 2868                                                                                                                                                                                                                                                                       Tribal scars and other stories
## 2869                                                                                                                                                                                                                                                                               A country such as this
## 2870                                                                                                                                                                                                                          "Me grandad 'ad an elephant!" : three stories of Muslim life in South India
## 2871                                                                                                                                                                                                                                                                                        Bosnian story
## 2872                                                                                                                                                                                                                                                                                           That voice
## 2873                                                                                                                                                                                                                                                                            The tree of man : a novel
## 2874                                                                                                                                                                                                                                                                                  War of the wing-men
## 2875                                                                                                                                                                                                                                                                                   Voices ; The walls
## 2876                                                                                                                                                                                                                                                                       A beggar in Jerusalem, a novel
## 2877                                                                                                                                                                                                                     The Ruodlieb : the first medieval epic of chivalry from eleventh-century Germany
## 2878                                                                                                                                                                                                                                                                                           My Michael
## 2879                                                                                                                                                                                                                                                                                       Myron; a novel
## 2880                                                                                                                                                                                                                                                                                       Crystal singer
## 2881                                                                                                                                                                                                                                                                                Saul's book : a novel
## 2882                                                                                                                                                                                                                                                                                   Mercier and Camier
## 2883    Faust : being the Historia Von D. Johann Fausten dem wietbeschreyten Zauberer und Schwartzkünstler, or History of Dr. John Faust the notorious magician and necromancer, as written by his familiar servant and disciple Christopher Wagner, now for the first time Englished from the Low German
## 2884                                                                                                                                                                                                                                                                We killed Mangy-Dog, & other stories;
## 2885                                                                                                                                                                                                                                                                                      School for love
## 2886                                                                                                                                                                                                                                                                              Don Juan's Bar; a novel
## 2887                                                                                                                                                                                                                                                                                            The touch
## 2888                                                                                                                                                                                                                                                                                  Book of the Eskimos
## 2889                                                                                                                                                                                                                                                                                        Satan's world
## 2890                                                                                                                                                                                                                                                                                 The Libera me Domine
## 2891                                                                                                                                                                                                                                                                                      Fun and fantasy
## 2892                                                                                                                                                                                                                                                                         Latin American writing today
## 2893                                                                                                                                                                                                                                                                                     The black garden
## 2894                                                                                                                                                                                                                                                                         Special friendships, a novel
## 2895                                                                                                                                                                                                                                                                           The ballad of Typhoid Mary
## 2896                                                                                                                                                                                                                                                                          St. Lawrence blues; a novel
## 2897                                                                                                                                                                                                                                                                                           Arabesques
## 2898                                                                                                                                                                                                                                                                                           Homecoming
## 2899                                                                                                                                                                                                                                                                                       The blue angel
## 2900                                                                                                                                                                                                                                                                                       The lime works
## 2901                                                                                                                                                                                                                                                                                 The natives of Hemsö
## 2902                                                                                                                                                                                                                                                           The conversion of Chaplain Cohen : a novel
## 2903                                                                                                                                                                                                                                                                                     A garden of sand
## 2904                                                                                                                                                                                                                                        We of Nagasaki; the story of survivors in an atomic wasteland
## 2905                                                                                                                                                                                                                                                                                          The Odyssey
## 2906                                                                                                                                                                                                                                                                               A disturbing influence
## 2907                                                                                                                                                                                                                                                                                   Planet of the apes
## 2908                                                                                                                                                                                                                                                                                   A noble profession
## 2909                                                                                                                                                                                                                                                                               The Princess of Cleves
## 2910                                                                                                                                                                                                                                                                                        Hissing tales
## 2911                                                                                                                                                                                                                                                                                           The bridge
## 2912                                                                                                                                                                                                                                                            Housewarming, and other selected writings
## 2913                                                                                                                                                                                                                                                               Jules Verne, master of science fiction
## 2914                                                                                                                                                                                                                                                                          Five smooth stones; a novel
## 2915                                                                                                                                                                                                                                                                                     Larger than life
## 2916                                                                                                                                                                                                                                                                                The Dosadi experiment
## 2917                                                                                                                                                                                                                                                                                     The dream walker
## 2918                                                                                                                                                                                                                                                                                    The island within
## 2919                                                                                                                                                                                                                                                                                          Terra amata
## 2920                                                                                                                                                                                                                                                                                    City of many days
## 2921                                                                                                                                                                                                                                                                                  La guerre, yes sir!
## 2922                                                                                                                                                                                                                                                                                                   Go
## 2923                                                                                                                                                                                                                                                                                   The impatient ones
## 2924                                                                                                                                                                                                                                                                                   Students : a novel
## 2925                                                                                                                                                                                                                                                                                      Cement, a novel
## 2926                                                                                                                                                                                                                                                                         Letter to a child never born
## 2927                                                                                                                                                                                                                                                        The guardian of the word = Kouma Lafôlô Kouma
## 2928                                                                                                                                                                                                                                         French mediaeval romances [from the lays of Marie de France]
## 2929                                                                                                                                                                                                                                                    The woman in white. Introd. by Maurice Richardson
## 2930                                                                                                                                                                                                                                                               The shapes of fiction; open and closed
## 2931                                                                                                                                                                                                                                                                                     The unvanquished
## 2932                                                                                                                                                                                                                                                                                   The Oxford Chekhov
## 2933                                                                                                                                                                                                                                                                                     The echo chamber
## 2934                                                                                                                                                                                                                                                                                     Sandro of Chegem
## 2935                                                                                                                                                                                                                                                            The city of the living, and other stories
## 2936                                                                                                                                                                                                                                                                                The women on the wall
## 2937                                                                                                                                                                                                                                                                  McTeague : a story of San Francisco
## 2938                                                                                                                                                                                                                                                                                     Prochain épisode
## 2939                                                                                                                                                                                                                                                                             The star-spangled future
## 2940                                                                                                                                                                                                                                                              Lieutenant Lockeast, and other stories;
## 2941                                                                                                                                                                                                                                                                                    Before she met me
## 2942                                                                                                                                                                                                                                                                                           The shadow
## 2943                                                                                                                                                                                                                                                                  Russian hide-and-seek : a melodrama
## 2944                                                                                                                                                                                                                                                                                     A square of sky;
## 2945                                                                                                                                                                                                                                                                                        Vintage stuff
## 2946                                                                                                                                                                                                                                                                                     Flight of cranes
## 2947                                                                                                                                                                                                                                                                                                 Boy!
## 2948                                                                                                                                                                                                                                                                               The fall of the towers
## 2949                                                                                                                                                                                                                                              The lost face: best science fiction from Czechoslovakia
## 2950                                                                                                                                                                                                                                                                                Moon deluxe : stories
## 2951                                                                                                                                                                                                                                                                                 The Council of Egypt
## 2952                                                                                                                                                                                                                                                                                         Equal danger
## 2953                                                                                                                                                                                                                                                                                       Superior women
## 2954                                                                                                                                                                                                                                                                  The kidnapped saint & other stories
## 2955                                                                                                                                                                                                                                                                                 A wizard of earthsea
## 2956                                                                                                                                                                                                                                                                                    The four wise men
## 2957                                                                                                                                                                                                                                                                                      The smaller sky
## 2958                                                                                                                                                                                                                                                                                           Changeling
## 2959                                                                                                                                                                                                                                                                                     Novels & stories
## 2960                                                                                                                                                                                                                                                                     The wanderer (Le grand Meaulnes)
## 2961                                                                                                                                                                                                                                                                 The case of Comrade Tulayev, a novel
## 2962                                                                                                                                                                                                                                                       The third bank of the river, and other stories
## 2963                                                                                                                                                                                                                                                                                           The expert
## 2964                                                                                                                                                                                                                                                                               They burn the thistles
## 2965                                                                                                                                                                                                                                                                                 St. Peter's umbrella
## 2966                                                                                                                                                                                                                                                                               The camp of the saints
## 2967                                                                                                                                                                                                                                                                  Breakdown and bereavement : a novel
## 2968                                                                                                                                                                                                                                                                                         The builders
## 2969                                                                                                                                                                                                                                                                               The game of Dostoevsky
## 2970                                                                                                                                                                                                                                                                                       Baga: a novel;
## 2971                                                                                                                                                                                                                                                                                 Virgin soil; a novel
## 2972                                                                                                                                                                                                                                                                                      Into the battle
## 2973                                                                                                                                                                                                                                                                                      A time of death
## 2974                                                                                                                                                                                                                                                                               The fabulous riverboat
## 2975                                                                                                                                                                                                                                                                                   Noon, 22nd century
## 2976                                                                                                                                                                                                                                                                                   Prisoners of power
## 2977                                                                                                                                                                                                                                                                             Gossip from Thrush Green
## 2978                                                                                                                                                                                                                                                                             The sin of Father Mouret
## 2979                                                                                                                                                                                                                                                                                  Young hearts crying
## 2980                                                                                                                                                                                                                                                                           The draft riots, July 1863
## 2981                                                                                                                                                                                                                                                                              Mulligan stew : a novel
## 2982                                                                                                                                                                                                                                                                                                 Watt
## 2983                                                                                                                                                                                                                                                               The eternal husband, and other stories
## 2984                                                                                                                                                                                                                                                                                The saga of a seagull
## 2985                                                                                                                                                                                                                                                                                    The rout; a novel
## 2986                                                                                                                                                                                                                                                                      The edge of the storm ; a novel
## 2987                                                                                                                                                                                                                                                                           The gold-rimmed spectacles
## 2988                                                                                                                                                                                                                                         Speculations about Jakob / $f: translated by Ursule Molinaro
## 2989                                                                                                                                                                                                                                                Trees on the cliff : a novel of Korea and two stories
## 2990                                                                                                                                                                                                                                                                                    Barchester Towers
## 2991                                                                                                                                                                                                                                                                           New Soviet science fiction
## 2992                                                                                                                                                                                                                                         The last chance : the pilots' plot against Göring, 1944-1945
## 2993                                                                                                                                                                                                                                                                                         'Lena Rivers
## 2994                                                                                                                                                                                                                                                                                    Reach to eternity
## 2995                                                                                                                                                                                                                                                                                     Light Over Water
## 2996                                                                                                                                                                                                                                                                                Letters from Thailand
## 2997                                                                                                                                                                                                                                                                                     South to destiny
## 2998                                                                                                                                                                                                                                                                                      Behind the door
## 2999                                                                                                                                                                                                                                                                                              Sabaria
## 3000                                                                                                                                                                                                                                                                                    The eternal smile
## 3001                                                                                                                                                                                                                                                               Dr. Heart; a novella and other stories
## 3002                                                                                                                                                                                                                                                                                         Three novels
## 3003                                                                                                                                                                                                                                                                      Nightrunners of Bengal, a novel
## 3004                                                                                                                                                                                                                                                                                 Stranger in the land
## 3005                                                                                                                                                                                                                                                                                 Children of the game
## 3006                                                                                                                                                                                                           Two novels of the Mexican Revolution: The trials of a respectable family and The underdogs
## 3007                                                                                                                                                                                                                                                                       The old neighborhood : a novel
## 3008                                                                                                                                                                                                                                                                                       A late divorce
## 3009                                                                                                                                                                                                                                                               From beginning to end [and] The spell;
## 3010                                                                                                                                                                                                                                                    My disappearance in Providence, and other stories
## 3011                                                                                                                                                                                                                                                                                        The miscreant
## 3012                                                                                                                                                                                                                                                                                         The impostor
## 3013                                                                                                                                                                                                                                                                                Journey into the blue
## 3014                                                                                                                                                                                                                                                                      Going to town and other stories
## 3015                                                                                                                                                                                                                                                                                  Mastro-don Gesualdo
## 3016                                                                                                                                                                                                                                                                                        Arthur Mervyn
## 3017                                                                                                                                                                                                                                                                                    A change of heart
## 3018                                                                                                                                                                                                                                                                                The mote in God's eye
## 3019                                                                                                                                                                                                                                                                                              Visions
## 3020                                                                                                                                                                                                                                                                             Beautiful days : a novel
## 3021                                                                                                                                                                                                                                                                                   The gift : a novel
## 3022                                                                                                                                                                                                                                                                               Ethan Frome and Summer
## 3023                                                                                                                                                                                                                                                                                       Bread and wine
## 3024                                                                                                                                                                                                                                                                                   When I was a child
## 3025                                                                                                                                                                                                                                                                                   The hound of earth
## 3026                                                                                                                                                                                                                                                                          The hatchet : a short story
## 3027                                                                                                                                                                                                                                                                                   The Tar-Aiym Krang
## 3028                                                                                                                                                                                                                                                                              World light (Heimsljós)
## 3029                                                                                                                                                                                                                                                                                       Two symphonies
## 3030                                                                                                                                                                                                                                                                                          Jane Talbot
## 3031                                                                                                                                                                                                                                                                  Where nests the water hen. Introd.:
## 3032                                                                                                                                                                                                                                                                                      Before I forget
## 3033                                                                                                                                                                                                                                                                                          The journey
## 3034                                                                                                                                                                                                                                                                                        Taos; a novel
## 3035                                                                                                                                                                                                                                                                                          Dita Saxova
## 3036                                                                                                                                                                                                                                                                                      North from Rome
## 3037                                                                                                                                                                                                                                                                           Two autobiographical plays
## 3038                                                                                                                                                                                                                                                                                Cold nights : a novel
## 3039                                                                                                                                                                                                                                                          The fifth head of Cerberus : three novellas
## 3040                                                                                                                                                                                                                                                                                    Don't tell Alfred
## 3041                                                                                                                                                                                                                                                                          Russian women : two stories
## 3042                                                                                                                                                                                                                                                                            Old Hungarian fairy tales
## 3043                                                                                                                                                                                                                                                                               The magician of Lublin
## 3044                                                                                                                                                                                                                                                                         The séance and other stories
## 3045                                                                                                                                                                                                                                                                    Cop killer : the story of a crime
## 3046                                                                                                                                                                                                                                 Plots and counterplots : more unknown thrillers of Louisa May Alcott
## 3047                                                                                                                                                                                                                                                 The sea serpent: the yarns of Jean Marie Cabidoulin;
## 3048                                                                                                                                                                                                                                                                   Flying Osip; stories of new Russia
## 3049                                                                                                                                                                                                                                                         Green seaweed and salted eggs; short stories
## 3050                                                                                                                                                                                                                                                                  Selected stories [of] Ivan Turgenev
## 3051                                                                                                                                                                                                                                                                                      Room at the top
## 3052                                                                                                                                                                                                                                                                                     Soldier, ask not
## 3053                                                                                                                                                                                                                                              Booker T. Washington, educator of hand, head, and heart
## 3054                                                                                                                                                                                                                       Simplicius Simplicissimus. Translated from the original German edition of 1669
## 3055                                                                                                                                                                                                                                                                         Siberia: three short stories
## 3056                                                                                                                                                                                                                                                                                The traveler in black
## 3057                                                                                                                                                                                                                                                                                    Persian adventure
## 3058                                                                                                                                                                                                                                                            The canary and other tales of martial law
## 3059                                                                                                                                                                                                                                                     Lays of Marie de France and other French legends
## 3060                                                                                                                                                                                                                                                                              Joseph and his brothers
## 3061                                                                                                                                                                                                                                                                                 Born guilty; a novel
## 3062                                                                                                                                                                                                                                              The nigger of the 'Narcissus'. Typhoon. The shadow-line
## 3063                                                                                                                                                                                                                                                                                Lafcadio's adventures
## 3064                                                                                                                                                                                                                                                                                       The Decameron;
## 3065                                                                                                                                                                                                                                                                                              Stories
## 3066                                                                                                                                                                                                                                                                                       Selected works
## 3067                                                                                                                                                                                                                                                               The lives and times of Jerry Cornelius
## 3068                                                                                                                                                                                                                                                                                    History : a novel
## 3069                                                                                                                                                                                                                                                                                 Cupid's executioners
## 3070                                                                                                                                                                                                                                                     What's become of screwloose? and other inquiries
## 3071                                                                                                                                                                                                                                                                                         Rockinghorse
## 3072                                                                                                                                                                                                                                         Asian laughter; an anthology of oriental satire and humor. -
## 3073                                                                                                                                                                                                                                                                           The cowboy and the Cossack
## 3074                                                                                                                                                                                                                                                                     Character portraits from Dickens
## 3075                                                                                                                                                                                                                                                                    A golden treasury of Jewish tales
## 3076                                                                                                                                                                                                                                                                                             The liar
## 3077                                                                                                                                                                                                                    The Gospel according to Chegem : being the further adventures of Sandro of Chegem
## 3078                                                                                                                                                                                                                                                                                        Jungle lovers
## 3079                                                                                                                                                                                                                            Cheerful weather for the wedding and An integrated man : two short novels
## 3080                                                                                                                                                                                                                                                                                                Tales
## 3081                                                                                                                                                                                                                                                                                  A choice of enemies
## 3082                                                                                                                                                                                                                                                                      Stained glass elegies : stories
## 3083                                                                                                                                                                                                                                                               The voice of the sea and other stories
## 3084                                                                                                                                                                                                                                                                                       A long madness
## 3085                                                                                                                                                                                                                                                                                   The Greek passion;
## 3086                                                                                                                                                                                                                                                                               A woman named Solitude
## 3087                                                                                                                                                                                                                                                       The red cock flies to heaven ; tr. by E.D. Goy
## 3088                                                                                                                                                                                                                                                                                          Martin Eden
## 3089                                                                                                                                                                                                                                                                              Lead us into temptation
## 3090                                                                                                                                                                                                                                                                                   The Wycherly woman
## 3091                                                                                                                                                                                                                                                             Tales of the sacred and the supernatural
## 3092                                                                                                                                                                                                                                                                                    The fish can sing
## 3093                                                                                                                                                                                                                                                                          The riding master, a novel;
## 3094                                                                                                                                                                                                                                                                                        The straw man
## 3095                                                                                                                                                                                                                                                                                       Ocean of night
## 3096                                                                                                                                                                                                                                                                          The Emperor's last soldiers
## 3097                                                                                                                                                                                                                                        Ice floes and flaming water; a true adventure in Melville Bay
## 3098                                                                                                                                                                                                                                                                                 The novice, a novel;
## 3099                                                                                                                                                                                                                                                                                      Little Tel Aviv
## 3100                                                                                                                                                                                                                                                                                     Threepenny novel
## 3101                                                                                                                                                                                                                                                                                                Debby
## 3102                                                                                                                                                                                                                                                                                          Fire sermon
## 3103                                                                                                                                                                                                                                                            The sinner from Toledo, and other stories
## 3104                                                                                                                                                                                                                                                     The story of the stone : a novel in five volumes
## 3105                                                                                                                                                                                                                                                                                   Ellison wonderland
## 3106                                                                                                                                                                                                                                                                 The narrow path; the man of Nazareth
## 3107                                                                                                                                                                                                                                                                         Black children, white dreams
## 3108                                                                                                                                                                                                                                                               The giant. Behind the brick wall. Love
## 3109                                                                                                                                                                                                                                                            Knulp: three tales from the life of Knulp
## 3110                                                                                                                                                                                                                                                                                 The castle of Fratta
## 3111                                                                                                                                                                                                                                                                                          Blue mimosa
## 3112                                                                                                                                                                                                                                                                               Nepalese short stories
## 3113                                                                                                                                                                                                                                                                                   Novel with cocaine
## 3114                                                                                                                                                                                                                                                                                        The fetishist
## 3115                                                                                                                                                                                                                                                                                   Add a dash of pity
## 3116                                                                                                                                                                                                                                                                                           Sour sweet
## 3117                                                                                                                                                                                                                                                                                 With shuddering fall
## 3118                                                                                                                                                                                                                                                                                Love on a dark street
## 3119                                                                                                                                                                                                                                                                                   The beckoning door
## 3120                                                                                                                                                                                                                                                 Territorial song : contemporary writing from Finland
## 3121                                                                                                                                                                                                                                                                                     Twenty-four eyes
## 3122                                                                                                                                                                                                                                                                                  A funny man's dream
## 3123                                                                                                                                                                                                                                                                            The life of a useless man
## 3124                                                                                                                                                                                                                                                                    The ivory balls and other stories
## 3125                                                                                                                                                                                                  Exotic Japanese stories, the beautiful and the grotesque; 16 unusual tales and unforgettable images
## 3126                                                                                                                                                                                                                                                                                Conference of victims
## 3127                                                                                                                                                                                                                                                                                       Old dyke tales
## 3128                                                                                                                                                                                                                                                                                            La charca
## 3129                                                                                                                                                                                                                                                                            Mysterious ways : a novel
## 3130                                                                                                                                                                                                                                                                                     Under the colors
## 3131                                                                                                                                                                                                                                                                Great German short novels and stories
## 3132                                                                                                                                                                Soul of wood, including Journey through the night, The pious brother, The judgment, The window, Hurrah for freedom [and] Resurrection
## 3133                                                                                                                                                                                                                                                      Soviet Russian stories of the 1960's and 1970's
## 3134                                                                                                                                                                                                                                                                                   The dragon masters
## 3135                                                                                                                                                                                                                                                                       The saga of Tristram and Ísönd
## 3136                                                                                                                                                                                                                                                                                 The look = La mirada
## 3137                                                                                                                                                                                                                                                                                    The faithful ally
## 3138                                                                                                                                                                                                                                                                                                 Emma
## 3139                                                                                                                                                                                                                                                                           A book of ghosts & goblins
## 3140                                                                                                                                                                                                                                                                                  Master of the world
## 3141                                                                                                                                                                                                                                                                   Star of Peace : a novel of the sea
## 3142                                                                                                                                                                                                                                                                                     North to freedom
## 3143                                                                                                                                                                                                                                                                                     Tent of miracles
## 3144                                                                                                                                                                                                                                                                                             The boat
## 3145                                                                                                                                                                                                                                            The eye of the heart; short stories from Latin America. -
## 3146                                                                                                                                                                                                                                                                                  Morning in Shanghai
## 3147                                                                                                                                                                                                                                                                                    The drowning pool
## 3148                                                                                                                                                                                                                                                                                            The edict
## 3149                                                                                                                                                                                                                                                                            The Ravi Lancers, a novel
## 3150                                                                                                                                                                                                                                                                                        Alberta alone
## 3151                                                                                                                                                                                                                                                                                  Alberta and freedom
## 3152                                                                                                                                                                                                                                                                                                1914;
## 3153                                                                                                                                                                                                                                                                                    Alberta and Jacob
## 3154                                                                                                                                                                                                                                                              Krane's Café: an interior with figures;
## 3155                                                                                                                                                                                                                                                                                            Kallocain
## 3156                                                                                                                                                                                                                                                                                    Despair : a novel
## 3157                                                                                                                                                                                                                                                                                  Lillelord : a novel
## 3158                                                                                                                                                                                                                                                               The garnet bracelet, and other stories
## 3159                                                                                                                                                                                                                                                                                        The hurricane
## 3160                                                                                                                                                                                                                                                                The sun shines over the Sanggan River
## 3161                                                                                                                                                                                                                                                                           The sailor from Gibraltar;
## 3162                                                                                                                                                                                                                                                                         Ten-thirty on a summer night
## 3163                                                                                                                                                                                                                                                                 The innocent and the guilty; stories
## 3164                                                                                                                                                                                                                                                                                            The leech
## 3165                                                                                                                                                                                                                                                                            The case of Sonia Wayward
## 3166                                                                                                                                                                                                                                                                                          Abracadabra
## 3167                                                                                                                                                                                                                                                                               From the twilight zone
## 3168                                                                                                                                                                                                                                                                                        Time, forward
## 3169                                                                                                                                                                                                                                                                                            Fireflies
## 3170                                                                                                                                                                                                                                                                                        The moonstone
## 3171                                                                                                                                                                                                                                                                    Joining Charles and other stories
## 3172                                                                                                                                                                                                                      The life and death of the Mayor of Casterbridge : a story of a man of character
## 3173                                                                                                                                                                                                                                                                                         The sergeant
## 3174                                                                                                                                                                                                                                                                                        The bachelors
## 3175                                                                                                                                                                                                                                                                               Tourists and colonials
## 3176                                                                                                                                                                                                               The pioneers, or The sources of the Susquehanna. The last of the Mohicans. The prairie
## 3177                                                                                                                                                                                                                                                                                     Sleepless nights
## 3178                                                                                                                                                                                                                                                                                   The war was better
## 3179                                                                                                                                                                                                                                                                            Moscow interlude, a novel
## 3180                                                                                                                                                                                                                                                                                      The ambassadors
## 3181                                                                                                                                                                                                                                                                            The double : two versions
## 3182                                                                                                                                                                                                                                                                             My present age : a novel
## 3183                                                                                                                                                                                                                                                                                           Unto death
## 3184                                                                                                                                                                                                                                                                                       Listen, listen
## 3185                                                                                                                                                                                                                                                                             Blue man & other stories
## 3186                                                                                                                                                                                                                                                                                      A time of death
## 3187                                                                                                                                                                                                                                                                                        Garden, ashes
## 3188                                                                                                                                                                                                                                                                               Yugoslav short stories
## 3189                                                                                                                                                                                                                                                                                         Confederates
## 3190                                                                                                                                                                                                                                                                                The collected stories
## 3191                                                                                                                                                                                                                                                                                 The humbler creation
## 3192                                                                                                                                                                                                                                                                             The last resort; a novel
## 3193                                                                                                                                                                                                                                                                                              Tangier
## 3194                                                                                                                                                                                                                                                                                   The Gift : a novel
## 3195                                                                                                                                                                                                                                      The betrothed (I promessi sposi), a tale of xvii century Milan;
## 3196                                                                                                                                                                                                                                                                                 The spirit of Dorsai
## 3197                                                                                                                                                                                                                                                    The smoking mountain; stories of post war Germany
## 3198                                                                                                                                                                                                                                                                                         Soft answers
## 3199                                                                                                                                                                                                                                                                                   The Mackerel Plaza
## 3200                                                                                                                                                                                                                                                                                      The fire within
## 3201                                                                                                                                                                                                                                                                                     A touch of Midas
## 3202                                                                                                                                                                                                                                                   Farewell, my friend and The garden; two novelettes
## 3203                                                                                                                                                                                                                                                           The comedy of Charleroi, and other stories
## 3204                                                                                                                                                                                                                                                                  World without stars / Poul Anderson
## 3205                                                                                                                                                                                                                                                                                          Precinct 19
## 3206                                                                                                                                                                                                                                                                     Harvest : a novel in three parts
## 3207                                                                                                                                                                                                                                                                                     Twenty-four eyes
## 3208                                                                                                                                                                                                                                                                           Not for every eye; a novel
## 3209                                                                                                                                                                                                                                                                                   The great madness;
## 3210                                                                                                                                                                                                                                                                                   November : a novel
## 3211                                                                                                                                                                                                                                                                  Tyrants destroyed and other stories
## 3212                                                                                                                                                                                                                                                                                   Home of the gentry
## 3213                                                                                                                                                                                                                                                                               The green man; a novel
## 3214                                                                                                                                                                                                                                                                            Bhowani Junction, a novel
## 3215                                                                                                                                                                                                                                                                                 The carnivorous lamb
## 3216                                                                                                                                                                                                                                                               The collected stories of André Maurois
## 3217                                                                                                                                                                                                                                                                                        Short stories
## 3218                                                                                                                                                                                                                                                                         The world about us : a novel
## 3219                                                                                                                                                                                                                                                                                   Valentine Pontifex
## 3220                                                                                                                                                                                                                                                                       A nest of the gentry : a novel
## 3221                                                                                                                                                                                                                                                                                              Raphael
## 3222                                                                                                                                                                                                              The path of glory: being the memoirs of the extraordinary military career of John Shipp
## 3223                                                                                                                                                                                                                                                                               The true story of Ah Q
## 3224                                                                                                                                                                                                                                                                                     Blaze of embers;
## 3225                                                                                                                                                                                                                                                                                            Ending up
## 3226                                                                                                                                                                                                                                                                                      Hail Galarneau]
## 3227                                                                                                                                                                                                                                                                                    According to Mark
## 3228                                                                                                                                                                                                                                                                                       Troubled sleep
## 3229                                                                                                                                                                                                                                                                    Srengenge : a novel from Malaysia
## 3230                                                                                                                                                                                                                                                                    The third notch and other stories
## 3231                                                                                                                                                                                                         Hallucinations; being an account of the life and adventures of Friar Servando Teresa de Mier
## 3232                                                                                                                                                                                                                                                                          The journey of Ibn Fattouma
## 3233                                                                                                                                                                                                                                                                                 Separation : a novel
## 3234                                                                                                                                                                                                                                                                            Pictures at an exhibition
## 3235                                                                                                                                                                                                                                                                                Two stories of Prague
## 3236                                                                                                                                                                                           The vampyre ; and, Ernestus Berchtold, or, The modern Oedipus : collected fiction of John William Polidori
## 3237                                                                                                                                                                                                                                                  Cometh up as a flower : "is the old man yet alive?"
## 3238                                                                                                                                                                                                                                                                                                Dolly
## 3239                                                                                                                                                                                                                                                                              Things invisible to see
## 3240                                                                                                                                                                                                                                                                    The exiles trilogy : three novels
## 3241                                                                                                                                                                                                                                                                                             The thaw
## 3242                                                                                                                                                                                                                                                                                         The cupboard
## 3243                                                                                                                                                                                                                                                  Meetings with the angel ; seven stories from Israel
## 3244                                                                                                                                                                                                                                                                             All the emperor's horses
## 3245                                                                                                                                                                                                                                                             Not by bread alone by Vladimir Dudint͡sev
## 3246                                                                                                                                                                                                                                                                                      Gate to the sea
## 3247                                                                                                                                                                                                                                                                          Music and silence : a novel
## 3248                                                                                                                                                                                                                                                                                       Beware of pity
## 3249                                                                                                                                                                                                                                                                                     Kaleidoscope two
## 3250                                                                                                                                                                                                                                                              Candido : or, A dream dreamed in Sicily
## 3251                                                                                                                                                                                                                                                                             The Makepeace experiment
## 3252                                                                                                                                                                                                                                                                   Three, seven, ace & other stories;
## 3253                                                                                                                                                                                                                                                                                             Cannibal
## 3254                                                                                                                                                                                                                                                                              City of splintered gods
## 3255                                                                                                                                                                                                                                                                         River mist and other stories
## 3256                                                                                                                                                                                                                                                                      Maigret and the headless corpse
## 3257                                                                                                                                                                                                                                                                             Maigret loses his temper
## 3258                                                                                                                                                                                                                                                                                         Four stories
## 3259                                                                                                                                                                                                                                                                   Long time between kisses : a novel
## 3260                                                                                                                                                                                                                                                                                       Burning grass;
## 3261                                                                                                                                                                                                                                                                                The collected stories
## 3262                                                                                                                                                                                                                                                                                  God and the Soviets
## 3263                                                                                                                                                                                                                                                                                   Gulf Coast stories
## 3264                                                                                                                                                                                                                                                                  The chess-players and other stories
## 3265                                                                                                                                                                                                                                          Lay down your arms; the autobiography of Martha von Tilling
## 3266                                                                                                                                                                                                                                                                Philosopher or dog? : (Quincas Borba)
## 3267                                                                                                                                                                                                                                                                                  The violent wedding
## 3268                                                                                                                                                                                                                                                                                            The lover
## 3269                                                                                                                                                                                                                                   African myths and legends / $f: illustrated by Joan Kiddell-Monroe
## 3270                                                                                                                                                                                                                                                                                   Germinie Lacerteux
## 3271                                                                                                                                                                                                                                                                                    The Flanders road
## 3272                                                                                                                                                                                                                                                                                        The holy well
## 3273                                                                                                                                                                                                                                                                                     Getting married;
## 3274                                                                                                                                                                                                                                                                                       The naked year
## 3275                                                                                                                                                                                                                                                                       The death of the king's canary
## 3276                                                                                                                                                                                                                                                                           Epitaph of a small winner;
## 3277                                                                                                                                                                                                                                                                                         Our conquest
## 3278                                                                                                                                                                                                                                                                              The black queen stories
## 3279                                                                                                                                                                                                                                                                                    Arabic folk tales
## 3280                                                                                                                                                                                                                                                                                               Guilt;
## 3281                                                                                                                                                                                                                                    The virtuous orphan : or, The life of Marianne, Countess of *****
## 3282                                                                                                                                                                                                                                                                                         Choma's drum
## 3283                                                                                                                                                                                                                                                                       The whispering earth : a novel
## 3284                                                                                                                                                                                                                                                                                           The legacy
## 3285                                                                                                                                                                                                                                                            Fierce and gentle warriors; three stories
## 3286                                                                                                                                                                                                                                                                                        Anna Karenina
## 3287                                                                                                                                                                                                                                                                              Whole days in the trees
## 3288                                                                                                                                                                                                                                                  Miss Ravenel's conversion from secession to loyalty
## 3289                                                                                                                                                                                                                                                                                Martha, Eric & George
## 3290                                                                                                                                                                                                                                                                                                 Zero
## 3291                                                                                                                                                                                                                                                                                   Beautiful feathers
## 3292                                                                                                                                                                                                                                                                                    Volcano : a novel
## 3293                                                                                                                                                                                                                                                                                Surplussed barrelware
## 3294                                                                                                                                                                                                                                                                                     The wrong people
## 3295                                                                                                                                                                                                                                                                          The second window : a novel
## 3296                                                                                                                                                                                                                                                                                 They came to Cordura
## 3297                                                                                                                                                                                                                                                                   A romantic hero, and other stories
## 3298                                                                                                                                                                                                                                                                                 The underground game
## 3299                                                                                                                                                                                                                                                                                        An arid heart
## 3300                                                                                                                                                                                                                                                                                      Fausto and Anna
## 3301                                                                                                                                                                                                                                                                                  Tun-huang : a novel
## 3302                                                                                                                                                                                                                                                                            The misused love letters;
## 3303                                                                                                                                                                                                                                                                                   The pillar of salt
## 3304                                                                                                                                                                                                                                                                                  Capital : a fiction
## 3305                                                                                                                                                                                                                                                                                              Bel-ami
## 3306                                                                                                                                                                                                                                                                                       A woman's life
## 3307                                                                                                                                                                                                                                                                 Huasipungo = The villagers : a novel
## 3308                                                                                                                                                                                                                                                                                     City of darkness
## 3309                                                                                                                                                                                                                                                                      The time of miracles : a legend
## 3310                                                                                                                                                                                                                                                                              When pumpkins blossomed
## 3311                                                                                                                                                                                                                                                                                     The crystal cave
## 3312                                                                                                                                                                                                                                          Henry Lawson's mates : the complete stories of Henry Lawson
## 3313                                                                                                                                                                                                                                                                                      A violent life;
## 3314                                                                                                                                                                                                                                                                                           Greenstone
## 3315                                                                                                                                                                                                                                                                           The wayward head and heart
## 3316                                                                                                                                                                                                                                                                     Between the hammer and the anvil
## 3317                                                                                                                                                                                                                                                                      Fata Morgana, and other stories
## 3318                                                                                                                                                                                                                                                                               Set this house on fire
## 3319                                                                                                                                                                                                                                                                                       The long march
## 3320                                                                                                                                                                                                                                                                                           Gorky Park
## 3321                                                                                                                                                                                                                                       People in the summer night = Ihmiset suviyössä : an epic suite
## 3322                                                                                                                                                                                                                                                                             German stories and tales
## 3323                                                                                                                                                                                                                                                          Tread softly in this place, by Brian Cleeve
## 3324                                                                                                                                                                                                                                                                         Real losses, imaginary gains
## 3325                                                                                                                                                                                                                                                                                     The Insurrection
## 3326                                                                                                                                                                                                                                                                                     Complete stories
## 3327                                                                                                                                                                                                                                             Fata morgana: a story of the peasant life and sentiments
## 3328                                                                                                                                                                                                                                                                                                 Sara
## 3329                                                                                                                                                                                                                                                                                              Miramar
## 3330                                                                                                                                                                                                                                                                                   Clear light of day
## 3331                                                                                                                                                                                                                                                                                      Strange doings;
## 3332                                                                                                                                                                                                                                                                                          Soldier boy
## 3333                                                          The child buyer : a novel in the form of hearings before the Standing Committee on Education, Welfare, & Public Morality of a certain State Senate, investigating the conspiracy of Mr. Wissey Jones, with others, to purchase a male child
##      juvenileprob   nonficprob decade lang_region lang_subregion pagecount
## 1    1.053743e-01 2.652732e-01   1990         eng                      353
## 2    2.865719e-02 2.122760e-01   1990         eng                      245
## 3    8.446701e-02 5.482293e-01   1970         eur            eur       512
## 4    2.294549e-02 3.169928e-01   1950         eur            eur       118
## 5    4.065852e-01 7.815511e-01   1960         eng                      296
## 6    1.076486e-01 5.050007e-02   1970         eur            eur       328
## 7    3.281048e-02 3.209200e-01   1970         eur            eur       552
## 8    4.542565e-02 1.788458e-01   1970         eng                      286
## 9    1.484017e-03 5.674845e-01   1970         eur            eur       274
## 10   2.766882e-03 8.435750e-02   1970         eng                      366
## 11   5.686101e-03 2.288727e-01   1970         eng                      348
## 12   2.419467e-02 6.449964e-02   1970         eng                      364
## 13   4.747435e-02 1.084353e-01   1950         eng                      264
## 14   0.000000e+00 0.000000e+00   1950         eng                      264
## 15   9.733464e-01 2.058425e-01   1950         eur            eur       256
## 16   4.758770e-01 1.007223e-01   1950         eng                      142
## 17   5.024535e-03 4.155786e-02   1970         eng                      615
## 18   2.335905e-01 4.217122e-01   1980         eng                      528
## 19   4.220608e-01 5.914034e-01   1960         eng                       40
## 20   1.625712e-02 2.372598e-01   1960         eng                      200
## 21   4.435360e-02 1.123849e-01   1970         eur            eur       346
## 22   7.600000e-06 2.738097e-02   1990         eng                      468
## 23   3.906881e-02 4.811318e-01   1990         eng                      426
## 24   2.376581e-02 1.398642e-02   1970         eur            eur       280
## 25   2.051076e-02 6.897751e-02   1970         eur            eur       284
## 26   2.889464e-02 7.688853e-02   1990         eng                      412
## 27   1.439662e-02 3.374818e-01   1990         eng                      324
## 28   9.946628e-01 4.084692e-01   1990         non                      392
## 29   4.443023e-01 3.084787e-01   1990         eng                      388
## 30   4.159341e-03 3.015408e-01   1990         eng                      373
## 31   1.193835e-03 3.406876e-02   1990         eng                      472
## 32   8.610821e-01 7.403983e-01   1970         eng                      152
## 33   3.081380e-01 1.483618e-01   1990         eur            eur       328
## 34   2.153153e-02 2.499747e-01   2000         eng                      230
## 35   2.367818e-01 4.482299e-01   2000         eng                      152
## 36   3.285179e-03 1.072467e-01   2000         eng                      560
## 37   2.129897e-03 1.558655e-02   2000         eng                      288
## 38   1.782859e-01 7.699132e-02   1980         eng                      354
## 39   8.376290e-02 4.610388e-01   1960         eng                      264
## 40   1.162394e-03 2.278933e-01   1960         eng                      488
## 41   1.000376e-01 4.313112e-01   1950         eng                      272
## 42   9.018582e-02 6.734013e-02   1980         eng                      328
## 43   3.258783e-03 4.085928e-01   1990         eur            eur       168
## 44   0.000000e+00 0.000000e+00   1960         eur            eur       376
## 45   1.173106e-01 1.123019e-01   1980         eng                      276
## 46   3.564501e-02 7.298783e-02   1970         eng                      416
## 47   4.296949e-03 4.513280e-02   1970         eng                      420
## 48   6.948177e-03 2.783199e-01   1980         eur            eur       426
## 49   2.214908e-02 5.075966e-02   1960         eur            eur       436
## 50   5.344008e-03 4.380254e-01   1960         eng                      264
## 51   2.871630e-01 5.700228e-01   1960         non          easia       520
## 52   2.125770e-01 4.438389e-01   1970         eng                      568
## 53   1.307484e-02 1.603986e-01   1970         non          sasia       288
## 54   8.733496e-02 3.900428e-01   1950         eur            eur       250
## 55   8.717456e-01 4.999290e-01   1980         eur            eur       204
## 56   1.717997e-02 9.283277e-02   1990         eur            eur       172
## 57   1.651844e-02 3.349696e-01   2000         eur            eur       178
## 58   6.765100e-02 1.774758e-01   1970         eng                      372
## 59   4.205819e-03 1.613056e-01   1990         eng                      272
## 60   2.274877e-02 4.235154e-01   1980         eur            eur       136
## 61   7.966648e-02 2.302861e-01   1980         eur            eur       294
## 62   6.018781e-02 8.608049e-02   1950         eur            eur       490
## 63   1.829486e-02 7.320769e-02   1950         eur            eur       456
## 64   1.365626e-01 2.440660e-02   1990         eng                      200
## 65   1.701893e-03 7.825571e-02   1990         non        classic       184
## 66   3.151030e-02 3.496750e-01   1980         eng                      320
## 67   9.162288e-02 9.007663e-02   1990         eng                      440
## 68   2.253836e-01 6.675054e-01   1990         eng                      280
## 69   1.445525e-02 2.686869e-01   1990         eur            eur       168
## 70   3.060397e-02 2.261155e-01   1980         eng                      244
## 71   3.990721e-01 4.250383e-01   1990         eng                      174
## 72   5.797963e-03 3.676689e-01   1980         eur            eur       136
## 73   5.705190e-04 1.741013e-01   1980         eur            eur       200
## 74   1.096241e-01 6.745887e-01   1980         eur            eur       312
## 75   2.055631e-03 3.950535e-02   1980         eur            eur       358
## 76   0.000000e+00 0.000000e+00   1980         eng                       96
## 77   1.278764e-03 3.221729e-02   1980         eng                      112
## 78   2.457933e-03 5.799545e-01   1990         eur            eur        84
## 79   5.700909e-03 1.063445e-01   1990         eng                      312
## 80   2.882729e-02 1.856622e-01   1980         eur            eur       320
## 81   1.605842e-01 1.097073e-01   1990         eur            eur       580
## 82   2.135464e-02 2.473931e-01   1970         eur            eur       240
## 83   1.212613e-03 8.150096e-02   1980         eur            eur       188
## 84   8.821592e-03 1.855252e-01   1980         eng                      296
## 85   2.484180e-02 1.308736e-01   1970         eng                      294
## 86   2.401940e-03 2.155746e-01   1990         eur            eur       232
## 87   5.977159e-02 1.020183e-01   1970         eur            eur       204
## 88   2.399184e-02 3.858845e-01   1980         eur            eur       398
## 89   7.210072e-03 6.212299e-01   1980         eur            eur       334
## 90   2.969593e-02 9.887067e-02   1990         eng                      264
## 91   2.488668e-01 6.944851e-01   1980         eur            eur       664
## 92   3.951610e-02 3.252169e-01   1970         eur            eur       264
## 93   1.071986e-02 1.347393e-01   1960         eur            eur       618
## 94   6.292574e-02 1.357370e-01   1970         eur            eur       488
## 95   2.738788e-02 1.203970e-01   1970         eng                      296
## 96   1.091747e-01 3.204325e-01   1960         eng                      204
## 97   5.122620e-01 1.497365e-01   1980         eng                      304
## 98   2.790501e-01 1.782251e-01   1980         eng                      424
## 99   3.898017e-01 5.463143e-01   1980         eur            eur       266
## 100  1.738058e-01 1.435568e-01   1980         eur            eur       312
## 101  1.990593e-02 3.281835e-01   1990         eur            eur       464
## 102  2.916498e-01 3.792234e-01   1980         eur            eur       408
## 103  3.309803e-02 2.744602e-01   1980         eur            eur       224
## 104  6.669903e-03 6.998149e-01   1980         eng                      154
## 105  3.263458e-02 2.385181e-01   1980         eur            eur       248
## 106  9.958686e-01 2.248062e-01   1980         eng                      168
## 107  4.838460e-01 2.584130e-01   1990         eur            eur       280
## 108  4.921185e-02 8.572180e-02   1980         eng                      792
## 109  4.524327e-01 5.885087e-01   1980         eng                      220
## 110  4.072543e-02 2.232920e-01   1980         eng                      282
## 111  1.474319e-01 9.650325e-02   1980         eng                      210
## 112  1.797321e-03 2.716399e-01   1960         eur            eur       204
## 113  9.150172e-02 1.843664e-01   1960         eng                      622
## 114  1.420126e-02 1.314557e-01   1950         eur            eur       362
## 115  1.080969e-02 5.604700e-01   1960         eur            eur       138
## 116  1.222815e-01 1.788471e-01   1950         eng                      226
## 117  8.846517e-03 5.498440e-01   1960         eng                      268
## 118  2.767318e-02 2.740772e-01   1960         eur            eur       390
## 119  6.073188e-03 7.815305e-02   1950         eng                      448
## 120  9.393599e-02 2.541180e-01   1950         eng                      264
## 121  6.411350e-02 6.500303e-02   1970         eng                      296
## 122  2.714102e-02 2.088748e-01   1950         eng                      168
## 123  3.819140e-04 1.853003e-01   1950         eur            eur       466
## 124  1.133416e-02 5.698946e-02   1980         eng                      264
## 125  1.205158e-03 2.561353e-01   1980         eur            eur       444
## 126  6.338919e-02 1.622433e-01   1980         eng                      204
## 127  1.421394e-02 3.335238e-01   1970         non          easia       294
## 128  2.300540e-02 3.576093e-02   1970         eng                      332
## 129  1.262931e-02 3.746816e-01   1960         eng                      594
## 130  4.201485e-03 2.974873e-01   1960         eng                      236
## 131  1.472401e-01 6.471879e-02   1960         eur            eur       364
## 132  3.828005e-03 8.896867e-02   1960         eng                      268
## 133  7.676935e-02 4.271231e-01   1970         eng                      194
## 134  1.875485e-02 1.769889e-01   1970         eur            eur       814
## 135  4.654270e-03 2.269411e-01   1970         eur            eur       810
## 136  4.115422e-02 1.933350e-01   1970         eng                      620
## 137  1.080345e-03 1.257981e-01   1960         eur            eur       264
## 138  8.789378e-02 6.775754e-02   1960         eng                      456
## 139  3.309773e-02 5.827504e-01   1960         eur            eur       424
## 140  6.451961e-02 9.710460e-02   1960         eur            eur       358
## 141  1.189311e-01 4.439050e-01   1960         eng                      168
## 142  2.073266e-02 2.635525e-01   1970         eng                      174
## 143  1.912505e-02 1.047786e-01   1960         non        mideast       196
## 144  1.306331e-02 1.203178e-01   1970         eng                      328
## 145  4.452443e-02 6.653747e-01   1950         eng                      214
## 146  1.065918e-01 4.010486e-01   1950         eng                      150
## 147  4.959918e-02 3.735148e-01   1960         eur            eur       578
## 148  6.340388e-03 9.334188e-02   1950         eur            eur       878
## 149  4.767859e-02 3.191714e-01   1970         eur            eur       200
## 150  3.108284e-02 1.269318e-01   1980         eur            eur       204
## 151  5.998758e-03 9.343771e-02   1980         eng                      642
## 152  3.830314e-02 1.065522e-01   1960         eur            eur       264
## 153  6.977678e-03 1.257621e-01   1990         eng                      168
## 154  5.446408e-01 1.400884e-01   1950         eng                      324
## 155  6.764435e-02 1.392037e-01   1980         eur            eur       200
## 156  6.522007e-02 1.364700e-01   1980         non        mideast       216
## 157  2.317020e-03 2.366407e-02   1980         eur            eur       168
## 158  3.734318e-02 4.725122e-01   1990         eng                      260
## 159  2.375550e-01 5.921116e-01   1990         non                      144
## 160  2.646934e-01 2.007014e-01   1980         non        mideast       424
## 161  4.462130e-01 2.855294e-01   1980         non        mideast       434
## 162  2.311638e-02 1.355700e-01   1990         eng                      280
## 163  8.461633e-02 3.916714e-01   1990         eur            eur       168
## 164  2.068211e-03 2.949644e-01   1980         eng                      352
## 165  4.099404e-02 7.041273e-02   1990         eur            eur       232
## 166  1.591316e-03 6.132341e-01   1990         eng                      152
## 167  1.581888e-02 3.723740e-01   1990         eng                      172
## 168  8.459008e-02 1.977517e-01   1990         eur            eur       296
## 169  3.119492e-02 1.642135e-02   1990         eur            eur       370
## 170  1.100781e-02 1.443957e-01   1980         eng                      600
## 171  1.121424e-02 1.019949e-01   1970         eur            eur       226
## 172  4.755432e-01 3.925954e-01   1970         eur            eur       134
## 173  1.015270e-01 1.744635e-01   1960         eng                      460
## 174  3.028621e-01 1.099814e-01   1960         eng                      296
## 175  1.666339e-02 5.083332e-01   1960         eng                      286
## 176  1.004059e-03 5.533934e-02   1970         eur            eur       198
## 177  1.422839e-02 1.458672e-01   1970         eng                      348
## 178  1.802633e-02 7.455013e-01   1980         eng                      200
## 179  6.295698e-02 2.858333e-01   1950         non          easia       392
## 180  2.647742e-01 2.295066e-01   1960         eur            eur       240
## 181  1.031449e-01 6.178929e-01   1960         eng                      392
## 182  4.324643e-03 7.004858e-02   1950         eng                      364
## 183  1.756203e-02 2.953105e-01   1960         eng                      144
## 184  2.432816e-02 4.865098e-01   1970         eur            eur       368
## 185  9.104185e-03 3.847714e-01   1960         eur            eur       328
## 186  2.913643e-03 1.283331e-01   1970         eng                      366
## 187  1.144960e-03 2.066172e-01   1970         eng                      432
## 188  7.027426e-03 2.310981e-01   1960         eng                      616
## 189  6.548994e-01 5.969759e-01   1960         non            eur       448
## 190  1.646318e-02 5.613817e-01   1980         eng                      120
## 191  8.275699e-02 1.946143e-01   1980         eng                      170
## 192  2.516412e-02 2.669791e-01   1980         eng                      536
## 193  1.208822e-02 1.757300e-01   1950         eur            eur       280
## 194  6.829816e-03 2.944896e-01   1950         eur            eur       224
## 195  1.291407e-02 3.650194e-01   1990         eng                      200
## 196  8.481840e-04 2.989616e-01   1990         eur            eur       232
## 197  3.720383e-02 5.035051e-01   1980         eur            eur       352
## 198  1.571557e-02 1.705982e-01   1990         eur            eur       256
## 199  1.485605e-03 3.568995e-01   1990         eur            eur       248
## 200  1.121160e-01 7.939551e-01   1990         eng                      144
## 201  3.739464e-01 1.698233e-01   1990         eur            eur       128
## 202  2.315662e-01 6.635472e-02   1990         eng                      122
## 203  9.685479e-02 1.438412e-01   1990         eur            eur       344
## 204  5.711752e-02 1.823271e-01   1970         eng                      342
## 205  5.162349e-02 6.883229e-02   1990         eng                      262
## 206  4.175071e-02 1.568000e-01   1990         eng                      216
## 207  8.769470e-04 6.789571e-02   1980         eur            eur       196
## 208  2.506354e-01 4.139928e-02   1990         eng                      296
## 209  1.475745e-03 3.305788e-01   1970         eng                      360
## 210  1.653772e-02 1.633616e-01   1980         eur            eur       242
## 211  3.789027e-03 3.941439e-01   1970         non          easia       400
## 212  3.289594e-01 5.728361e-02   1990         eng                      376
## 213  1.209127e-02 2.544586e-01   1990         eur            eur       408
## 214  1.375016e-02 2.762853e-01   1990         eur            eur       306
## 215  9.297172e-02 3.977187e-01   1990         eng                      344
## 216  1.757395e-02 5.641914e-01   1990         eur            eur       358
## 217  2.191348e-03 9.971257e-02   1990         eng                      312
## 218  2.307323e-02 2.917083e-01   1990         eng                      328
## 219  1.145960e-02 4.771463e-01   1990         eng                      132
## 220  1.833435e-03 1.118341e-01   1980         eng                      244
## 221  1.807121e-02 1.868267e-01   1990         eur            eur       204
## 222  1.017248e-02 2.971256e-01   1990         eng                      200
## 223  1.110004e-02 7.316868e-02   1990         eng                      262
## 224  5.782540e-01 5.940149e-01   1960         eur            eur        96
## 225  1.015894e-02 7.751620e-02   1990         eng                      392
## 226  3.027097e-03 1.676169e-01   1990         eur            eur       184
## 227  3.632847e-02 3.078134e-01   1990         eur            eur       328
## 228  3.811891e-03 4.901490e-01   1990         eur            eur       128
## 229  4.174872e-03 2.745759e-01   1990         eur            eur       248
## 230  7.678280e-04 3.662580e-01   1990         eur            eur       254
## 231  7.371897e-01 3.575398e-01   1990         eng                      264
## 232  3.262524e-02 2.017441e-01   1990         eng                      200
## 233  2.689028e-03 1.195957e-01   1990         eur            eur       294
## 234  5.298817e-03 8.398282e-02   1990         eng                      344
## 235  1.235699e-02 2.276881e-01   1990         eur            eur       248
## 236  1.996098e-02 2.142895e-01   1990         eur            eur       312
## 237  1.388406e-02 5.110856e-02   1990         eng                      200
## 238  1.338270e-01 4.683027e-01   1990         eng                      328
## 239  1.199547e-02 8.087177e-02   1990         eur            eur       248
## 240  9.638333e-03 2.628653e-01   1980         eng                      168
## 241  1.028436e-02 5.475681e-01   1990         eng                      324
## 242  3.895124e-01 1.858054e-01   1990         eng                      264
## 243  5.460536e-02 2.745433e-01   1970         eng                     1100
## 244  3.820889e-03 2.596620e-01   1970         eng                      232
## 245  1.549150e-02 1.343831e-01   1950         eng                      522
## 246  1.458402e-02 1.084167e-01   1990         eng                      200
## 247  7.987229e-03 2.600564e-01   1980         eur            eur       296
## 248  4.130466e-03 5.521904e-02   1990         eur            eur       916
## 249  2.168225e-01 4.775817e-01   1980         eng                      136
## 250  3.456381e-02 2.041870e-01   1990         eng                      274
## 251  7.257575e-03 1.752065e-01   1990         eng                      288
## 252  4.682450e-01 3.517904e-01   1990         eng                       88
## 253  5.536564e-02 1.558729e-01   1960         eng                      426
## 254  6.617467e-03 1.032160e-01   1990         eng                      296
## 255  3.814800e-02 1.368813e-01   1990         eng                      232
## 256  1.197331e-01 1.093991e-01   1990         eng                      376
## 257  1.932655e-02 1.980868e-01   1990         eur            eur       330
## 258  1.942904e-03 2.822494e-01   1990         eur            eur       580
## 259  1.440182e-02 3.681257e-01   1980         eng                      194
## 260  5.285102e-03 5.700897e-01   1960         eng                      200
## 261  3.318703e-01 6.925480e-01   1970         eur            eur       328
## 262  2.588447e-02 2.332250e-02   1960         eng                      264
## 263  1.791648e-01 2.815025e-01   1960         eur            eur       144
## 264  3.015726e-01 6.245664e-01   1960         eur            eur       268
## 265  4.775083e-03 5.231993e-01   1990         eng                      282
## 266  3.567083e-02 3.648273e-01   1990         eur            eur       170
## 267  7.503571e-03 2.361924e-01   1990         eng                      154
## 268  3.661611e-03 1.163342e-01   1990         eng                      296
## 269  1.788105e-02 3.217276e-01   1950         eng                      232
## 270  3.064036e-02 1.515162e-01   1990         eng                      216
## 271  3.769111e-02 1.230831e-01   1990         eng                      260
## 272  6.855380e-03 4.006545e-01   1990         eng                      170
## 273  1.991694e-02 9.062620e-02   1990         eur            eur       288
## 274  8.488912e-03 5.091339e-01   1990         eng                      272
## 275  5.560467e-03 2.135292e-01   1990         eur            eur       232
## 276  2.424187e-01 3.013472e-01   1990         eur            eur       264
## 277  3.269817e-03 2.146229e-01   1990         eur            eur       792
## 278  8.662134e-01 3.333529e-01   1990         eur            eur       200
## 279  7.211591e-02 2.958865e-01   1990         eng                      454
## 280  9.563953e-03 9.869127e-02   1990         eng                      520
## 281  2.438171e-02 1.275587e-01   1990         eur            eur       630
## 282  7.977261e-03 2.485264e-01   1990         eur            eur       568
## 283  7.156043e-02 2.978146e-01   1990         eng                      232
## 284  2.635754e-03 2.335400e-01   1990         eur            eur       712
## 285  7.167430e-01 1.548725e-01   1980         eur            eur       120
## 286  1.249633e-01 7.882361e-01   1980         eur            eur       232
## 287  3.956247e-03 2.207083e-01   1990         eur            eur       528
## 288  1.463469e-01 3.019844e-01   1980         eng                      184
## 289  1.558182e-02 1.696346e-01   1990         eur            eur       246
## 290  2.115428e-02 5.259574e-02   1990         eng                      376
## 291  1.865534e-02 1.321512e-01   1990         eur            eur       632
## 292  2.054084e-02 3.316832e-01   1990         eur            eur       200
## 293  2.570702e-01 1.996156e-01   1990         eng                      336
## 294  8.973443e-01 2.648147e-01   1980         non                      232
## 295  2.243526e-02 3.784027e-01   1990         eur            eur       364
## 296  1.905175e-02 1.013910e-01   1990         eng                      232
## 297  3.181962e-02 2.318330e-01   1990         eng                      346
## 298  2.091761e-02 4.832830e-01   1990         eur            eur       872
## 299  6.149635e-01 8.265840e-01   1990         eng                      340
## 300  2.943417e-02 3.113042e-01   1990         eur            eur       136
## 301  1.339729e-02 3.556324e-01   1990         eng                      264
## 302  2.630460e-01 2.958106e-01   1990         eng                      220
## 303  2.672644e-01 6.299453e-01   1980         eur            eur       352
## 304  4.398005e-02 4.401787e-01   1990         eur            eur       280
## 305  1.028384e-02 4.479191e-01   1990         eur            eur       216
## 306  2.412535e-03 4.597809e-01   1990         eur            eur       232
## 307  2.883620e-02 5.275849e-01   1990         eur            eur       296
## 308  3.512091e-02 3.649644e-02   1990         eng                      456
## 309  1.272583e-02 2.346384e-01   1990         eur            eur       216
## 310  6.901653e-02 4.231172e-01   1990         eng                      168
## 311  7.169595e-02 1.531193e-01   1990         eng                      232
## 312  5.081407e-02 1.705910e-01   1980         eng                      344
## 313  7.608454e-01 3.686826e-01   1990         eur            eur       424
## 314  4.690061e-02 1.619781e-01   1990         eur            eur       440
## 315  1.703739e-03 7.252623e-02   1990         eng                      228
## 316  6.085792e-02 2.002483e-01   1990         eur            eur       724
## 317  9.638440e-04 4.372368e-01   1990         eur            eur       216
## 318  4.028683e-01 3.511196e-01   1990         non          easia       126
## 319  1.382081e-02 1.459009e-01   1990         eng                      600
## 320  6.444236e-02 2.066834e-01   1990         eng                      272
## 321  3.137736e-02 1.527939e-01   1980         eng                      264
## 322  2.334885e-02 5.933680e-01   1980         eur            eur       186
## 323  1.522834e-01 1.355871e-01   1990         eur            eur       176
## 324  5.571654e-02 7.462255e-02   1980         eng                      184
## 325  9.514850e-04 3.474606e-01   1980         eng                      180
## 326  2.015385e-02 5.019101e-01   1990         eng                      112
## 327  3.645844e-02 1.887048e-01   1990         eng                      344
## 328  1.018939e-01 2.098226e-01   1980         eur            eur       322
## 329  1.824341e-03 1.106535e-01   1960         eur            eur       264
## 330  2.537435e-01 2.371169e-01   1960         eng                      858
## 331  4.490105e-03 5.744878e-01   1950         non        classic       152
## 332  3.437863e-02 7.500868e-02   1950         eng                      284
## 333  9.632530e-04 4.901498e-02   1970         eur            eur       232
## 334  2.178997e-02 5.322833e-01   1990         eng                      184
## 335  5.184983e-03 6.010096e-01   1990         eng                      336
## 336  8.091663e-02 2.677972e-01   1990         eng                      168
## 337  8.370000e-05 2.962867e-01   1990         eur            eur       184
## 338  4.629526e-01 2.953681e-01   1990         non          easia       144
## 339  1.687522e-02 1.358940e-01   1990         eng                      550
## 340  4.117868e-02 3.877598e-02   1990         eur            eur       296
## 341  3.855643e-03 7.451575e-01   1990         non          easia       296
## 342  1.729587e-02 4.259723e-01   1990         eur            eur       196
## 343  1.111734e-02 1.349533e-01   1960         eng                      372
## 344  4.798655e-01 2.712271e-01   1970         eur            eur       200
## 345  3.882762e-03 5.485342e-01   1970         eng                      412
## 346  1.285858e-01 1.066863e-01   1970         eng                      748
## 347  5.602333e-03 5.771978e-02   1950         eng                      268
## 348  2.426819e-02 2.538397e-01   1960         eng                      522
## 349  2.773184e-02 1.074198e-01   1980         eng                      296
## 350  9.868088e-02 3.887152e-01   1990         eng                      270
## 351  1.055112e-02 2.745514e-01   1990         eng                      424
## 352  5.052258e-03 2.768558e-01   1990         eng                      170
## 353  6.234789e-01 2.561503e-01   1990         non        mideast       154
## 354  1.558096e-03 1.301548e-01   1990         eng                      234
## 355  3.224621e-02 3.688071e-01   1980         eur            eur       250
## 356  2.016833e-02 2.241215e-01   1990         eng                      344
## 357  4.513624e-03 3.926553e-02   1990         eur            eur       174
## 358  2.568663e-01 8.535503e-02   1990         eng                      368
## 359  3.390985e-01 2.116862e-01   1990         eng                      351
## 360  1.634624e-01 1.996756e-01   1990         eur            eur       520
## 361  7.596330e-02 3.659663e-01   1990         non        mideast        72
## 362  1.898342e-01 6.100154e-01   1990         non          easia       176
## 363  4.874211e-01 7.881509e-02   1990         eng                      272
## 364  1.280729e-01 9.889749e-02   1990         eng                      360
## 365  3.876764e-03 1.389745e-01   1990         eur            eur       232
## 366  2.052594e-03 4.112969e-01   1990         eur            eur       196
## 367  1.700711e-01 2.285452e-01   1990         eur            eur       296
## 368  4.822932e-02 2.309303e-01   1990         eng                      424
## 369  1.616538e-02 7.726237e-01   1980         eng                      270
## 370  8.720628e-01 4.509078e-01   1960         non          easia       256
## 371  4.973472e-01 2.186622e-01   1990         eng                      148
## 372  3.794234e-03 8.949484e-02   1990         eng                      122
## 373  8.161382e-02 1.881725e-01   1990         eng                      328
## 374  9.429157e-01 2.506730e-01   1990         eur            eur       216
## 375  3.814868e-03 4.130741e-01   1990         eur            eur       120
## 376  8.197450e-03 3.532102e-01   1990         eng                      232
## 377  1.998797e-03 1.040643e-01   1990         eng                      222
## 378  1.657118e-01 4.876844e-01   1990         eur            eur       232
## 379  1.162539e-02 2.360598e-01   1970         eng                      264
## 380  1.005793e-02 4.010396e-01   1970         eng                      132
## 381  6.882432e-02 7.105172e-02   1960         eur            eur       172
## 382  1.632173e-01 5.651901e-02   1950         eng                      240
## 383  2.339258e-03 8.623219e-02   1960         eng                      360
## 384  1.076614e-02 4.657215e-02   1960         eur            eur       184
## 385  3.252174e-02 5.470012e-02   1970         eur            eur       116
## 386  4.719121e-02 2.085297e-01   1950         eng                      296
## 387  9.009297e-02 2.240284e-01   1980         eur            eur       312
## 388  2.677845e-02 4.094383e-01   1990         eng                      200
## 389  2.070157e-02 3.108772e-01   1990         eng                      248
## 390  1.924084e-01 2.221406e-01   1990         eng                      456
## 391  3.139618e-01 4.660266e-01   1990         eur            eur       100
## 392  2.578686e-02 5.182614e-01   1990         eur            eur       144
## 393  3.723768e-01 5.320544e-01   1970         eng                      496
## 394  3.219979e-02 1.182333e-01   1970         eur            eur       368
## 395  1.591073e-02 7.548334e-02   1960         eur            eur       600
## 396  2.910398e-02 4.067671e-01   1970         eur            eur       346
## 397  1.479199e-02 1.765542e-01   1990         eur            eur       184
## 398  1.025329e-01 2.209801e-01   1990         eng                      344
## 399  2.920258e-02 6.746744e-02   1990         eng                      296
## 400  6.097579e-02 2.567137e-01   1990         eur            eur       510
## 401  1.581185e-01 2.384812e-02   1990         eng                      304
## 402  3.476210e-02 2.603691e-01   1990         eng                      296
## 403  5.710102e-03 4.066184e-01   1990         eng                      210
## 404  8.044283e-01 2.432670e-01   1990         eng                      142
## 405  1.370125e-02 6.079166e-02   1990         eng                      168
## 406  8.388880e-01 7.473461e-01   1970         non                      478
## 407  4.156537e-01 7.040558e-01   1990         eur            eur       168
## 408  1.341940e-02 4.763509e-01   1960         eur            eur       262
## 409  1.381141e-01 5.436025e-01   1990         eng                      212
## 410  8.340362e-03 5.152777e-02   1990         eng                      262
## 411  4.235817e-02 5.610608e-02   1990         eng                      204
## 412  4.186937e-03 3.164825e-02   1950         eur            eur       312
## 413  6.494299e-03 8.219972e-02   1980         eng                      638
## 414  9.599928e-02 4.415369e-01   1970         non        classic       404
## 415  8.732246e-01 2.107786e-01   1950         eur            eur       200
## 416  3.652998e-02 3.065668e-01   1990         eur            eur       456
## 417  9.423613e-03 7.748850e-02   1970         eur            eur       334
## 418  8.786912e-02 2.627937e-01   1950         non        classic       248
## 419  1.082549e-02 8.403453e-02   1990         eng                      424
## 420  5.579108e-03 4.013994e-01   1990         eur            eur        98
## 421  7.135059e-03 1.286808e-01   1990         eng                      372
## 422  1.908891e-02 1.444320e-01   1970         eng                      614
## 423  7.105732e-03 2.088348e-01   1990         eur            eur       232
## 424  6.463764e-03 6.313911e-02   1990         eng                      152
## 425  3.085508e-03 9.515184e-02   1980         eur            eur       248
## 426  9.961914e-03 6.462656e-02   1990         eng                      392
## 427  3.043849e-01 1.959279e-01   1990         eng                      160
## 428  3.759233e-03 1.470335e-01   1990         eur            eur       232
## 429  2.786904e-03 2.652788e-02   1990         eng                      730
## 430  2.742215e-01 1.761570e-01   1990         eur            eur       136
## 431  4.028498e-01 2.529028e-01   1990         eur            eur       124
## 432  2.535571e-03 4.729355e-01   1990         non                      176
## 433  8.860002e-01 8.314112e-01   1990         eur            eur       244
## 434  1.717163e-02 4.250732e-01   1990         eur            eur       196
## 435  1.054041e-03 4.697672e-02   1970         eur            eur       336
## 436  6.729416e-02 2.665104e-01   1990         non          easia       662
## 437  0.000000e+00 0.000000e+00   1990         eng                      372
## 438  8.825056e-01 6.512188e-01   1960         eng                      260
## 439  1.446533e-03 4.905940e-01   1990         eur            eur       394
## 440  8.647755e-03 8.853981e-02   1990         eng                      330
## 441  5.390033e-03 5.125934e-02   1980         eur            eur       876
## 442  2.662524e-02 1.908725e-01   1950         eng                      422
## 443  1.646529e-03 4.810714e-01   1990         eur            eur       276
## 444  5.078640e-04 2.441939e-01   1990         eur            eur       452
## 445  1.012182e-02 2.196698e-01   1990         eng                      230
## 446  9.946160e-04 5.023201e-02   1970         eng                      232
## 447  8.958022e-01 1.071936e-01   1980         eng                      120
## 448  9.446476e-02 8.556584e-02   1990         eng                      278
## 449  3.316640e-04 1.868292e-01   1970         eur            eur       320
## 450  7.153025e-01 1.401462e-01   1970         eng                      360
## 451  1.537209e-02 3.927766e-02   1990         eng                      294
## 452  6.049990e-02 1.008750e-01   1980         eur            eur       216
## 453  1.218227e-01 1.804264e-01   1990         eng                      344
## 454  1.802218e-02 1.948984e-02   1990         eur            eur       264
## 455  7.883577e-02 5.087000e-01   1990         eur            eur       280
## 456  1.497393e-01 2.836316e-01   2000         eng                      166
## 457  7.043417e-03 2.947621e-01   1950         eur            eur       358
## 458  7.854330e-01 7.005413e-01   1990         eng                      164
## 459  5.228811e-02 6.607800e-01   1990         eng                      456
## 460  5.043994e-02 2.873272e-01   1990         non                      132
## 461  3.926211e-03 4.078997e-01   1990         eng                      148
## 462  1.565389e-01 2.433802e-01   2000         eng                      588
## 463  8.652117e-02 4.069990e-02   1990         eur            eur       244
## 464  4.735156e-03 3.660563e-01   1990         eur            eur       200
## 465  1.697848e-02 1.820716e-01   2000         eur            eur       328
## 466  1.576296e-01 2.471177e-02   1990         eng                      142
## 467  1.129047e-02 1.408117e-01   1950         eur            eur       204
## 468  2.219570e-02 1.657867e-01   1950         eur            eur       168
## 469  2.160208e-02 4.095120e-02   1950         eur            eur       172
## 470  2.251106e-02 1.695107e-01   1990         eur            eur       172
## 471  4.703223e-03 1.456440e-01   1990         eur            eur       304
## 472  1.831117e-01 4.436984e-02   1990         eur            eur       136
## 473  1.663719e-02 7.091555e-01   2000         eng                      462
## 474  1.806629e-02 1.227601e-01   1960         eur            eur       450
## 475  8.802304e-01 7.824454e-01   2000         eng                      352
## 476  3.066507e-03 7.322027e-02   2000         eng                      216
## 477  6.227813e-01 6.155823e-01   2000         eur            eur       136
## 478  1.761590e-04 3.525607e-01   1990         eur            eur       252
## 479  4.314136e-01 1.318970e-01   1990         eur            eur       160
## 480  3.070365e-01 2.873314e-01   1990         non        mideast       312
## 481  1.903758e-03 2.060131e-01   2000         non         africa       484
## 482  1.229048e-01 8.566636e-02   1990         eur            eur       200
## 483  2.154281e-01 4.291963e-01   2000         eur            eur       200
## 484  3.976246e-02 3.786295e-02   1990         eng                      296
## 485  7.847514e-01 1.084224e-01   2000         non                      336
## 486  4.370902e-01 4.024080e-01   1990         eng                      360
## 487  8.366244e-03 4.856604e-01   1990         eng                      184
## 488  3.923092e-01 1.507110e-01   1950         eng                      232
## 489  3.306910e-04 2.074780e-01   1990         non        classic       188
## 490  3.982778e-02 6.481478e-01   1990         non                      164
## 491  2.065944e-02 2.013058e-01   1990         eur            eur       248
## 492  3.813379e-02 4.842449e-02   2000         eur            eur       278
## 493  4.436604e-02 9.268579e-02   2000         eur            eur       376
## 494  1.009188e-02 4.039409e-02   1990         eng                      568
## 495  8.198668e-01 3.957631e-01   1950         non          easia       646
## 496  6.963240e-02 7.239380e-02   1960         eur            eur       168
## 497  3.336433e-02 3.710142e-01   2000         non                      170
## 498  2.703421e-03 6.340077e-01   2000         eur            eur       200
## 499  9.476858e-03 2.494430e-01   2000         eur            eur       310
## 500  2.627670e-04 1.246502e-01   2000         eng                      108
## 501  2.208177e-03 5.882476e-01   1990         eng                      392
## 502  4.693789e-03 4.680229e-01   1970         eur            eur       224
## 503  3.856362e-03 2.520749e-01   1950         eng                      968
## 504  8.922785e-02 3.049966e-01   2000         eng                      488
## 505  1.229001e-01 2.699973e-01   1990         eur            eur       344
## 506  2.469507e-02 2.406162e-01   2000         eng                      328
## 507  4.625724e-02 3.552818e-01   1980         eur            eur       328
## 508  1.071119e-01 2.488475e-01   1960         non        classic       232
## 509  1.306071e-01 5.054892e-02   2000         non        mideast       100
## 510  3.943427e-02 3.044560e-01   1980         eur            eur        56
## 511  9.596898e-02 2.668797e-01   2000         non        mideast        88
## 512  9.995766e-01 3.138720e-01   2000         non                       92
## 513  8.511323e-02 1.914576e-01   1980         eng                      440
## 514  1.732363e-03 3.559686e-01   1950         eur            eur       360
## 515  1.211919e-02 3.535589e-01   1970         eur            eur       236
## 516  5.056896e-02 3.687307e-01   1970         eur            eur       262
## 517  2.855903e-03 1.184256e-01   1960         eur            eur       240
## 518  2.501743e-02 3.741280e-02   2000         eng                      260
## 519  3.827393e-02 7.506233e-02   1970         eur            eur       490
## 520  7.565426e-03 1.236967e-01   1950         eur            eur       372
## 521  4.417550e-03 8.989629e-02   1950         eur            eur       368
## 522  9.785363e-03 2.040506e-01   1960         eur            eur       572
## 523  1.807116e-03 5.051867e-01   1960         eur            eur       360
## 524  1.163434e-03 4.481970e-01   1970         eur            eur       168
## 525  3.144433e-02 6.332139e-01   1950         eur            eur       572
## 526  8.283564e-03 3.556099e-02   1960         eur            eur       264
## 527  1.123372e-02 4.694644e-01   2000         non                      230
## 528  9.851316e-02 1.598945e-01   1980         eur            eur       148
## 529  4.705878e-02 4.414013e-01   2000         eng                      232
## 530  1.185731e-01 3.975639e-01   2000         eng                      152
## 531  9.048320e-04 1.955091e-01   2000         eng                      264
## 532  2.806116e-02 1.226658e-01   2000         eng                      408
## 533  3.799505e-03 2.477877e-01   2000         eng                      470
## 534  9.651841e-01 3.091236e-01   1970         eur            eur       108
## 535  2.520302e-01 6.850154e-01   2000         eng                      244
## 536  1.100691e-03 9.969158e-02   2000         eng                      358
## 537  2.675908e-02 4.365525e-01   2000         eng                      224
## 538  2.277664e-03 5.821203e-02   2000         eng                      180
## 539  2.577445e-01 1.554841e-01   2000         eng                      228
## 540  5.500198e-02 1.050178e-01   2000         eng                      632
## 541  6.059563e-02 6.919170e-02   2000         eng                      248
## 542  2.407230e-02 5.875821e-01   2000         eng                      360
## 543  3.230533e-01 5.710366e-02   2000         eng                      472
## 544  1.182858e-01 1.272425e-01   2000         eng                      406
## 545  1.318900e-01 6.381281e-01   2000         non        mideast       208
## 546  8.984934e-03 5.568832e-02   2000         eur            eur       328
## 547  8.569530e-04 3.859121e-01   2000         eur            eur       280
## 548  9.908929e-03 1.302669e-01   2000         eng                      200
## 549  1.667452e-03 1.372580e-01   2000         eur            eur       456
## 550  1.949231e-02 2.414792e-01   2000         eur            eur       328
## 551  7.215811e-01 1.778842e-01   2000         eng                      264
## 552  4.384062e-02 7.575797e-02   2000         eng                      346
## 553  9.765193e-03 8.378913e-01   2000         eur            eur       194
## 554  7.092057e-03 3.472915e-01   2000         eur            eur       232
## 555  1.614356e-01 6.992095e-02   1990         non        mideast       116
## 556  1.827576e-02 3.344260e-03   1990         non        mideast       256
## 557  9.085066e-03 1.766534e-01   1990         non        mideast       100
## 558  2.632804e-02 1.753507e-01   1990         non        mideast       112
## 559  3.588314e-03 4.286512e-01   2000         eur            eur       926
## 560  3.539054e-02 4.180035e-02   2000         eur            eur       392
## 561  2.086301e-03 9.665653e-02   2000         eng                      360
## 562  5.316610e-04 7.270627e-02   2000         eur            eur       312
## 563  8.876212e-03 1.481410e-01   2000         eur            eur       200
## 564  8.078082e-03 6.632431e-02   1990         eng                      654
## 565  2.382835e-01 1.437582e-01   2000         eng                      142
## 566  6.463100e-02 3.195801e-01   1990         eur            eur       392
## 567  7.152052e-03 1.274014e-01   2000         eur            eur       168
## 568  9.915841e-01 4.456365e-01   2000         eng                      100
## 569  5.527930e-04 4.990638e-01   2000         eur            eur       168
## 570  1.687890e-01 7.457167e-02   2000         eng                      272
## 571  5.013677e-02 1.119628e-01   2000         eng                      456
## 572  1.671010e-02 4.489942e-02   2000         eng                      310
## 573  1.912207e-02 6.531098e-01   2000         eur            eur       200
## 574  5.447220e-04 2.455417e-01   2000         eur            eur       152
## 575  1.944197e-02 2.025609e-01   2000         eng                      328
## 576  5.186095e-02 4.352897e-02   2000         eng                      308
## 577  3.778922e-02 3.540307e-01   2000         eur            eur       296
## 578  3.943383e-01 9.864988e-02   2000         eur            eur       328
## 579  1.595721e-01 4.936902e-01   2000         eng                      224
## 580  1.946114e-02 1.651000e-01   2000         eng                      328
## 581  1.131777e-02 1.302861e-01   1990         eur            eur       488
## 582  1.298045e-01 1.604057e-01   2000         eng                      236
## 583  2.054943e-02 3.734792e-01   2000         eng                      296
## 584  1.392746e-01 5.379613e-01   2000         non          sasia       150
## 585  5.684838e-01 5.665723e-01   1960         eur            eur        80
## 586  2.722228e-01 4.686958e-01   2000         eur            eur       678
## 587  1.645675e-03 1.526939e-01   2000         eur            eur       190
## 588  1.104744e-02 2.854092e-01   1960         eng                      264
## 589  1.430310e-01 2.863042e-03   1960         eng                      200
## 590  1.382892e-02 1.847526e-01   1980         eur            eur       398
## 591  6.344871e-02 5.675217e-01   2000         eng                      328
## 592  1.129619e-03 1.216419e-01   2000         eng                      344
## 593  4.131202e-03 2.113716e-01   2000         eur            eur       328
## 594  3.157475e-03 7.692225e-02   2000         eng                      330
## 595  1.006429e-01 9.035768e-02   1960         eng                      304
## 596  1.818208e-03 1.085389e-01   1990         non        mideast       224
## 597  1.597892e-01 2.195715e-01   2000         non        mideast       308
## 598  4.441556e-01 2.547175e-01   1990         non        mideast       280
## 599  7.385429e-03 5.991197e-01   2000         eur            eur       168
## 600  2.762758e-02 2.363497e-01   1990         eng                      442
## 601  2.513938e-01 3.672991e-01   2000         eng                      484
## 602  8.678610e-04 4.527812e-01   2000         eur            eur       280
## 603  5.601624e-03 1.177159e-01   2000         eng                      178
## 604  3.617432e-02 2.554283e-01   2000         eng                      325
## 605  5.004413e-03 6.713075e-01   1950         eng                      172
## 606  9.455261e-03 7.159977e-02   2000         eng                      218
## 607  1.160607e-02 4.924341e-01   2000         eng                      264
## 608  3.558930e-03 5.530149e-02   2000         eur            eur       220
## 609  1.724108e-02 1.232028e-01   2000         eng                      376
## 610  1.460832e-01 6.464085e-02   2000         eng                      284
## 611  1.789092e-01 1.488318e-01   2000         eng                     1256
## 612  4.943143e-03 1.392577e-01   2000         eng                      296
## 613  4.212446e-01 2.292914e-01   2000         non            eur       264
## 614  8.394413e-03 1.842235e-01   2000         eng                      426
## 615  3.537689e-02 4.598859e-01   2000         eng                      858
## 616  2.293505e-02 8.085278e-02   1970         eng                      236
## 617  4.606118e-02 2.247530e-01   2000         eng                      160
## 618  1.175407e-02 7.024030e-01   2000         eng                      128
## 619  2.013937e-02 4.240694e-01   1990         eng                      404
## 620  3.440248e-03 6.653697e-02   2000         eng                      304
## 621  3.878848e-02 1.011326e-01   2000         eng                      264
## 622  2.685736e-02 7.627696e-02   2000         eng                      214
## 623  8.429292e-03 4.061114e-01   2000         eur            eur       160
## 624  9.043686e-01 6.380278e-01   1990         eur            eur       248
## 625  1.281503e-02 9.430259e-02   2000         eur            eur       760
## 626  4.388435e-03 1.612346e-01   1990         eng                      216
## 627  1.210272e-03 3.927233e-01   2000         eur            eur       168
## 628  7.178990e-04 2.806432e-01   1960         eur            eur       490
## 629  2.704731e-02 3.892227e-01   2000         non        mideast       136
## 630  9.754482e-03 9.365560e-02   2000         eng                      368
## 631  2.154929e-02 5.124052e-01   2000         eng                      296
## 632  2.758626e-02 2.090262e-01   2000         eng                      424
## 633  1.605695e-02 5.366681e-02   2000         eng                      360
## 634  1.374068e-02 9.786047e-02   2000         eur            eur       216
## 635  6.737115e-03 8.886420e-02   2000         eur            eur       272
## 636  2.869610e-02 2.989785e-01   1980         eur            eur       216
## 637  4.390585e-02 1.387748e-01   2000         eur            eur       522
## 638  3.436612e-02 2.008392e-01   2000         non          sasia       320
## 639  5.936903e-02 3.626529e-02   2000         eng                      408
## 640  1.360159e-01 5.511427e-02   2000         eng                      224
## 641  3.446206e-02 3.384538e-01   2000         non        mideast       296
## 642  2.431977e-01 4.438821e-01   1960         eng                      696
## 643  2.111326e-01 2.172656e-01   1950         non        mideast       294
## 644  2.372091e-02 7.346859e-01   1980         eng                      408
## 645  5.036385e-02 3.384100e-01   1980         eur            eur       342
## 646  7.382778e-03 4.807198e-01   1960         eur            eur       236
## 647  1.835156e-02 5.342191e-01   1960         eng                      200
## 648  1.037889e-01 6.446703e-01   1970         non          easia       394
## 649  3.135292e-03 8.093324e-02   1990         eng                      150
## 650  1.456421e-02 3.621630e-02   1990         eng                      548
## 651  2.561529e-03 5.304150e-02   2000         eng                      472
## 652  3.401570e-02 1.567499e-01   2000         eur            eur       344
## 653  3.174678e-02 5.653122e-01   2000         eng                      200
## 654  1.147391e-02 1.397967e-01   1950         non        mideast       320
## 655  3.116296e-03 6.376721e-01   2000         non        mideast       148
## 656  5.625120e-02 1.762180e-01   2000         non        mideast       128
## 657  4.650382e-02 6.951229e-01   2000         non        mideast       216
## 658  2.285996e-03 5.138600e-01   2000         non        mideast       212
## 659  5.960306e-03 3.753439e-02   1990         eng                      424
## 660  2.789436e-02 2.832863e-01   2000         eng                      346
## 661  3.340893e-03 3.268620e-01   1950         eng                      200
## 662  9.847289e-03 6.912238e-01   2000         eng                      192
## 663  1.035148e-02 7.684860e-02   2000         eng                      260
## 664  3.195123e-02 9.095915e-02   2000         non        classic       388
## 665  2.151670e-01 2.232563e-01   2000         non          easia       340
## 666  4.932907e-01 2.918945e-01   2000         eng                      128
## 667  7.663844e-01 7.023980e-01   2000         eng                      138
## 668  1.411011e-02 6.323041e-02   2000         eur            eur       136
## 669  1.876923e-02 4.941299e-01   1990         eng                      312
## 670  1.772764e-01 4.140761e-01   2000         eur            eur       346
## 671  2.607213e-02 8.578902e-02   2000         eng                      472
## 672  4.142500e-04 4.552344e-01   1990         eur            eur       176
## 673  8.491363e-03 3.407970e-01   2000         eng                      248
## 674  3.173708e-02 4.768063e-01   2000         eng                      300
## 675  1.478625e-01 4.786106e-01   2000         non        mideast       374
## 676  1.278560e-01 2.699871e-01   2000         eur            eur       222
## 677  7.655299e-02 3.313418e-02   2000         non        mideast       184
## 678  1.099085e-02 1.543478e-01   2000         non        mideast       148
## 679  9.590681e-02 1.855147e-01   2000         eng                      344
## 680  2.611066e-02 3.394841e-01   2000         eng                      296
## 681  1.303271e-02 1.878106e-01   2000         eur            eur       348
## 682  6.462363e-02 3.897904e-02   2000         eng                      420
## 683  4.671843e-03 1.230802e-01   2000         eur            eur       280
## 684  2.089885e-01 6.259641e-02   2000         eng                      392
## 685  3.051603e-03 4.334495e-01   2000         eur            eur       356
## 686  6.251619e-02 4.182546e-02   2000         eng                      264
## 687  8.609356e-02 1.550032e-01   2000         eur            eur       356
## 688  5.179239e-03 6.872586e-02   2000         eng                      246
## 689  0.000000e+00 0.000000e+00   2000         eng                      192
## 690  2.465613e-01 3.238034e-01   2000         non        mideast       260
## 691  2.726099e-02 2.725350e-02   1990         eur            eur       132
## 692  3.489685e-02 9.989492e-03   1990         eng                      484
## 693  2.431701e-02 6.499776e-02   1950         eng                      320
## 694  2.707483e-02 6.446077e-01   2000         eng                      616
## 695  7.343342e-03 4.323119e-01   2000         eur            eur       260
## 696  2.663328e-01 6.504242e-02   2000         eng                      296
## 697  1.845883e-01 1.182012e-01   2000         non          easia       310
## 698  1.550022e-02 4.907734e-02   2000         eur            eur       326
## 699  3.493382e-02 7.795476e-01   2000         eng                       84
## 700  8.024522e-03 3.126103e-01   2000         eng                      354
## 701  2.469943e-02 4.402340e-01   2000         eng                      238
## 702  5.923250e-02 2.038124e-02   2000         eur            eur       232
## 703  1.396260e-02 3.364312e-01   2000         eur            eur       324
## 704  2.198688e-02 2.541450e-01   2000         eur            eur       526
## 705  2.603793e-02 2.054667e-01   2000         eng                      292
## 706  2.437564e-02 1.009150e-01   2000         eur            eur       332
## 707  4.351415e-01 1.967411e-01   2000         eur            eur       228
## 708  2.385551e-02 1.400171e-01   2000         eur            eur       196
## 709  4.604218e-03 6.380694e-02   2000         eng                      332
## 710  8.400800e-03 1.783029e-01   2000         eng                      316
## 711  1.278026e-02 1.026978e-01   2000         eng                      532
## 712  9.734773e-01 7.872359e-01   2000         eur            eur       164
## 713  6.584322e-03 4.939735e-02   2000         eng                      386
## 714  3.930855e-01 6.830719e-01   2000         non          sasia       308
## 715  7.478302e-03 2.048870e-01   1990         non          sasia       200
## 716  5.043596e-02 6.507510e-02   1970         eng                      336
## 717  7.925384e-03 4.294655e-02   1970         eng                      264
## 718  1.961828e-02 4.465413e-02   1950         eng                      250
## 719  8.565219e-02 8.457360e-02   1970         eng                      464
## 720  4.481089e-02 2.094151e-01   1970         eng                      312
## 721  8.729693e-03 3.271999e-01   1980         eng                      328
## 722  2.961521e-01 5.411597e-01   1970         eng                      186
## 723  1.334983e-01 1.463115e-01   1950         eng                      464
## 724  6.609998e-01 2.715465e-03   1990         eng                       92
## 725  2.528370e-02 6.014616e-02   1960         eng                      344
## 726  2.437216e-01 4.850302e-01   1960         eng                      264
## 727  1.255233e-02 6.671278e-02   1970         eng                      332
## 728  5.664293e-01 7.738458e-02   1980         eng                      284
## 729  5.267153e-02 8.111555e-02   1970         eng                      248
## 730  7.986211e-03 3.975760e-02   1970         eng                      882
## 731  7.546291e-02 2.140759e-01   1970         eng                      188
## 732  3.252712e-02 1.768672e-01   1980         eng                      424
## 733  1.288581e-02 1.391753e-01   1990         eng                      264
## 734  1.081929e-01 6.972619e-02   1960         eng                      504
## 735  5.059164e-03 9.882083e-02   1970         eng                      296
## 736  6.153954e-02 2.660737e-01   1990         eng                      626
## 737  1.294970e-04 2.085291e-01   1980         eng                      208
## 738  1.009809e-01 4.362115e-02   1980         eng                      312
## 739  7.909244e-03 1.298548e-01   1980         eng                      330
## 740  7.206030e-02 2.193796e-01   1970         eng                      342
## 741  4.258472e-01 3.505344e-02   1970         eng                      198
## 742  8.265789e-02 5.916064e-02   1970         eng                      368
## 743  1.504814e-02 4.687958e-01   1960         eng                      324
## 744  2.352743e-02 2.601697e-01   1980         eng                      356
## 745  4.547423e-02 2.487722e-01   1970         eng                      264
## 746  3.030587e-02 7.522665e-02   1970         eng                      260
## 747  7.295073e-02 2.323405e-01   1970         eng                      184
## 748  1.187651e-02 2.464548e-01   1960         eng                      290
## 749  4.637781e-02 2.328357e-01   1990         eng                      408
## 750  7.559544e-02 4.273002e-01   1970         eng                      102
## 751  6.834751e-03 1.166694e-01   1970         eng                      216
## 752  9.732573e-02 9.101773e-02   1950         eng                      622
## 753  2.158972e-02 8.154659e-02   1960         eng                      612
## 754  3.207123e-02 3.609425e-01   1960         eng                      246
## 755  4.605985e-01 2.846417e-02   1970         eng                      328
## 756  3.222205e-02 6.023535e-01   2000         eng                      340
## 757  8.429572e-02 1.153977e-01   1980         eng                      340
## 758  1.459784e-02 5.119099e-02   2000         eur            eur       484
## 759  7.988810e-02 7.513004e-01   2000         eur            eur       140
## 760  1.806343e-01 7.969329e-02   2000         eng                      242
## 761  1.221821e-01 6.107806e-01   2000         eur            eur       164
## 762  1.875889e-01 4.926473e-02   2000         eur            eur       250
## 763  7.862449e-03 8.253454e-02   2000         eng                      324
## 764  1.034204e-01 6.144933e-02   1950         eng                      232
## 765  0.000000e+00 0.000000e+00   2000         eur            eur       440
## 766  2.551482e-02 2.437813e-02   2000         non          sasia       236
## 767  6.262720e-02 8.184440e-01   2000         non          easia       212
## 768  7.306760e-04 1.255164e-01   2000         eur            eur       268
## 769  2.987552e-01 4.736042e-01   1990         eng                      508
## 770  2.669995e-02 4.955447e-01   1990         eur            eur       392
## 771  3.949617e-02 4.240946e-01   2000         eng                      372
## 772  6.615265e-02 4.499323e-01   2000         eng                      504
## 773  1.094284e-01 5.166176e-01   2000         eng                      504
## 774  3.412225e-01 2.648039e-02   2000         eur            eur       282
## 775  3.736613e-02 5.041115e-02   2000         eng                      440
## 776  1.007756e-01 5.029334e-01   1980         eng                      376
## 777  9.775017e-03 4.705034e-01   1970         eng                      312
## 778  1.549018e-02 3.211702e-01   1990         eng                      374
## 779  2.243219e-02 4.720898e-01   1980         eur            eur       602
## 780  4.437365e-02 7.115147e-02   1990         eng                      600
## 781  1.167886e-02 1.815451e-01   1980         eur            eur       706
## 782  7.695628e-03 1.046319e-01   1960         eng                      244
## 783  1.362699e-02 1.178583e-01   1970         eur            eur       266
## 784  8.533434e-03 3.238391e-01   1980         eur            eur       298
## 785  9.995500e-01 3.972116e-01   1970         eng                      160
## 786  7.032594e-02 4.938260e-02   1980         eng                      640
## 787  6.747446e-02 3.271821e-01   1970         eng                      926
## 788  7.648100e-01 1.548822e-02   1950         eng                      370
## 789  6.455868e-02 7.842064e-02   1970         eur            eur       728
## 790  1.234502e-02 2.621366e-01   1970         eur            eur       978
## 791  1.028757e-01 5.162965e-01   1970         eng                      360
## 792  1.842024e-01 4.802659e-01   1970         eng                      376
## 793  4.571421e-02 1.875650e-01   1970         eng                      796
## 794  1.528483e-02 6.185225e-01   1970         eng                      426
## 795  2.891007e-02 2.970864e-01   1970         eng                      358
## 796  3.937513e-01 2.325675e-01   1970         eur            eur       126
## 797  3.346457e-02 5.346252e-01   1950         eur            eur       368
## 798  6.794434e-02 6.616881e-01   1960         non          sasia       136
## 799  5.121723e-01 6.231160e-01   1960         eur            eur       436
## 800  9.836017e-02 8.243293e-02   1960         eur            eur       176
## 801  2.938904e-03 1.180391e-01   1950         eng                      230
## 802  2.640778e-01 2.965723e-01   1960         eng                      280
## 803  1.414850e-02 1.954660e-01   1980         eng                      408
## 804  2.247215e-02 1.116838e-01   1970         eng                      216
## 805  8.794955e-02 1.129379e-02   1980         eng                      210
## 806  1.895219e-02 2.755737e-01   2000         eng                      282
## 807  1.375183e-03 5.704182e-02   2000         eng                      244
## 808  7.015330e-04 1.578752e-01   2000         eur            eur       176
## 809  2.110097e-02 6.153559e-01   2000         non         africa       152
## 810  3.105204e-02 2.774002e-02   2000         non                      248
## 811  6.889104e-01 2.763409e-01   2000         non        mideast       108
## 812  1.636533e-01 5.659292e-01   2000         eng                      472
## 813  9.541892e-03 9.069376e-02   2000         non        mideast       182
## 814  5.012297e-01 7.351230e-01   2000         non          easia       244
## 815  8.142788e-03 5.670647e-02   1970         eng                      598
## 816  6.016290e-02 4.263854e-01   1970         eng                      552
## 817  4.678253e-02 1.861847e-01   1970         eng                      780
## 818  1.663327e-03 1.813807e-01   1970         eng                      360
## 819  7.854938e-01 2.373725e-01   1970         eur            eur       616
## 820  1.008948e-02 2.623637e-01   1990         eur            eur       456
## 821  6.069731e-03 1.098039e-01   1990         eur            eur       388
## 822  8.752410e-04 2.801411e-01   1990         eng                      682
## 823  5.125790e-01 6.496747e-01   1970         non        mideast       136
## 824  5.999371e-02 7.415667e-02   1990         eur            eur       232
## 825  9.835981e-03 4.919204e-02   1970         eng                      488
## 826  2.942125e-02 4.357597e-01   1970         eng                      486
## 827  2.467389e-01 4.061674e-02   1970         eng                      592
## 828  3.668913e-01 4.113128e-01   1970         eur            eur       664
## 829  1.038502e-02 3.889824e-01   2000         eng                      140
## 830  1.701943e-01 5.135228e-02   2000         eng                      160
## 831  1.021362e-03 6.351892e-02   2000         eur            eur       380
## 832  1.902546e-02 3.734099e-02   2000         eng                      146
## 833  9.761066e-03 4.238301e-01   1980         eur            eur       300
## 834  1.045075e-02 4.105915e-01   2000         non         africa       612
## 835  8.952447e-02 2.145330e-01   2000         eng                      266
## 836  7.071913e-02 7.123104e-02   2000         eng                      388
## 837  3.762268e-02 5.881443e-01   2000         non         africa       572
## 838  6.466438e-03 8.306214e-02   1960         eng                      456
## 839  9.303880e-03 3.289285e-01   2000         non        mideast       340
## 840  1.665342e-01 2.385588e-01   2000         eur            eur       450
## 841  6.167720e-04 1.401861e-01   1970         eur            eur       486
## 842  1.117319e-02 9.698430e-02   1960         eur            eur       352
## 843  1.142280e-02 2.832943e-01   1970         eur            eur       396
## 844  1.999159e-01 2.041823e-01   1960         eur            eur       304
## 845  9.983706e-01 2.531053e-01   1960         eng                      208
## 846  9.891505e-01 1.431170e-01   1950         eng                      134
## 847  8.973732e-02 5.525285e-01   1970         eng                      376
## 848  3.502400e-02 4.942226e-01   1960         eur            eur       328
## 849  2.918009e-01 1.052399e-01   1960         eng                      488
## 850  1.788559e-02 3.217840e-01   1960         eng                      392
## 851  1.803999e-03 5.404995e-01   1960         eng                      184
## 852  8.597379e-03 1.409594e-01   1960         eng                      344
## 853  7.210444e-03 9.179208e-02   1950         eng                      548
## 854  2.048046e-02 7.492385e-02   1950         eng                      586
## 855  3.263958e-03 4.177232e-01   1950         eng                      136
## 856  1.060852e-02 2.904718e-01   1950         eng                      280
## 857  4.880673e-01 7.293186e-02   1970         eng                      240
## 858  2.998684e-02 2.354678e-01   1950         eng                      328
## 859  2.919212e-02 1.737198e-01   1980         eur            eur       472
## 860  6.181423e-01 2.699869e-01   1960         eng                      464
## 861  5.564720e-02 6.125895e-02   1970         eng                      396
## 862  2.604237e-02 4.076819e-01   1950         eur            eur       406
## 863  3.588485e-02 9.280602e-02   1960         eng                      528
## 864  4.400506e-03 4.721693e-01   1960         eur            eur       168
## 865  6.186471e-03 3.135527e-01   1980         eng                      338
## 866  3.129043e-01 4.270589e-01   1960         non                      120
## 867  3.502199e-03 3.431085e-01   1950         eur            eur       104
## 868  2.101526e-03 2.316722e-01   1950         eur            eur       756
## 869  4.703309e-02 1.050252e-01   1950         eng                      360
## 870  3.282590e-03 1.887181e-01   1970         eur            eur       376
## 871  4.542433e-02 1.753795e-02   1950         eur            eur       172
## 872  1.556125e-03 1.983756e-01   1980         eur            eur       360
## 873  6.680935e-03 2.783962e-01   1950         eur            eur       260
## 874  5.680380e-04 3.063214e-01   1970         eur            eur       190
## 875  4.537930e-04 7.959660e-02   1950         eur            eur       390
## 876  5.011190e-04 4.205446e-01   1960         eur            eur       172
## 877  1.433935e-03 5.775998e-02   1960         eng                      200
## 878  7.113809e-03 3.067188e-01   2000         eur            eur       292
## 879  2.723471e-01 4.163344e-01   1960         eng                      428
## 880  1.229076e-01 2.872834e-01   1960         eur            eur       586
## 881  1.178633e-02 8.900658e-02   1960         eng                      264
## 882  3.651893e-02 3.630169e-01   1950         eng                      232
## 883  0.000000e+00 0.000000e+00   1960         eng                      248
## 884  3.674003e-02 1.468130e-01   1960         eng                      296
## 885  1.042640e-02 2.062972e-01   1950         eng                      294
## 886  1.678639e-02 1.574923e-01   1960         eng                      264
## 887  8.123634e-02 4.533699e-01   1960         eng                      272
## 888  4.624666e-02 5.386013e-02   1970         eur            eur        88
## 889  5.727420e-03 7.287700e-01   1950         eng                      320
## 890  8.903694e-01 6.846443e-01   1970         non                      200
## 891  3.304545e-03 1.085438e-01   1970         eur            eur       280
## 892  4.621605e-03 2.965463e-01   1980         eur            eur       216
## 893  3.737704e-03 2.617998e-01   1980         eur            eur       392
## 894  1.214723e-02 8.638349e-02   1960         eur            eur       266
## 895  1.321191e-01 1.593777e-01   1960         eng                      104
## 896  2.935995e-03 6.626167e-01   1960         eur            eur       434
## 897  2.289347e-01 1.422541e-01   1970         eng                      520
## 898  1.467596e-02 5.142748e-02   1960         eng                      360
## 899  1.561146e-01 2.136936e-01   1960         eng                      200
## 900  1.886091e-03 1.326414e-01   1950         eur            eur       108
## 901  1.318139e-02 1.309759e-01   1950         eur            eur       520
## 902  7.992758e-01 8.483914e-01   1960         eur            eur       264
## 903  1.294116e-01 4.740950e-01   1980         eng                     1512
## 904  4.292340e-02 2.813000e-01   1970         eng                      688
## 905  9.961318e-02 1.862944e-01   1970         eng                      288
## 906  0.000000e+00 0.000000e+00   1950         eng                      424
## 907  4.217649e-02 5.960564e-01   1950         eng                      296
## 908  2.805670e-02 3.854081e-01   1960         non        mideast       296
## 909  1.819550e-02 5.233265e-01   1970         eur            eur       320
## 910  3.109741e-01 7.953722e-02   2000         non        mideast       150
## 911  1.359546e-02 2.100499e-01   1970         eur            eur       456
## 912  7.945509e-03 7.673641e-01   1970         eur            eur       168
## 913  1.284531e-02 1.947844e-01   1960         eng                      232
## 914  2.732210e-03 4.390678e-01   1960         eur            eur       734
## 915  3.430000e-12 2.000000e-13   1950         eng                      668
## 916  1.760612e-01 2.190023e-01   1970         eur            eur       458
## 917  2.268967e-02 2.502525e-01   1950         eur            eur       462
## 918  2.114107e-03 4.182501e-02   1970         eur            eur       228
## 919  3.848857e-03 9.828445e-02   1950         eur            eur       362
## 920  2.823274e-03 2.181152e-02   1960         eur            eur       150
## 921  4.502629e-03 4.916744e-02   1970         eng                      328
## 922  2.599344e-02 3.625405e-01   1960         eur            eur       227
## 923  8.743173e-01 6.516441e-01   1960         eng                      486
## 924  4.859170e-04 5.053333e-02   1960         eng                      328
## 925  1.456266e-02 3.271957e-01   1970         eur            eur       402
## 926  1.672119e-01 5.577947e-01   1960         eur            eur       470
## 927  1.200068e-02 2.949285e-01   1970         eng                      344
## 928  4.661320e-01 2.877323e-01   1980         non        mideast       424
## 929  2.604122e-02 1.782052e-02   1950         eng                      272
## 930  2.796843e-01 2.403261e-01   1950         eng                      370
## 931  3.522677e-02 3.357306e-01   1960         non          easia       338
## 932  1.088084e-02 5.661198e-01   1950         eur            eur       254
## 933  2.714161e-02 1.458056e-01   1970         eng                      464
## 934  2.406862e-02 1.254995e-01   1960         eng                      256
## 935  3.027688e-02 1.245859e-01   1960         eur            eur       476
## 936  5.835980e-02 3.757075e-01   1950         eur            eur       368
## 937  8.493604e-03 1.561438e-01   1960         eng                      288
## 938  9.545720e-04 1.011492e-01   1960         eur            eur       220
## 939  3.050069e-02 4.906195e-02   1970         eur            eur       343
## 940  1.724446e-02 1.298017e-02   1950         eng                      360
## 941  1.858361e-01 7.305218e-02   1960         eng                      280
## 942  5.054941e-03 6.082541e-02   1950         eng                      434
## 943  3.180975e-03 1.630554e-01   1960         eur            eur       188
## 944  6.637341e-02 2.444971e-01   1960         eng                      292
## 945  1.591191e-02 8.534039e-02   1970         eng                      314
## 946  4.898274e-02 1.587619e-01   1950         eur            eur       164
## 947  2.952121e-02 1.301751e-01   1950         eur            eur       192
## 948  9.774930e-04 2.218831e-01   1960         eur            eur       220
## 949  3.476374e-02 2.414047e-01   1960         eng                      330
## 950  8.108865e-01 5.466771e-01   1970         eng                      332
## 951  4.745534e-03 8.504141e-02   1950         eng                      264
## 952  5.371976e-02 1.669580e-01   1960         eng                      216
## 953  3.206523e-02 3.390446e-02   1950         eng                      358
## 954  4.232826e-03 1.953338e-01   1950         eng                      282
## 955  3.414934e-02 5.343667e-01   1970         eng                      328
## 956  3.836156e-02 1.768776e-01   1970         eng                      192
## 957  2.054963e-02 3.229353e-01   2000         eng                      352
## 958  1.911818e-02 5.549347e-01   1960         non        mideast       268
## 959  2.038716e-02 2.979703e-01   1960         non                      208
## 960  2.500503e-02 5.806381e-02   1960         eng                      810
## 961  2.094995e-02 6.253605e-01   1950         eng                      706
## 962  7.478562e-02 7.301223e-02   1970         eng                      456
## 963  1.380090e-01 3.102570e-01   1960         eng                      120
## 964  0.000000e+00 0.000000e+00   1970         eng                      236
## 965  5.567362e-03 2.196109e-01   1960         eng                      280
## 966  2.201775e-03 1.378697e-01   1970         eng                      128
## 967  6.516752e-02 2.563262e-01   1960         eur            eur       284
## 968  2.970894e-02 1.256129e-01   1960         eng                      232
## 969  4.294291e-02 4.342628e-01   1950         eng                      336
## 970  3.808922e-03 3.501117e-01   1970         eur            eur       532
## 971  7.205683e-03 1.894864e-01   1970         eur            eur       534
## 972  8.759024e-03 2.277309e-01   1960         eng                      490
## 973  2.711944e-02 4.369531e-01   1960         eng                      462
## 974  5.738699e-02 2.668177e-01   1970         eng                      332
## 975  1.323768e-02 6.058107e-01   1950         eng                      200
## 976  4.651715e-02 6.561220e-02   1960         eur            eur       192
## 977  1.924223e-02 1.690519e-01   1950         eur            eur       280
## 978  2.858745e-01 8.413720e-02   1950         eng                      394
## 979  3.015315e-03 1.822150e-01   1960         eur            eur       304
## 980  5.644162e-02 1.068994e-01   1950         eur            eur       312
## 981  8.553300e-03 8.824327e-02   1970         eur            eur       194
## 982  7.949892e-01 1.376249e-01   1970         eng                      164
## 983  1.973509e-02 1.369298e-01   1960         eng                      226
## 984  3.802046e-01 4.669953e-01   1980         non          easia       408
## 985  7.758080e-02 3.825099e-02   1980         eur            eur       104
## 986  9.648617e-02 3.662058e-01   1980         eur            eur       380
## 987  4.794027e-02 3.275705e-01   1980         eur            eur       328
## 988  1.966317e-02 4.836486e-01   1980         non        mideast       260
## 989  7.830955e-03 3.490787e-01   1980         eng                      232
## 990  1.453019e-02 1.243689e-01   1950         eur            eur       200
## 991  6.914305e-03 3.428580e-01   1980         eur            eur       152
## 992  1.092122e-02 8.091083e-02   1980         eng                      276
## 993  1.547469e-02 7.523898e-01   1980         non         africa       376
## 994  4.110530e-04 9.463086e-02   1980         eng                      332
## 995  5.971720e-03 4.247758e-01   1980         eur            eur       246
## 996  3.926911e-03 3.901027e-01   1980         eur            eur       236
## 997  2.337237e-02 6.700251e-02   1960         eng                      256
## 998  1.730000e-11 3.270000e-13   1980         eng                      918
## 999  4.579741e-03 2.678995e-01   1980         eur            eur       280
## 1000 8.356775e-02 4.628524e-01   1980         eur            eur       184
## 1001 1.224883e-02 7.486840e-02   1950         eng                      360
## 1002 4.783647e-02 2.560958e-01   1980         eur            eur       248
## 1003 1.383380e-01 1.524130e-01   1980         eng                      264
## 1004 3.177206e-03 6.755816e-02   1980         eur            eur       214
## 1005 1.516118e-01 6.813799e-02   1980         eng                      208
## 1006 1.078782e-02 3.660235e-02   1980         eng                      632
## 1007 3.959669e-02 1.715299e-01   1980         eng                      328
## 1008 1.294712e-02 3.558744e-01   1980         eur            eur       344
## 1009 0.000000e+00 0.000000e+00   1980         eng                      332
## 1010 6.327722e-03 6.193379e-02   1980         eur            eur       328
## 1011 4.163976e-03 2.258701e-01   1980         eng                      936
## 1012 8.835261e-03 4.326925e-02   1980         eur            eur       396
## 1013 6.704082e-02 1.020398e-01   1970         eng                      328
## 1014 4.189459e-01 2.905204e-01   1980         eur            eur       248
## 1015 7.126705e-02 1.219655e-01   1980         eng                      122
## 1016 2.407451e-01 3.670180e-02   1980         eur            eur       176
## 1017 2.259751e-01 7.768035e-01   1980         eur            eur       132
## 1018 2.373844e-03 6.805827e-02   1980         eur            eur       176
## 1019 2.729506e-03 2.224662e-01   1980         eur            eur       202
## 1020 3.495378e-03 1.006231e-01   1980         eur            eur      1006
## 1021 6.210243e-03 2.527393e-01   1950         eng                      200
## 1022 1.092627e-02 1.600503e-01   1950         eng                      328
## 1023 3.766548e-02 4.575378e-02   1980         eur            eur       612
## 1024 9.521860e-03 3.030868e-01   1980         eng                      390
## 1025 3.853711e-01 3.661894e-01   1980         eur            eur       248
## 1026 3.443948e-01 4.414978e-01   1980         eng                      272
## 1027 4.450181e-02 1.997057e-01   1980         eur            eur       184
## 1028 6.946237e-03 4.044733e-01   1980         eur            eur       176
## 1029 1.589508e-02 2.741659e-01   1980         eng                      160
## 1030 5.713489e-03 5.514938e-01   1980         non         africa       368
## 1031 2.831476e-02 4.499200e-01   1980         eur            eur       232
## 1032 9.462774e-03 1.916832e-01   1980         eur            eur       296
## 1033 1.439901e-02 1.528842e-01   1980         eng                      144
## 1034 1.159483e-02 1.579451e-01   1980         eur            eur       158
## 1035 3.390842e-02 7.325425e-02   1980         eng                      200
## 1036 4.096021e-02 1.404697e-01   1980         eng                      318
## 1037 1.965285e-01 1.012544e-01   1980         eng                      232
## 1038 1.334330e-01 1.327084e-01   1980         eng                      336
## 1039 1.130749e-02 3.405594e-01   1980         eur            eur       320
## 1040 6.727807e-03 4.553036e-01   1980         eng                      294
## 1041 1.209007e-01 7.969599e-01   1980         eur            eur       494
## 1042 4.379703e-02 2.588006e-02   1980         eng                      792
## 1043 2.170544e-02 1.425347e-01   1980         eng                      228
## 1044 1.995955e-03 5.412368e-01   1980         eur            eur       216
## 1045 1.645765e-01 3.567962e-01   1980         eur            eur       108
## 1046 1.577453e-01 2.100952e-01   1980         non                      274
## 1047 5.738246e-03 5.463562e-01   1980         eur            eur       424
## 1048 2.439897e-01 1.435135e-01   1980         eur            eur       424
## 1049 4.755050e-02 2.742572e-01   1980         eur            eur       296
## 1050 1.193659e-02 1.627215e-01   1980         eur            eur       200
## 1051 2.610460e-03 2.406887e-01   1980         eng                      264
## 1052 8.741080e-04 2.857224e-01   1980         eur            eur       200
## 1053 2.349838e-02 9.025181e-02   1980         eur            eur       660
## 1054 1.748964e-03 1.179923e-01   1980         eur            eur       230
## 1055 6.943588e-02 1.320784e-01   1980         eng                      774
## 1056 5.837070e-01 1.006865e-01   1980         eur            eur       320
## 1057 2.681465e-01 5.129794e-01   1980         eur            eur       384
## 1058 5.162625e-02 4.079098e-01   1970         eur            eur       352
## 1059 2.958686e-02 1.860868e-01   1980         eur            eur       302
## 1060 4.180000e-05 3.225547e-01   1980         eng                      134
## 1061 2.365476e-02 1.459808e-01   1970         eng                      244
## 1062 3.260646e-02 3.569317e-02   1970         eng                      424
## 1063 1.271708e-02 1.246148e-01   1980         eur            eur       230
## 1064 3.317207e-02 4.074766e-01   1980         eur            eur       184
## 1065 5.630612e-02 4.183919e-02   1980         eur            eur       204
## 1066 9.940443e-01 1.599056e-01   1980         eng                      114
## 1067 1.297433e-01 1.762522e-01   1980         eur            eur       200
## 1068 1.000000e+00 7.415644e-01   1980         eng                      172
## 1069 6.937651e-01 3.950897e-01   1980         eng                      220
## 1070 1.996281e-03 9.772961e-02   1980         eur            eur       168
## 1071 1.193283e-02 2.518547e-01   1980         eur            eur       260
## 1072 2.184537e-02 3.334328e-01   1980         eur            eur       598
## 1073 5.064370e-04 6.970866e-02   1980         eur            eur       312
## 1074 1.566067e-02 1.520276e-01   1980         eur            eur       264
## 1075 4.930750e-02 3.667363e-01   1980         eng                      228
## 1076 8.615900e-02 2.311344e-01   1980         eur            eur       140
## 1077 1.564631e-02 1.355231e-01   1960         eng                      232
## 1078 4.273977e-03 1.679995e-01   1980         eur            eur       372
## 1079 1.072050e-02 2.232590e-01   1980         eur            eur       164
## 1080 2.334069e-03 2.981315e-01   1980         eng                      212
## 1081 2.543925e-01 1.939510e-02   1980         eng                      292
## 1082 2.020638e-02 5.689692e-01   1980         eur            eur       220
## 1083 1.133859e-02 8.062238e-01   1980         eur            eur       148
## 1084 8.503490e-03 8.348867e-02   1980         eur            eur       132
## 1085 1.311666e-03 3.092060e-01   1980         eng                      456
## 1086 2.362175e-02 1.405488e-01   1980         eng                      148
## 1087 5.235146e-03 6.883207e-02   1980         eur            eur       456
## 1088 2.247173e-01 2.353198e-01   1970         eng                      232
## 1089 2.546938e-01 4.471526e-01   1980         eur            eur       398
## 1090 9.683886e-03 3.746474e-01   1980         eur            eur       138
## 1091 3.071256e-01 2.754183e-01   1980         eng                      544
## 1092 2.163344e-01 5.242850e-01   1970         eur            eur       400
## 1093 4.332295e-03 4.455298e-01   1980         eur            eur       524
## 1094 3.231044e-01 3.318529e-02   1980         eng                      168
## 1095 5.984561e-03 6.096984e-01   1980         eng                      152
## 1096 2.757438e-03 2.990388e-01   1980         eur            eur       196
## 1097 2.227870e-02 7.877438e-01   1970         non          easia       952
## 1098 9.955059e-01 9.515796e-02   1980         eur            eur       400
## 1099 1.150337e-03 2.497496e-01   1960         eur            eur       388
## 1100 6.498749e-02 5.202905e-01   1960         eng                      218
## 1101 4.906069e-02 7.664637e-01   1980         non                      472
## 1102 6.270290e-01 6.697583e-01   1980         non          easia       210
## 1103 1.604248e-03 2.018565e-01   1980         eur            eur       164
## 1104 1.194130e-04 4.982562e-01   1980         eur            eur       136
## 1105 1.509545e-01 1.249656e-01   1980         eng                      188
## 1106 1.000203e-01 8.785983e-02   1980         eng                      744
## 1107 5.332788e-02 8.660288e-02   1980         eng                      428
## 1108 2.492620e-02 6.339197e-02   1980         eng                      216
## 1109 3.569070e-03 3.293030e-01   1980         eur            eur       724
## 1110 3.191577e-02 2.104659e-01   1980         eng                      560
## 1111 1.407063e-02 9.924041e-02   1980         eng                      562
## 1112 4.147355e-01 2.613569e-01   1980         eur            eur       188
## 1113 3.818289e-01 9.659508e-02   1980         eur            eur       298
## 1114 2.997516e-03 3.111975e-01   1970         eur            eur       596
## 1115 3.771712e-01 2.792545e-02   1950         eng                      248
## 1116 1.247313e-01 6.747641e-02   1980         eur            eur       240
## 1117 6.067486e-03 1.803388e-01   1980         eur            eur       188
## 1118 1.260099e-01 6.108885e-01   1970         eng                       92
## 1119 5.402627e-01 8.914988e-02   1980         eur            eur       136
## 1120 3.989111e-02 3.867082e-01   1980         eng                      172
## 1121 5.178927e-02 1.911444e-01   1980         eng                      192
## 1122 7.232884e-02 6.402411e-01   1980         eur            eur       152
## 1123 3.159787e-03 1.295749e-01   1950         eng                      232
## 1124 9.809060e-04 6.002454e-01   1980         eur            eur       330
## 1125 6.045293e-03 1.776528e-01   1970         eur            eur       718
## 1126 9.111730e-04 1.728919e-01   1980         non                       84
## 1127 1.243986e-01 1.520490e-01   1980         eur            eur       240
## 1128 1.503428e-02 1.143908e-01   1960         eur            eur       204
## 1129 4.520009e-01 2.807084e-01   1970         eur            eur       376
## 1130 1.158973e-03 2.579910e-01   1970         eng                      232
## 1131 3.046574e-03 1.916660e-01   1950         eur            eur       136
## 1132 6.186520e-02 5.246100e-01   1980         eng                      356
## 1133 3.317913e-03 1.017157e-01   1970         eng                      192
## 1134 6.180121e-02 8.487834e-01   1970         eur            eur       212
## 1135 0.000000e+00 0.000000e+00   1970         eng                      268
## 1136 2.789930e-04 4.525391e-02   1960         eur            eur       112
## 1137 3.688001e-03 1.147958e-01   1980         eng                      408
## 1138 9.978624e-03 3.725763e-02   1970         eur            eur       146
## 1139 1.203054e-02 4.094257e-01   1970         non        classic       304
## 1140 1.598155e-03 4.349552e-02   1970         eur            eur       252
## 1141 4.640015e-03 1.668402e-01   1950         eng                      246
## 1142 1.099105e-02 2.631155e-01   1980         eur            eur       268
## 1143 1.167346e-02 3.094817e-01   1980         eur            eur       252
## 1144 6.106220e-01 2.126197e-01   1970         non          easia       170
## 1145 4.836040e-01 5.511779e-03   1970         non                      132
## 1146 6.683193e-02 3.056873e-01   1970         eng                      296
## 1147 9.066892e-03 1.094060e-01   1970         eur            eur       392
## 1148 2.202541e-02 2.754102e-01   1970         eng                      216
## 1149 1.371227e-02 2.431156e-01   1970         eng                      280
## 1150 2.159507e-02 2.621672e-01   1970         eng                      458
## 1151 2.493123e-02 7.794539e-02   1960         eur            eur       392
## 1152 1.865541e-03 2.527491e-01   1950         eng                      520
## 1153 3.967889e-02 1.568215e-01   1950         eng                      392
## 1154 1.052377e-02 1.626654e-01   1980         eur            eur       408
## 1155 8.368246e-03 7.953744e-02   1970         eur            eur       332
## 1156 2.337434e-03 9.504782e-02   1970         eur            eur       302
## 1157 3.585078e-03 9.571915e-02   1970         eng                      200
## 1158 2.619853e-01 2.080311e-01   1970         eng                      136
## 1159 2.926014e-02 9.452901e-02   1970         eng                      192
## 1160 1.493018e-03 1.857916e-01   1970         eur            eur       420
## 1161 1.384042e-02 7.162513e-02   1970         non                      264
## 1162 5.420472e-01 1.818740e-01   1970         eng                      120
## 1163 2.703876e-02 4.539760e-01   1970         eur            eur       406
## 1164 3.176500e-02 5.551265e-02   1950         eng                      296
## 1165 1.368082e-02 3.240443e-01   1970         eng                      508
## 1166 9.161292e-02 2.763530e-01   1970         eng                      436
## 1167 2.995313e-01 2.660165e-01   1970         eng                      188
## 1168 6.101077e-03 3.501395e-01   1970         eur            eur       184
## 1169 2.849896e-02 3.417837e-01   1970         eur            eur       850
## 1170 2.698656e-03 1.124642e-01   1970         eur            eur       360
## 1171 9.999098e-01 6.526003e-01   1970         eur            eur        96
## 1172 3.987818e-03 7.268900e-02   1970         eng                      264
## 1173 5.790220e-01 3.080306e-02   1950         eng                      264
## 1174 5.743080e-04 9.937486e-02   1970         eng                      304
## 1175 6.923778e-01 7.983808e-01   1970         non        classic       176
## 1176 4.063886e-03 1.689043e-01   1970         eng                      248
## 1177 7.225402e-02 9.020627e-02   1970         eng                      102
## 1178 2.363443e-02 1.072463e-01   1970         eng                      344
## 1179 1.938457e-01 1.779362e-01   1970         eng                      200
## 1180 2.982123e-03 5.499621e-01   1970         eng                      100
## 1181 2.877325e-03 2.883509e-01   1970         eur            eur       232
## 1182 2.194372e-02 8.252020e-01   1970         eur            eur       140
## 1183 1.140273e-01 4.763557e-01   1970         eur            eur       262
## 1184 9.153963e-03 1.226804e-01   1950         eng                      268
## 1185 2.854000e-02 8.299408e-01   1970         eng                      202
## 1186 2.756799e-02 2.634793e-01   1970         eur            eur       280
## 1187 4.676281e-02 3.354189e-01   1970         eur            eur       464
## 1188 9.517657e-02 4.996740e-02   1950         eng                      280
## 1189 3.440569e-03 7.001543e-02   1970         eng                      180
## 1190 8.695823e-02 8.509473e-02   1960         eur            eur       400
## 1191 2.826612e-02 4.413439e-01   1960         eur            eur       238
## 1192 1.332921e-03 2.342409e-01   1970         eng                      212
## 1193 5.156749e-03 5.312581e-02   1970         eur            eur       324
## 1194 4.022476e-02 1.759772e-01   1970         eng                      714
## 1195 6.256578e-01 5.876227e-01   1970         eur            eur       300
## 1196 8.046668e-01 4.673606e-01   1970         eur            eur       340
## 1197 4.884219e-01 1.337247e-01   1970         eng                      160
## 1198 5.627028e-03 2.572005e-01   1960         eur            eur       648
## 1199 3.527635e-02 3.124375e-01   1970         eng                      268
## 1200 2.597930e-02 5.641025e-01   1970         eng                      138
## 1201 8.146790e-02 1.496249e-01   1970         eng                      474
## 1202 1.710625e-02 1.248695e-01   1970         eng                      264
## 1203 1.716721e-02 1.312038e-01   1960         eng                      200
## 1204 7.764349e-03 1.196247e-01   1950         eng                      206
## 1205 3.433083e-03 2.127483e-01   1970         eng                      220
## 1206 3.579261e-02 2.546133e-01   1960         eur            eur       168
## 1207 1.447687e-02 1.032518e-01   1970         eng                      392
## 1208 4.800000e-05 5.900251e-02   1960         eng                      316
## 1209 4.000072e-02 4.202243e-01   1980         eng                      360
## 1210 2.121940e-02 5.335632e-02   1960         eng                      600
## 1211 1.294934e-02 1.397163e-01   1960         eur            eur       402
## 1212 2.914880e-04 2.713789e-01   1950         eng                      232
## 1213 1.252243e-01 1.710242e-01   1970         eur            eur       280
## 1214 1.566045e-03 1.975884e-01   1960         eng                      264
## 1215 2.313021e-02 2.811661e-02   1960         non          easia       202
## 1216 2.596781e-02 6.279531e-01   1970         eng                      704
## 1217 2.791990e-02 6.475157e-02   1970         eng                      194
## 1218 1.344396e-01 1.146368e-01   1950         eng                      488
## 1219 6.269556e-03 2.566943e-01   1970         eng                      268
## 1220 1.922031e-03 7.727948e-01   1960         eng                      280
## 1221 1.165878e-02 3.898109e-02   1980         eng                      388
## 1222 3.053651e-02 1.514897e-01   1980         non        mideast       168
## 1223 3.411924e-03 1.317715e-01   1980         eng                      236
## 1224 1.029975e-02 5.461294e-02   1960         eur            eur       248
## 1225 4.561321e-03 3.044450e-01   1980         eur            eur      1162
## 1226 6.074581e-02 7.299791e-02   1970         eur            eur       774
## 1227 2.989761e-02 1.492642e-01   1980         eur            eur       314
## 1228 4.290037e-02 3.324260e-01   1980         eng                      272
## 1229 0.000000e+00 0.000000e+00   1980         eng                      392
## 1230 3.489586e-02 3.219023e-01   1980         non                      432
## 1231 8.213450e-03 3.545814e-01   1980         eng                      396
## 1232 3.538795e-03 4.202313e-01   1980         eur            eur       200
## 1233 2.672017e-01 1.687200e-01   1950         eng                      252
## 1234 8.145427e-03 4.906686e-02   1980         eur            eur       196
## 1235 6.419297e-03 4.512067e-01   1980         eur            eur       202
## 1236 2.111439e-02 1.383492e-01   1980         eng                      330
## 1237 8.694425e-03 5.836125e-01   1980         eng                      146
## 1238 4.212212e-01 3.393453e-01   1980         eur            eur       374
## 1239 6.318375e-01 5.602764e-02   1980         eng                      248
## 1240 1.499402e-02 2.144348e-01   1980         eng                      584
## 1241 4.273489e-01 7.704396e-01   1980         eur            eur       132
## 1242 4.148618e-02 3.273228e-01   1980         eur            eur       360
## 1243 1.434459e-01 4.445441e-01   1980         eur            eur       290
## 1244 3.443963e-03 4.443215e-01   1980         eur            eur       332
## 1245 3.640168e-02 2.083789e-01   1980         eur            eur       280
## 1246 2.008734e-01 1.122152e-01   1980         eng                      206
## 1247 1.686360e-03 5.609433e-01   1980         eur            eur       168
## 1248 2.726364e-02 4.699454e-02   1980         eng                      400
## 1249 2.505376e-02 2.974704e-01   1980         eur            eur       260
## 1250 9.618803e-01 3.352355e-01   1980         non                      104
## 1251 1.857376e-02 3.967038e-01   1980         eur            eur       516
## 1252 1.613499e-01 1.179450e-01   1960         eng                      280
## 1253 6.081680e-04 2.330729e-01   1980         eur            eur       310
## 1254 3.056321e-02 3.455825e-01   1980         eur            eur       288
## 1255 1.843611e-02 5.653550e-02   1980         eur            eur       136
## 1256 7.514948e-02 8.158226e-02   1980         eng                      280
## 1257 2.539442e-03 1.362202e-01   1950         eng                      326
## 1258 1.177139e-03 1.182352e-01   1970         eng                      248
## 1259 5.575603e-03 1.046235e-01   1980         eng                      262
## 1260 8.562258e-03 1.272825e-01   1970         eng                      248
## 1261 1.001029e-01 2.935718e-01   1980         non                      198
## 1262 1.087441e-01 8.829633e-02   1980         eng                      424
## 1263 1.496490e-01 6.626241e-01   1980         eng                      664
## 1264 1.017527e-01 1.091908e-01   1980         eng                      182
## 1265 7.158460e-04 1.595231e-01   1980         eur            eur       312
## 1266 4.419680e-02 3.512647e-01   1980         eng                      304
## 1267 5.468772e-02 1.103515e-01   1980         eur            eur       376
## 1268 4.313855e-03 1.122722e-01   1980         eur            eur       232
## 1269 9.817763e-01 2.398444e-01   1980         eng                       88
## 1270 1.148216e-02 2.634247e-01   1980         eng                      324
## 1271 9.985672e-01 2.640134e-02   1980         eur            eur       184
## 1272 1.173659e-02 3.537245e-01   1980         eur            eur       150
## 1273 3.605096e-02 4.304321e-01   1980         eng                      424
## 1274 2.321434e-01 8.283196e-01   1980         eng                      102
## 1275 2.179104e-03 2.167030e-01   1980         non            eur       328
## 1276 9.038907e-01 3.790713e-01   1950         eng                      138
## 1277 9.756399e-01 2.249136e-01   1960         eng                      124
## 1278 9.747145e-01 4.854526e-01   1980         non          easia       212
## 1279 9.717901e-01 4.453977e-02   1970         eur            eur       168
## 1280 7.845553e-01 4.535108e-01   1980         non          easia       156
## 1281 3.829445e-01 4.974723e-01   1950         non        mideast       138
## 1282 7.332888e-01 3.655032e-01   1960         eng                      168
## 1283 2.385203e-02 4.531338e-01   1980         eur            eur       184
## 1284 1.207884e-02 3.209944e-01   1980         eng                      200
## 1285 8.745050e-01 2.853721e-01   1970         eur            eur       250
## 1286 9.571898e-01 2.590482e-01   1980         non                      120
## 1287 8.190557e-01 6.989465e-01   1980         non          easia       392
## 1288 2.206420e-03 7.169831e-01   1980         eng                      260
## 1289 2.803664e-02 1.358030e-01   1980         eur            eur       184
## 1290 9.765752e-02 2.356272e-01   1980         eur            eur       346
## 1291 1.937724e-01 3.121916e-01   1980         non            eur       314
## 1292 9.429929e-02 2.676259e-01   1950         eur            eur       190
## 1293 5.711606e-01 7.139017e-01   1980         eng                      336
## 1294 9.248817e-01 2.185144e-01   1960         eng                      268
## 1295 1.001829e-02 9.985499e-02   1960         eur            eur       436
## 1296 1.553479e-01 4.331917e-01   1980         non        mideast       272
## 1297 1.540034e-01 1.399164e-01   1970         non                      196
## 1298 4.939046e-02 1.398963e-01   1980         eng                      296
## 1299 1.327333e-01 5.164848e-01   1950         eng                      224
## 1300 7.007881e-01 2.982755e-01   1970         eur            eur       104
## 1301 9.618944e-01 3.000659e-01   1970         eur            eur       100
## 1302 7.639618e-01 1.734624e-01   1960         eur            eur       296
## 1303 1.973038e-02 7.087171e-01   1950         non          easia       200
## 1304 6.538462e-01 6.484716e-01   1960         non                      410
## 1305 3.761911e-01 2.200464e-01   1960         eur            eur       108
## 1306 2.861158e-02 1.048861e-01   1970         eur            eur       206
## 1307 1.075178e-01 2.695622e-01   1970         non          easia       474
## 1308 7.169807e-02 2.540030e-01   1970         non          easia       472
## 1309 5.792785e-01 2.564194e-02   1960         eng                      192
## 1310 8.651574e-01 2.695419e-01   1970         non          easia       140
## 1311 5.683417e-01 2.124281e-01   1960         eur            eur       336
## 1312 3.353040e-01 3.641819e-01   1970         eur            eur       342
## 1313 9.913909e-01 4.995602e-01   1950         non          easia       250
## 1314 5.541467e-02 3.555926e-01   1960         eng                      232
## 1315 9.947450e-01 7.301873e-01   1950         eng                       88
## 1316 9.737914e-01 2.604720e-01   1970         eur            eur       224
## 1317 9.243108e-01 3.531650e-01   1970         eur            eur       258
## 1318 1.051079e-01 1.605399e-01   1960         eur            eur       212
## 1319 4.614374e-02 1.747736e-01   1960         eng                      392
## 1320 9.972977e-03 2.866825e-01   1970         eng                      190
## 1321 9.456304e-01 5.333909e-01   1960         eng                      402
## 1322 5.665087e-01 2.822444e-01   1960         non          easia       174
## 1323 5.458493e-02 1.955747e-01   1970         eur            eur       440
## 1324 5.022370e-03 6.697119e-01   1970         eur            eur       360
## 1325 3.671640e-01 5.247973e-01   1970         eur            eur       228
## 1326 9.636172e-01 3.519888e-01   1960         eng                      200
## 1327 3.251257e-01 2.945032e-01   1960         eur            eur       332
## 1328 8.920090e-01 6.005141e-02   1950         non        mideast       212
## 1329 4.213439e-03 5.973683e-01   1950         non          easia       238
## 1330 6.846037e-01 6.102119e-01   1960         eur            eur       392
## 1331 7.928666e-01 6.917214e-01   1960         eur            eur       142
## 1332 1.779498e-01 2.859109e-01   1960         eur            eur       330
## 1333 9.926456e-01 4.626404e-01   1960         eur            eur       528
## 1334 9.274713e-01 5.051140e-02   1960         eur            eur       212
## 1335 6.660511e-01 9.520892e-02   1970         eur            eur       154
## 1336 6.844497e-01 3.178154e-01   1970         non        mideast       248
## 1337 9.590870e-01 3.341599e-01   1970         non         africa       214
## 1338 9.556208e-01 8.015708e-01   1950         non          easia       296
## 1339 9.486180e-01 5.885725e-01   1970         non          easia       192
## 1340 1.108600e-01 3.061404e-01   1960         eng                      382
## 1341 9.390082e-01 1.794623e-01   1960         eur            eur       168
## 1342 9.538113e-01 4.057854e-01   1960         eur            eur       152
## 1343 9.691447e-01 3.909075e-01   1970         eur            eur       152
## 1344 1.227412e-01 7.332240e-01   1960         eng                      720
## 1345 9.948618e-01 1.816872e-01   1980         eur            eur       104
## 1346 4.279323e-02 5.160262e-01   1980         eng                      136
## 1347 1.395850e-01 1.039432e-01   1980         eur            eur       816
## 1348 6.943573e-01 1.395636e-01   1970         eng                      328
## 1349 3.670159e-01 1.641487e-01   1980         eur            eur       616
## 1350 4.346121e-03 9.940170e-02   1980         eur            eur       750
## 1351 1.449079e-03 9.010330e-02   1980         eur            eur       870
## 1352 4.647097e-02 1.224929e-01   1980         eng                      420
## 1353 1.633075e-02 2.404236e-01   1960         eur            eur       266
## 1354 3.952154e-03 4.124265e-01   1970         eur            eur       200
## 1355 7.595728e-02 9.183750e-02   1980         eng                      456
## 1356 5.639101e-01 6.439042e-02   1980         eng                      246
## 1357 6.213920e-04 2.202390e-01   1970         eng                      336
## 1358 9.997451e-01 4.208144e-01   1960         non            eur       144
## 1359 1.110886e-02 2.335407e-01   1960         eur            eur       300
## 1360 1.706524e-02 4.370608e-01   1960         eur            eur      1562
## 1361 3.686213e-01 5.308967e-01   1970         non          easia       224
## 1362 3.165755e-02 1.651079e-01   1960         eur            eur       492
## 1363 9.823687e-02 3.277232e-01   1950         eng                      476
## 1364 3.090177e-03 7.846580e-02   1950         eng                      350
## 1365 1.138687e-01 2.602945e-01   1970         eng                      284
## 1366 1.346766e-02 5.208562e-01   1970         eng                      328
## 1367 2.894526e-02 2.919882e-01   1950         eng                      228
## 1368 4.437620e-01 2.814159e-01   1970         eur            eur      1136
## 1369 2.780080e-01 3.749538e-01   1950         eur            eur       310
## 1370 1.218094e-03 1.406419e-01   1950         eur            eur       498
## 1371 5.523880e-04 3.714872e-01   1950         eur            eur       474
## 1372 1.453312e-02 2.681190e-01   1950         eur            eur       564
## 1373 2.833640e-02 3.714269e-01   1960         eur            eur       296
## 1374 1.493033e-01 1.070506e-01   1960         eur            eur       168
## 1375 9.600042e-03 2.509893e-01   1970         eur            eur       312
## 1376 3.196356e-01 3.742641e-01   1970         eur            eur       216
## 1377 0.000000e+00 0.000000e+00   1970         eng                      198
## 1378 9.502317e-02 7.279444e-01   1960         non        classic       220
## 1379 1.952721e-02 3.868928e-01   1950         eur            eur       392
## 1380 1.356994e-01 8.505854e-02   1970         eur            eur       268
## 1381 1.945373e-02 1.710933e-01   1970         eur            eur       202
## 1382 1.054840e-02 2.333069e-01   1960         eur            eur       454
## 1383 6.484201e-03 8.625810e-02   1960         non         africa       172
## 1384 8.951360e-04 4.824589e-01   1950         eur            eur       412
## 1385 1.055624e-02 1.480526e-01   1960         eng                      808
## 1386 2.427017e-03 2.919401e-01   1960         eng                      218
## 1387 1.687216e-02 4.022864e-01   1950         eur            eur       598
## 1388 2.145539e-02 3.910854e-01   1970         eng                      200
## 1389 1.055147e-02 7.091950e-01   1970         eng                      946
## 1390 1.656204e-02 1.539425e-01   1980         eur            eur       260
## 1391 0.000000e+00 0.000000e+00   1970         eur            eur       162
## 1392 7.421436e-03 1.341863e-01   1980         eng                      392
## 1393 9.892076e-03 3.519452e-01   1970         eng                      780
## 1394 6.705340e-03 4.349049e-02   1970         eng                      172
## 1395 1.881057e-02 6.226834e-01   1970         eng                      264
## 1396 6.889532e-02 1.333950e-01   1980         non          easia       344
## 1397 2.819933e-03 2.271800e-01   1950         eur            eur       160
## 1398 5.298216e-03 2.975909e-01   1980         eur            eur       504
## 1399 2.729127e-02 6.688741e-01   1980         eng                      232
## 1400 7.900000e-05 2.734930e-01   1950         eur            eur       240
## 1401 2.114796e-02 7.077768e-01   1960         eur            eur       298
## 1402 5.029027e-03 2.211728e-01   1960         eng                      200
## 1403 1.541962e-03 2.270001e-01   1980         eng                      328
## 1404 3.801648e-03 8.972332e-02   1960         eur            eur       232
## 1405 1.123571e-02 1.504449e-01   1950         eur            eur       312
## 1406 6.097968e-02 1.412157e-01   1960         eur            eur       254
## 1407 1.278427e-02 9.866960e-02   1950         eur            eur       392
## 1408 9.029600e-04 1.682208e-01   1970         eng                      232
## 1409 1.126070e-02 2.530804e-01   1960         eur            eur       264
## 1410 7.875652e-02 3.344166e-01   1950         eur            eur       296
## 1411 1.899926e-02 3.714302e-01   1970         eng                      152
## 1412 2.556348e-02 2.489332e-02   1950         eng                      232
## 1413 4.272548e-01 7.803213e-02   1960         eng                      232
## 1414 5.019441e-03 5.360502e-02   1960         eur            eur       296
## 1415 5.371480e-03 4.476989e-02   1950         eng                      312
## 1416 2.870880e-04 1.048000e-01   1970         eng                      248
## 1417 6.704619e-03 2.217309e-01   1960         eng                      176
## 1418 3.828261e-02 7.521995e-02   1950         eng                      320
## 1419 2.055003e-01 7.873703e-02   1950         eng                      242
## 1420 1.738095e-02 2.603822e-01   1970         eng                      328
## 1421 3.420955e-02 4.120151e-02   1970         eng                      994
## 1422 1.451110e-02 3.657760e-02   1970         eng                      312
## 1423 2.946308e-03 1.414421e-01   1970         eng                      330
## 1424 4.423066e-02 3.189942e-02   1960         eng                      392
## 1425 2.057465e-01 3.309765e-01   1960         eng                      264
## 1426 2.704834e-02 1.004893e-01   1950         eng                      326
## 1427 1.996704e-01 1.718243e-01   1970         eng                      274
## 1428 7.152820e-04 1.195832e-01   1970         eng                      386
## 1429 1.382086e-02 7.657146e-02   1970         eng                      376
## 1430 2.567862e-03 4.825714e-01   1960         eng                      232
## 1431 1.476398e-02 4.819473e-01   1970         eng                      208
## 1432 1.229931e-02 3.324799e-01   1970         eng                      224
## 1433 1.559467e-02 2.195072e-01   1960         eng                      238
## 1434 6.590735e-02 1.248293e-01   1970         eng                      424
## 1435 1.458096e-01 8.211556e-01   1960         eng                      352
## 1436 3.863465e-03 4.549831e-01   1960         eng                       62
## 1437 5.288278e-02 1.364157e-01   1970         eng                      364
## 1438 1.355971e-02 2.396612e-01   1980         eng                      232
## 1439 8.221488e-02 3.612320e-02   1960         eng                      200
## 1440 5.292227e-02 8.164222e-02   1950         eng                      168
## 1441 2.181727e-01 7.598816e-02   1960         eng                      168
## 1442 4.470218e-03 4.247830e-01   1950         eng                      266
## 1443 1.003715e-02 4.033318e-01   1960         eng                      312
## 1444 5.442590e-02 1.828379e-01   1960         eng                      264
## 1445 1.240119e-01 1.390766e-01   1950         eng                      362
## 1446 7.958869e-02 1.354641e-01   1970         eur            eur       266
## 1447 2.323116e-02 1.067414e-01   1950         eng                      330
## 1448 1.113086e-01 2.740880e-02   1960         eng                      330
## 1449 1.361525e-01 1.498823e-01   1960         eur            eur       202
## 1450 3.564208e-02 1.306528e-01   1950         eur            eur       360
## 1451 1.137333e-03 6.366395e-02   1970         eng                      284
## 1452 5.914063e-03 3.082678e-01   1970         eng                      280
## 1453 6.802951e-02 3.693801e-01   1950         eur            eur       138
## 1454 1.444648e-02 7.294398e-02   1950         eng                      252
## 1455 6.973988e-03 2.145364e-01   1960         eur            eur       378
## 1456 1.117128e-01 1.329463e-01   1970         eng                      224
## 1457 3.476612e-03 5.793111e-01   1960         eur            eur       268
## 1458 5.066638e-01 6.895987e-01   1960         eng                      242
## 1459 2.549431e-02 3.801891e-02   1950         eng                      334
## 1460 3.329551e-02 5.908329e-01   1970         eur            eur       230
## 1461 2.823114e-02 5.643307e-01   1970         eng                      216
## 1462 4.423119e-02 5.243439e-01   1960         eur            eur       234
## 1463 5.459819e-03 3.983840e-01   1970         eng                      270
## 1464 1.203832e-03 1.772821e-01   1970         eur            eur       332
## 1465 1.187500e-01 7.434306e-02   1960         eng                      200
## 1466 4.030130e-01 8.814312e-02   1950         eur            eur       232
## 1467 1.019521e-02 2.825512e-01   1980         non          easia       214
## 1468 2.250602e-03 1.018654e-01   1980         eur            eur       296
## 1469 4.154385e-03 2.983290e-01   1950         eng                      312
## 1470 2.437513e-03 4.873882e-01   1960         eur            eur       172
## 1471 3.236902e-02 1.791334e-01   1950         eng                      428
## 1472 1.226335e-01 8.388661e-02   1960         eng                      618
## 1473 1.582462e-02 9.316133e-02   1970         eng                      346
## 1474 9.451944e-03 2.909460e-01   1960         eng                      248
## 1475 2.744250e-03 5.352629e-02   1960         eng                      458
## 1476 8.390720e-02 6.526733e-02   1950         eng                      330
## 1477 8.721760e-03 3.524819e-01   1950         eur            eur       396
## 1478 2.364759e-02 8.187056e-02   1950         eng                      556
## 1479 2.374823e-03 4.486413e-02   1970         eng                      534
## 1480 3.766198e-02 3.034307e-01   1960         eng                      384
## 1481 2.034366e-02 1.578759e-01   1950         eng                      200
## 1482 4.358175e-01 1.242409e-01   1970         eng                      296
## 1483 5.784755e-03 3.124708e-01   1960         eng                      216
## 1484 3.326880e-03 1.251161e-01   1970         eng                      336
## 1485 5.692495e-02 1.375213e-01   1960         eng                      204
## 1486 6.767970e-04 5.168015e-01   1960         eng                      200
## 1487 1.421512e-02 1.598364e-01   1960         eng                      312
## 1488 5.966296e-03 4.464117e-01   1980         eng                      204
## 1489 5.451949e-03 9.692333e-02   1950         eng                      232
## 1490 9.841459e-02 1.499220e-01   1960         eng                      332
## 1491 3.190845e-02 2.004774e-01   1960         eng                      194
## 1492 6.660141e-02 6.376059e-01   1970         eng                      212
## 1493 1.495869e-01 6.779982e-02   1970         eng                      264
## 1494 2.991717e-03 2.876592e-01   1980         eng                      198
## 1495 1.343751e-01 1.362590e-01   1960         eng                      584
## 1496 4.479101e-02 9.948607e-02   1970         eng                      264
## 1497 1.179304e-01 5.974558e-02   1950         eng                      366
## 1498 5.309437e-02 1.392872e-01   1950         eng                      200
## 1499 2.812254e-02 1.882118e-01   1960         eng                      176
## 1500 1.499641e-02 2.949723e-01   1970         eng                      264
## 1501 2.011827e-01 1.474278e-01   1970         eng                      328
## 1502 3.792914e-02 4.869828e-01   1960         eng                      216
## 1503 1.340203e-02 4.870831e-01   1970         eng                      620
## 1504 8.537070e-02 1.089071e-01   1960         eng                      328
## 1505 4.185094e-02 1.513249e-01   1970         eng                      200
## 1506 4.129464e-02 4.892372e-02   1970         eng                      352
## 1507 9.392120e-04 2.103652e-01   1950         eur            eur       280
## 1508 3.095640e-02 1.809476e-01   1950         eng                      328
## 1509 6.384708e-03 1.869399e-01   1960         eng                      232
## 1510 2.234750e-02 1.430439e-01   1950         eng                      348
## 1511 2.217008e-03 9.373842e-02   1980         eng                      164
## 1512 1.109196e-01 9.030108e-02   1970         eng                      284
## 1513 3.369720e-02 1.976502e-01   1970         eng                      336
## 1514 9.517856e-02 1.925967e-01   1960         eng                      266
## 1515 1.002208e-02 1.369121e-01   1970         eng                      298
## 1516 6.398893e-02 1.392626e-01   1970         eng                      440
## 1517 9.851807e-03 4.562164e-02   1960         eng                      328
## 1518 1.862378e-03 1.437834e-01   1960         eur            eur       232
## 1519 3.503746e-03 2.837555e-01   1970         eur            eur       428
## 1520 1.114655e-02 3.912776e-01   1960         eur            eur       284
## 1521 1.756195e-01 7.391950e-02   1970         eng                      200
## 1522 4.989540e-03 5.899207e-01   1970         eur            eur       344
## 1523 1.586774e-02 2.053482e-01   1960         eur            eur       170
## 1524 4.918921e-02 1.900092e-01   1980         eng                      116
## 1525 6.363973e-02 8.457393e-02   1970         eng                      234
## 1526 3.508599e-02 3.515479e-01   1970         eng                      488
## 1527 1.726047e-03 7.424181e-01   1960         eng                      260
## 1528 2.298835e-02 2.990139e-01   1960         eng                      414
## 1529 5.258248e-02 2.644459e-01   1960         eng                      196
## 1530 9.246351e-03 2.567043e-01   1980         eng                      226
## 1531 8.414274e-02 5.380664e-01   1970         eng                      346
## 1532 1.792374e-01 2.753667e-01   1960         eng                      224
## 1533 3.983631e-02 5.483415e-02   1960         eng                      230
## 1534 6.633991e-02 5.231054e-01   1970         eng                      272
## 1535 3.346119e-02 2.142420e-01   1970         eng                      362
## 1536 9.577436e-03 3.133005e-01   1970         eng                      200
## 1537 4.841000e-01 2.983923e-01   1970         eng                      288
## 1538 2.999187e-01 8.155409e-02   1960         eng                      232
## 1539 1.045664e-02 2.454769e-01   1970         eng                      172
## 1540 1.439193e-01 1.802522e-01   1980         eng                      198
## 1541 6.857468e-01 5.883595e-01   1950         eng                      232
## 1542 5.510058e-01 2.681916e-01   1960         eur            eur       424
## 1543 2.413375e-02 4.470995e-01   1950         eng                      332
## 1544 2.455881e-02 5.142009e-01   1950         eng                      330
## 1545 5.363839e-03 4.342618e-01   1970         eng                      306
## 1546 4.636800e-01 6.437624e-02   1970         eng                      168
## 1547 4.937361e-02 5.007583e-02   1960         eng                      232
## 1548 1.614169e-01 6.722790e-02   1950         eng                      306
## 1549 6.683098e-02 1.139020e-01   1970         eng                      144
## 1550 2.502399e-02 1.224005e-01   1970         eng                      200
## 1551 4.301917e-02 8.328491e-02   1960         eng                      330
## 1552 2.118413e-02 7.296836e-01   1960         eng                      470
## 1553 1.501869e-01 8.026501e-01   1960         eng                      152
## 1554 9.789693e-03 8.654210e-02   1960         eng                      216
## 1555 4.340346e-01 2.682948e-02   1960         eng                      312
## 1556 6.099279e-01 4.647918e-01   1970         eng                      336
## 1557 5.086358e-03 2.031797e-02   1960         eng                      358
## 1558 2.252809e-01 4.543203e-01   1960         eng                      506
## 1559 2.667973e-02 5.763210e-02   1970         eng                      216
## 1560 1.895612e-02 1.732540e-01   1960         eng                      362
## 1561 3.721616e-02 3.914315e-02   1970         eng                      296
## 1562 4.485249e-01 3.313043e-01   1970         eng                      200
## 1563 4.234442e-02 9.601244e-02   1970         eng                      582
## 1564 1.140175e-03 3.220135e-01   1960         eur            eur       328
## 1565 0.000000e+00 0.000000e+00   1960         eur            eur       234
## 1566 1.654243e-02 5.423954e-02   1970         eng                      670
## 1567 1.408092e-02 6.509457e-02   1970         eng                      264
## 1568 1.175565e-02 4.401704e-01   1970         eng                      260
## 1569 9.144275e-02 1.660153e-01   1950         eng                      292
## 1570 3.310013e-03 2.871723e-01   1960         eur            eur       232
## 1571 1.910742e-02 5.469972e-01   1970         eng                      472
## 1572 5.265422e-02 3.182037e-01   1970         eng                      232
## 1573 1.852078e-02 4.250129e-01   1960         eng                      588
## 1574 1.116710e-02 9.481246e-02   1980         eng                      206
## 1575 2.309440e-04 4.176002e-01   1960         eng                      236
## 1576 1.142983e-01 2.733603e-01   1970         eng                      424
## 1577 2.031967e-03 1.249640e-01   1970         non        mideast       248
## 1578 9.960120e-04 1.659587e-01   1970         non        mideast       280
## 1579 2.523833e-01 2.354843e-01   1960         eur            eur       292
## 1580 3.928478e-01 3.045860e-01   1960         non        mideast       296
## 1581 2.838641e-02 5.387498e-02   1970         eng                      164
## 1582 3.014446e-03 1.712945e-01   1950         eng                      326
## 1583 2.510419e-02 7.254966e-02   1970         non          easia       156
## 1584 2.618853e-03 6.429480e-01   1950         eng                      250
## 1585 2.136215e-01 3.269735e-01   1960         eng                      184
## 1586 2.047982e-01 9.006188e-02   1950         eng                      266
## 1587 2.161243e-02 1.136173e-01   1950         eng                      268
## 1588 1.213472e-02 1.294883e-01   1970         eur            eur       232
## 1589 3.487048e-03 9.580264e-02   1970         eng                      762
## 1590 1.782224e-01 1.795267e-01   1950         eur            eur       236
## 1591 1.672790e-01 2.025273e-02   1970         eng                      224
## 1592 8.978889e-03 7.899543e-02   1960         eng                      556
## 1593 7.469568e-02 1.319617e-01   1950         eng                      942
## 1594 5.427936e-03 7.188104e-02   1960         eur            eur       262
## 1595 5.801380e-02 1.885095e-01   1960         eur            eur       268
## 1596 8.578030e-04 2.099225e-01   1960         eng                      392
## 1597 5.330082e-02 3.033423e-01   1970         non            eur       306
## 1598 1.252586e-02 1.048124e-01   1970         eur            eur       392
## 1599 6.234353e-03 3.583042e-01   1960         non          easia       266
## 1600 0.000000e+00 0.000000e+00   1960         eur            eur       330
## 1601 7.380951e-01 4.757035e-01   1970         eng                      200
## 1602 3.328260e-04 7.258114e-01   1960         eng                      188
## 1603 2.722719e-03 7.349661e-02   1970         eur            eur       424
## 1604 6.328482e-02 2.256384e-01   1950         eng                      484
## 1605 2.743485e-03 2.164202e-01   1970         eng                      398
## 1606 3.611981e-02 4.180008e-01   1950         non          easia       452
## 1607 4.925763e-02 9.210852e-02   1970         non          easia       568
## 1608 1.917063e-03 1.101879e-01   1950         eur            eur       198
## 1609 4.932561e-03 1.613027e-01   1970         eng                      192
## 1610 3.034003e-03 2.970176e-01   1950         eng                      774
## 1611 1.200158e-02 3.710767e-01   1950         eng                      330
## 1612 1.340419e-02 9.677448e-02   1950         eng                      250
## 1613 1.391129e-02 6.032189e-01   1980         eur            eur       158
## 1614 2.979172e-03 2.370285e-01   1980         eng                      248
## 1615 9.401717e-03 6.501284e-02   1980         non          sasia       122
## 1616 4.827857e-03 1.793563e-01   1980         eur            eur       168
## 1617 1.776488e-02 4.412599e-01   1980         eur            eur       392
## 1618 1.106970e-04 2.689140e-01   1980         non          sasia        92
## 1619 4.778793e-02 1.378699e-01   1980         eur            eur       536
## 1620 6.573330e-03 1.176904e-01   1980         eng                      232
## 1621 5.806654e-03 4.835943e-02   1980         eng                      250
## 1622 8.737427e-03 4.152556e-01   1980         eng                      234
## 1623 7.100729e-02 8.965966e-02   1980         eng                      202
## 1624 0.000000e+00 0.000000e+00   1980         eur            eur       232
## 1625 4.142278e-02 3.262871e-01   1980         eng                      262
## 1626 5.345891e-01 8.223735e-02   1980         eur            eur       136
## 1627 4.167432e-03 2.494086e-01   1970         eur            eur       216
## 1628 2.259953e-02 1.288859e-01   1980         eur            eur       412
## 1629 1.178810e-01 5.433489e-01   1980         non          easia       564
## 1630 1.327230e-04 1.409809e-02   1980         non          easia       264
## 1631 1.228663e-02 6.966953e-01   1980         eur            eur       464
## 1632 3.855391e-02 7.395750e-01   1970         eur            eur       112
## 1633 1.056983e-02 1.367615e-01   1970         eur            eur       392
## 1634 2.904183e-02 7.296586e-01   1960         eur            eur       236
## 1635 7.352316e-02 3.235223e-01   1970         eng                      258
## 1636 8.508430e-03 4.036476e-02   1960         eng                      296
## 1637 2.425125e-02 7.248205e-01   1980         eng                      220
## 1638 1.749198e-02 3.565592e-01   1980         eur            eur       218
## 1639 7.557325e-02 5.736693e-01   1980         eur            eur       200
## 1640 5.455121e-01 8.126470e-02   1980         eng                      294
## 1641 2.473770e-03 4.749907e-01   1980         non          easia       280
## 1642 1.389306e-03 1.948479e-01   1980         non          easia       332
## 1643 1.608191e-03 5.804985e-01   1980         eur            eur       148
## 1644 3.441839e-02 4.669720e-01   1980         eur            eur       120
## 1645 2.356406e-02 7.696778e-01   1980         eur            eur       224
## 1646 1.971386e-03 2.763075e-01   1980         eng                      120
## 1647 4.309004e-02 1.026788e-02   1980         eng                      264
## 1648 2.276141e-03 4.783266e-02   1960         eng                      196
## 1649 2.261347e-03 1.328741e-01   1950         eng                      626
## 1650 7.992340e-04 2.057164e-01   1950         eur            eur       276
## 1651 7.388250e-01 1.824216e-01   1960         eur            eur       200
## 1652 2.136516e-02 2.752894e-01   1960         eng                      464
## 1653 3.558305e-02 1.226343e-01   1970         eng                      272
## 1654 4.227807e-01 8.136085e-01   1970         non          easia       168
## 1655 5.879957e-02 6.983564e-01   1960         eur            eur       262
## 1656 8.125265e-02 4.230577e-01   1950         eur            eur       386
## 1657 5.899965e-03 4.415810e-01   1960         eur            eur       646
## 1658 5.580496e-02 2.172352e-01   1970         eur            eur       200
## 1659 9.829806e-03 5.316081e-01   1950         eng                      328
## 1660 3.116177e-01 5.847881e-02   1960         eng                      136
## 1661 2.454323e-03 2.336281e-01   1980         eur            eur       472
## 1662 2.452908e-03 3.774151e-01   1970         eur            eur       128
## 1663 1.156069e-02 2.321929e-01   1960         eur            eur       204
## 1664 1.079539e-02 3.902332e-01   1970         eur            eur       232
## 1665 3.047711e-02 1.752031e-01   1960         eng                      260
## 1666 3.796597e-03 1.406556e-01   1970         eng                      296
## 1667 7.074416e-03 3.199763e-01   1970         non          easia       428
## 1668 2.172836e-03 5.237281e-01   1970         eur            eur       248
## 1669 6.718863e-01 7.183557e-01   1950         eur            eur       168
## 1670 9.054752e-03 2.901825e-01   1970         eng                      156
## 1671 2.628809e-02 2.542237e-01   1960         eur            eur       168
## 1672 7.103261e-02 1.390762e-01   1980         eng                      232
## 1673 8.766698e-03 2.831210e-01   1960         eur            eur       204
## 1674 4.848100e-04 4.117848e-01   1960         eur            eur       398
## 1675 7.654773e-03 1.658541e-01   1950         eur            eur       330
## 1676 9.911674e-03 9.288412e-02   1970         eur            eur       374
## 1677 3.303436e-02 1.631489e-01   1970         eng                      360
## 1678 4.912394e-03 6.586464e-01   1970         eng                      232
## 1679 2.128446e-03 3.321161e-01   1950         eur            eur       422
## 1680 6.081698e-03 8.242754e-01   1960         eng                      258
## 1681 2.169143e-01 6.980040e-01   1950         non          easia       314
## 1682 5.056876e-03 2.686477e-01   1970         eng                      202
## 1683 7.936925e-03 9.668067e-02   1970         non          easia       374
## 1684 1.813575e-02 3.339321e-01   1980         non          sasia       212
## 1685 7.953675e-03 1.382705e-01   1960         eng                      232
## 1686 5.159283e-02 2.668553e-01   1960         eng                      330
## 1687 1.153492e-02 2.443302e-01   1960         eng                      336
## 1688 2.817972e-02 2.765787e-01   1960         eng                      444
## 1689 1.437404e-02 3.320716e-01   1980         eur            eur      1218
## 1690 1.002206e-03 4.768718e-01   1980         eur            eur      1150
## 1691 1.844302e-01 1.223331e-01   1960         eng                      328
## 1692 9.880763e-02 9.551113e-02   1970         eng                      520
## 1693 2.667378e-03 4.265014e-02   1950         eur            eur       134
## 1694 1.568609e-02 1.174718e-01   1980         eng                      256
## 1695 2.155310e-01 3.629156e-01   1980         non        mideast       328
## 1696 1.794951e-01 1.063045e-01   1960         eur            eur       264
## 1697 1.443117e-02 6.204796e-01   1980         non                      240
## 1698 9.225113e-03 2.167311e-01   1980         eng                      282
## 1699 8.945057e-02 3.316587e-01   1980         eur            eur       502
## 1700 2.214784e-01 3.366200e-01   1980         eng                      424
## 1701 2.631009e-03 5.752039e-01   1980         eur            eur       240
## 1702 4.186221e-01 3.260270e-01   1980         eng                      136
## 1703 5.490656e-03 7.075952e-02   1980         eur            eur       262
## 1704 4.768188e-01 1.190566e-01   1980         eur            eur       200
## 1705 1.726037e-01 7.311103e-02   1980         non        classic       220
## 1706 2.724065e-02 2.174779e-01   1980         non         africa       176
## 1707 2.428202e-01 2.377965e-01   1980         eng                      114
## 1708 1.876042e-02 2.295639e-01   1980         eur            eur       416
## 1709 2.144901e-02 1.700454e-01   1980         eur            eur       456
## 1710 4.215149e-02 5.544048e-01   1970         eur            eur       166
## 1711 7.597006e-03 2.103547e-01   1970         eur            eur       156
## 1712 5.028763e-02 1.389157e-01   1970         eur            eur       120
## 1713 1.634924e-01 3.022894e-01   1970         non          sasia       136
## 1714 2.766744e-03 6.097402e-02   1970         non          sasia       302
## 1715 1.692804e-02 4.100623e-01   1970         eng                      264
## 1716 3.305562e-03 4.706053e-02   1960         eng                      584
## 1717 6.951290e-03 2.101770e-01   1950         eur            eur       966
## 1718 7.356440e-04 4.497299e-01   1960         eng                      172
## 1719 6.749969e-03 6.524803e-01   1960         eur            eur       280
## 1720 1.712591e-01 2.060664e-01   1970         eur            eur       224
## 1721 1.515193e-03 3.530070e-01   1980         non          easia       168
## 1722 7.387561e-03 3.766318e-01   1950         eur            eur       236
## 1723 3.374456e-03 1.311354e-01   1960         eur            eur       172
## 1724 1.349852e-01 1.538152e-01   1970         eng                      606
## 1725 9.564487e-01 6.624800e-02   1970         eng                      230
## 1726 1.299896e-03 7.406759e-01   1970         non        classic       232
## 1727 3.355858e-03 1.418403e-01   1980         eng                      394
## 1728 6.055227e-02 3.265205e-01   1960         eur            eur       326
## 1729 2.183851e-02 7.587465e-02   1960         eng                      200
## 1730 2.217020e-01 2.489057e-01   1980         eng                      200
## 1731 2.571358e-02 1.262158e-01   1970         eng                      360
## 1732 0.000000e+00 0.000000e+00   1960         non          easia       346
## 1733 4.327897e-03 2.043255e-01   1960         eur            eur       232
## 1734 8.265970e-04 8.089810e-02   1960         eur            eur       200
## 1735 1.308612e-02 2.619022e-01   1970         eng                      200
## 1736 3.568078e-02 2.511764e-01   1950         eur            eur       236
## 1737 3.455913e-02 1.965578e-01   1950         eur            eur       328
## 1738 9.704492e-02 2.156105e-02   1960         eng                      296
## 1739 8.392310e-02 2.552853e-01   1960         eur            eur       602
## 1740 3.022943e-02 1.175088e-01   1950         eng                      204
## 1741 1.987414e-02 5.497632e-01   1970         non          sasia       304
## 1742 5.616553e-02 5.973726e-01   1960         eur            eur       424
## 1743 1.627061e-02 2.950295e-01   1960         eng                      344
## 1744 1.913390e-02 1.166938e-01   1970         eur            eur       232
## 1745 2.681325e-01 1.971214e-01   1960         non        mideast       424
## 1746 8.548569e-02 7.372845e-02   1950         eng                      264
## 1747 4.167341e-02 1.415871e-01   1950         eng                      262
## 1748 2.250469e-02 1.689157e-01   1960         eng                      296
## 1749 2.238078e-02 6.262592e-01   1960         non          easia       958
## 1750 3.105236e-01 1.920812e-01   1970         eng                      232
## 1751 1.204984e-02 2.518506e-01   1970         eng                      202
## 1752 4.645644e-02 9.716411e-02   1970         eng                      328
## 1753 2.359217e-03 2.357832e-01   1970         eng                      200
## 1754 1.846416e-02 1.635120e-01   1970         eng                      332
## 1755 3.240672e-02 1.388436e-02   1960         non        mideast       340
## 1756 7.588159e-03 3.583002e-01   1950         eng                      806
## 1757 1.729229e-02 4.410932e-01   1960         eng                      266
## 1758 6.659230e-03 9.996682e-02   1970         eng                      232
## 1759 7.562112e-02 2.666514e-01   1970         eur            eur       424
## 1760 5.027122e-02 3.865713e-01   1980         eng                      296
## 1761 5.740277e-02 1.901705e-01   1980         eng                      538
## 1762 6.114738e-03 1.273639e-01   1970         eur            eur       320
## 1763 8.794282e-03 1.335243e-01   1960         eur            eur       362
## 1764 5.784889e-03 3.040793e-01   1970         eur            eur       328
## 1765 1.375218e-01 3.014290e-01   1960         eng                      172
## 1766 1.464898e-02 3.689172e-01   1960         eng                      194
## 1767 3.101882e-02 4.085302e-01   1970         eng                      152
## 1768 7.782772e-01 9.459739e-02   1950         eng                      262
## 1769 5.852683e-02 1.797789e-01   1950         eur            eur       264
## 1770 4.345138e-01 2.381114e-01   1950         eng                      200
## 1771 5.775381e-01 5.967535e-01   1960         eur            eur       264
## 1772 1.814775e-02 9.544545e-02   1960         eur            eur       328
## 1773 9.541985e-01 3.843995e-01   1970         eur            eur       272
## 1774 6.781843e-01 4.261786e-01   1970         eur            eur       224
## 1775 5.530382e-02 3.701512e-01   1960         eur            eur       562
## 1776 9.616141e-02 6.035282e-01   1960         eur            eur       308
## 1777 6.194594e-01 5.211650e-01   1960         eng                      414
## 1778 1.696567e-02 2.092767e-01   1960         eng                      258
## 1779 3.726731e-02 2.125612e-01   1970         eur            eur       108
## 1780 6.094523e-01 1.803975e-01   1950         eng                      268
## 1781 3.842980e-04 4.473908e-02   1970         eur            eur       188
## 1782 3.604468e-02 1.592149e-01   1970         non        mideast       424
## 1783 6.846488e-02 2.130512e-01   1970         eng                      296
## 1784 2.534784e-02 1.591371e-02   1960         eng                      268
## 1785 1.558787e-03 8.493880e-02   1950         eur            eur       236
## 1786 4.395720e-04 7.232509e-02   1950         non          easia       202
## 1787 4.503963e-02 3.500855e-01   1960         eur            eur       330
## 1788 1.162810e-01 1.772597e-01   1980         eng                      330
## 1789 4.946023e-02 2.570310e-01   1950         eng                      358
## 1790 7.107154e-02 2.794749e-01   1970         eng                      454
## 1791 6.899020e-04 4.228673e-01   1950         non          easia       308
## 1792 4.840882e-02 3.905951e-01   1960         eur            eur       408
## 1793 1.165480e-02 8.393286e-01   1980         eng                      328
## 1794 6.881971e-03 3.807547e-01   1970         non          easia       232
## 1795 2.368835e-03 1.952204e-01   1960         eur            eur       264
## 1796 1.761844e-01 1.589985e-01   1960         eng                      600
## 1797 3.676639e-02 5.653402e-01   1960         eur            eur       244
## 1798 2.447020e-02 2.190750e-01   1970         eng                      204
## 1799 5.641359e-02 1.181638e-01   1970         eng                      296
## 1800 7.019000e-04 2.545149e-01   1970         eur            eur       166
## 1801 5.883109e-03 1.384757e-01   1960         eur            eur       394
## 1802 4.871687e-03 1.628470e-01   1970         eur            eur       328
## 1803 7.865424e-03 5.708582e-01   1950         eng                      120
## 1804 9.592224e-01 1.453920e-01   1960         non                      332
## 1805 4.146373e-02 2.268881e-01   1950         eng                      954
## 1806 9.309616e-03 3.469050e-01   1950         non          easia       282
## 1807 2.420000e-05 1.379457e-01   1960         eur            eur       276
## 1808 1.372976e-02 1.497278e-01   1960         eng                      104
## 1809 6.027465e-03 2.293880e-01   1960         eur            eur       136
## 1810 1.200795e-02 2.177284e-01   1950         eng                      360
## 1811 3.762115e-03 2.309795e-01   1960         eng                      264
## 1812 1.843615e-02 3.813114e-01   1970         eng                      208
## 1813 1.385244e-02 3.867818e-02   1980         eng                      198
## 1814 3.624712e-02 2.191718e-01   1960         eur            eur       154
## 1815 3.258422e-02 9.531266e-02   1980         eng                      198
## 1816 8.062446e-02 1.805718e-01   1960         eng                      266
## 1817 1.583865e-01 2.830682e-01   1950         non        mideast       458
## 1818 2.614095e-01 7.431034e-02   1970         eng                      252
## 1819 3.987004e-02 3.988685e-01   1960         eur            eur       360
## 1820 1.293643e-02 9.891109e-02   1960         eng                      200
## 1821 1.217376e-02 1.603247e-01   1970         eng                      168
## 1822 2.615532e-02 3.924592e-02   1960         eng                      234
## 1823 1.189080e-03 1.729123e-01   1960         eur            eur       398
## 1824 5.883564e-03 6.209507e-01   1950         eur            eur       444
## 1825 9.767390e-01 1.533145e-01   1950         eur            eur       272
## 1826 2.606652e-02 2.360827e-01   1970         non        classic       178
## 1827 1.513618e-02 7.016955e-02   1950         eur            eur       414
## 1828 8.984601e-02 9.469446e-02   1960         eur            eur       280
## 1829 1.058177e-03 2.871456e-01   1960         non          easia       324
## 1830 3.791492e-03 7.126795e-01   1970         eng                      348
## 1831 3.886960e-02 1.186553e-01   1960         eur            eur       554
## 1832 4.928820e-04 1.711761e-01   1960         eur            eur       464
## 1833 1.261807e-02 2.212719e-01   1970         eng                      558
## 1834 1.915870e-01 8.368399e-01   1970         eur            eur       208
## 1835 4.090812e-03 2.099046e-01   1960         eur            eur       608
## 1836 1.849609e-02 6.229545e-01   1960         non        classic       168
## 1837 1.334341e-03 1.093668e-01   1970         non          easia      1172
## 1838 1.586126e-02 2.462890e-01   1970         eng                      232
## 1839 1.622117e-02 8.655037e-02   1970         eur            eur       586
## 1840 5.354329e-02 1.584789e-01   1970         eng                      202
## 1841 8.906783e-02 8.257670e-01   1960         eng                      508
## 1842 9.223000e-03 7.663611e-01   1960         eng                      684
## 1843 1.533177e-02 2.579373e-01   1950         eng                      360
## 1844 6.507662e-03 2.751520e-01   1970         eur            eur       168
## 1845 8.578930e-02 1.956323e-01   1970         eng                      264
## 1846 2.004113e-01 3.709181e-01   1970         eng                      484
## 1847 5.274770e-04 2.099090e-01   1960         eur            eur       530
## 1848 1.572031e-01 2.181017e-01   1970         non        mideast       184
## 1849 6.566675e-03 4.224068e-01   1970         non          easia       144
## 1850 1.692095e-02 1.263486e-01   1950         eng                      426
## 1851 2.589058e-01 2.616079e-01   1970         eng                      208
## 1852 2.064386e-02 1.240226e-01   1950         eur            eur       220
## 1853 2.913852e-02 1.327990e-01   1950         eng                      316
## 1854 1.566171e-02 1.767199e-01   1960         eng                      310
## 1855 7.018636e-03 3.296847e-01   1970         eng                      328
## 1856 1.009543e-01 1.996827e-01   1980         eng                      506
## 1857 1.315174e-01 2.601915e-01   1970         eng                      264
## 1858 9.272311e-03 1.295230e-01   1960         eng                      264
## 1859 4.578489e-02 2.478468e-01   1950         eng                      328
## 1860 2.071340e-02 5.171235e-02   1950         eng                      266
## 1861 4.296293e-02 1.370017e-01   1960         eng                      556
## 1862 6.698531e-02 5.638522e-01   1970         eng                      356
## 1863 1.028685e-02 2.032138e-01   1960         eur            eur       248
## 1864 5.689432e-02 9.784104e-02   1960         eur            eur       418
## 1865 1.193088e-03 4.663794e-01   1970         eur            eur       490
## 1866 1.452614e-01 1.357755e-01   1950         eur            eur       380
## 1867 2.417770e-01 1.594667e-01   1950         eng                      668
## 1868 1.906484e-03 1.896916e-01   1950         eur            eur       232
## 1869 1.037091e-02 1.308425e-01   1960         eng                      358
## 1870 5.081430e-02 1.822509e-01   1970         non          easia       254
## 1871 5.757558e-02 1.403871e-01   1980         eng                      328
## 1872 1.623653e-01 2.767004e-01   1970         eng                      332
## 1873 7.891925e-02 4.463811e-01   1970         eng                      152
## 1874 1.001277e-02 1.640646e-01   1970         eng                      480
## 1875 1.552175e-01 4.196562e-01   1960         eur            eur       428
## 1876 4.861655e-01 3.730160e-01   1960         eng                      264
## 1877 2.564167e-01 2.256522e-01   1960         eng                      296
## 1878 9.358045e-03 1.087608e-01   1960         eng                      300
## 1879 2.437099e-01 3.935046e-01   1960         eur            eur       202
## 1880 2.451524e-02 2.674721e-01   1970         non        classic       196
## 1881 3.410134e-02 1.069992e-01   1970         eng                      296
## 1882 9.148113e-03 3.213167e-01   1960         eur            eur       264
## 1883 1.207528e-03 3.401874e-01   1970         eur            eur       184
## 1884 3.985210e-02 5.642402e-01   1970         non        classic       392
## 1885 4.454126e-02 5.400175e-01   1970         eur            eur       262
## 1886 3.076154e-01 3.331582e-01   1980         eur            eur       304
## 1887 5.310894e-02 7.311956e-02   1950         eur            eur       578
## 1888 1.362752e-01 1.942570e-01   1960         eur            eur       234
## 1889 2.348812e-02 2.643635e-01   1970         eng                      332
## 1890 4.753595e-02 2.874878e-01   1970         eng                      394
## 1891 1.048594e-01 6.567031e-02   1980         eng                      268
## 1892 1.561364e-01 2.635799e-02   1960         eng                      368
## 1893 2.387623e-01 2.159653e-01   1970         eng                      272
## 1894 3.520439e-02 8.606406e-02   1950         eng                      200
## 1895 2.921394e-02 2.333431e-01   1970         eng                      444
## 1896 2.917856e-01 1.149859e-01   1980         eng                      232
## 1897 3.216611e-02 1.964389e-01   1950         eur            eur       454
## 1898 3.136074e-03 1.581419e-01   1960         eur            eur       688
## 1899 1.079350e-01 1.542331e-01   1960         eng                      196
## 1900 4.888108e-01 1.821186e-01   1960         eur            eur       188
## 1901 1.964297e-01 3.707404e-01   1950         eng                      700
## 1902 3.184788e-02 7.142363e-02   1970         eng                      192
## 1903 4.288931e-03 4.824703e-01   1970         non        mideast       182
## 1904 1.287894e-02 1.101324e-01   1960         eng                      266
## 1905 1.191093e-02 4.887672e-01   1960         eur            eur       184
## 1906 7.046056e-03 1.965804e-01   1960         eur            eur       168
## 1907 4.614530e-04 1.399263e-01   1960         eng                      288
## 1908 9.964190e-02 1.362780e-01   1970         eng                      360
## 1909 2.454059e-02 3.485115e-01   1960         eng                      330
## 1910 1.068996e-02 4.895186e-01   1980         eng                      234
## 1911 8.368520e-03 7.146156e-02   1960         eng                      508
## 1912 1.497706e-03 1.901963e-01   1950         eng                      328
## 1913 1.575517e-02 3.612941e-02   1960         eng                      632
## 1914 1.873332e-03 4.050312e-01   1950         eng                      262
## 1915 1.842146e-02 2.923403e-01   1960         eng                      212
## 1916 2.054303e-03 3.995264e-01   1960         eng                      262
## 1917 8.855113e-03 6.363499e-02   1950         eng                      446
## 1918 4.695756e-02 1.730816e-01   1950         eng                      392
## 1919 3.613856e-01 4.087446e-01   1950         eng                      264
## 1920 6.600693e-02 2.827154e-01   1950         eng                      184
## 1921 7.771504e-03 1.130488e-01   1960         eng                      264
## 1922 4.719478e-02 1.696651e-01   1950         eng                      248
## 1923 2.417494e-03 7.528258e-02   1970         eng                      256
## 1924 8.203355e-02 4.010514e-01   1960         eng                      128
## 1925 5.675701e-01 4.661381e-01   1950         eur            eur       392
## 1926 2.797743e-03 1.471982e-01   1950         eng                      328
## 1927 5.500419e-02 3.315417e-02   1960         eng                      454
## 1928 1.889007e-02 1.150019e-01   1980         eng                      304
## 1929 4.556718e-01 5.967413e-01   1970         eng                      698
## 1930 9.833799e-02 4.377259e-02   1980         eng                      300
## 1931 3.617849e-02 3.090241e-01   1970         eng                      298
## 1932 6.581527e-03 1.950226e-01   1950         eng                      362
## 1933 4.316638e-01 2.025960e-01   1950         eur            eur       240
## 1934 5.955291e-02 4.313585e-01   1960         eng                      216
## 1935 8.401905e-02 1.324920e-01   1950         eng                      204
## 1936 3.335472e-01 2.020254e-01   1970         eng                      124
## 1937 1.527290e-01 6.059710e-02   1960         eng                      198
## 1938 4.640143e-02 1.033968e-01   1970         eng                      230
## 1939 2.120125e-03 1.185834e-01   1960         eng                      296
## 1940 3.713558e-02 1.492524e-01   1960         eng                      424
## 1941 1.236176e-02 3.363999e-02   1960         eng                      298
## 1942 3.989712e-02 5.407834e-02   1950         eng                      218
## 1943 1.836231e-02 2.066888e-01   1960         eng                      264
## 1944 2.438393e-01 6.838823e-02   1960         eng                      200
## 1945 4.395149e-02 2.056664e-01   1970         eng                      360
## 1946 1.246607e-01 1.183679e-01   1980         eng                      312
## 1947 2.237962e-03 3.691685e-01   1950         eng                      614
## 1948 2.658595e-02 5.127175e-01   1970         non          sasia       184
## 1949 1.980946e-02 3.460117e-02   1970         eng                      188
## 1950 9.988455e-03 2.826420e-02   1970         eng                      296
## 1951 1.905356e-02 1.214622e-01   1970         eng                      522
## 1952 2.159348e-01 5.869120e-01   1950         eng                      264
## 1953 2.068041e-01 9.056502e-02   1960         eng                      230
## 1954 1.626979e-02 1.796082e-01   1970         eng                      412
## 1955 2.161734e-02 2.549762e-01   1970         eng                      396
## 1956 5.879751e-02 1.025573e-01   1960         eng                      202
## 1957 3.794630e-01 1.941342e-01   1970         eng                      264
## 1958 1.066536e-01 6.876610e-01   1950         eng                      200
## 1959 6.491101e-02 3.110796e-01   1970         eng                      248
## 1960 6.331628e-01 1.201014e-01   1960         eng                      232
## 1961 1.583160e-01 3.557073e-01   1960         eng                      226
## 1962 3.046386e-02 1.831079e-01   1970         eng                      200
## 1963 3.493635e-02 3.441333e-01   1950         eng                      590
## 1964 2.215550e-01 2.702510e-01   1950         eng                      256
## 1965 2.633849e-02 3.254780e-01   1960         eng                      264
## 1966 1.482536e-02 3.445333e-01   1970         eng                      454
## 1967 6.587610e-04 1.085240e-01   1970         eng                      252
## 1968 1.549599e-01 8.669154e-02   1950         eng                      360
## 1969 3.646327e-02 4.659156e-01   1960         eng                      216
## 1970 1.396084e-02 1.118516e-01   1950         eng                      326
## 1971 6.747032e-02 1.520981e-01   1960         eng                      296
## 1972 2.039829e-02 3.679880e-01   1960         eng                      338
## 1973 5.854402e-02 4.129609e-02   1950         eng                      296
## 1974 6.360552e-02 1.595250e-01   1960         eng                      198
## 1975 1.802470e-01 6.052234e-01   1950         eng                      200
## 1976 4.560068e-01 1.938565e-01   1980         eng                     1360
## 1977 4.280118e-01 1.870041e-01   1950         eng                      264
## 1978 1.394388e-01 2.460217e-01   1960         eng                      202
## 1979 1.119506e-01 3.260918e-01   1960         eng                      352
## 1980 2.879647e-02 1.378798e-01   1960         eng                      348
## 1981 1.427721e-02 5.413875e-01   1970         eur            eur       200
## 1982 9.693568e-01 2.323820e-01   1950         non        classic       892
## 1983 1.805187e-01 7.507756e-02   1970         eng                      156
## 1984 6.271964e-02 3.519539e-01   1970         eng                      342
## 1985 2.282165e-02 1.312110e-01   1960         eur            eur       604
## 1986 4.237986e-02 1.101964e-01   1960         eng                      328
## 1987 6.247074e-03 2.125710e-01   1960         eur            eur       408
## 1988 1.769654e-02 1.224986e-01   1970         eur            eur       236
## 1989 4.500933e-01 3.645149e-01   1970         eur            eur       210
## 1990 8.747606e-02 7.079891e-02   1960         eng                      216
## 1991 4.755611e-01 1.977647e-01   1960         eng                      328
## 1992 5.097252e-03 2.357623e-01   1960         eur            eur       300
## 1993 2.768198e-01 4.115820e-02   1970         eng                      176
## 1994 3.900934e-02 7.337341e-01   1950         eng                      500
## 1995 6.636220e-04 1.440171e-02   1950         non          easia       172
## 1996 2.194068e-01 8.451264e-01   1970         eng                      164
## 1997 2.522906e-02 3.655843e-02   1960         non          sasia       170
## 1998 2.779206e-02 2.438896e-01   1950         eur            eur       422
## 1999 5.838078e-02 1.720455e-01   1970         eng                      240
## 2000 4.044391e-02 1.940782e-01   1980         eng                      416
## 2001 2.637989e-01 9.443502e-02   1960         eng                      392
## 2002 2.304646e-02 6.993306e-02   1960         eng                      264
## 2003 6.059234e-02 7.677177e-02   1960         eng                      310
## 2004 3.374827e-02 1.719529e-01   1980         eng                      190
## 2005 1.849769e-02 3.049249e-01   1970         eng                      264
## 2006 8.005298e-03 3.217070e-02   1970         eng                      448
## 2007 7.663261e-01 3.508689e-01   1960         eng                      298
## 2008 1.129023e-02 7.700500e-02   1950         eng                      460
## 2009 9.124747e-02 1.703673e-01   1950         eng                      200
## 2010 2.777181e-02 3.563003e-02   1960         eng                      448
## 2011 2.595363e-02 9.438751e-02   1950         eng                      232
## 2012 5.380450e-01 2.981790e-01   1970         eng                      392
## 2013 6.533852e-02 1.751696e-01   1980         eng                      328
## 2014 1.889297e-01 1.103942e-01   1950         eng                      342
## 2015 1.738902e-02 1.838068e-01   1950         eng                      340
## 2016 2.390813e-02 2.835647e-01   1970         eng                      320
## 2017 8.470561e-03 6.170856e-01   1950         eng                      234
## 2018 2.120913e-01 9.689691e-02   1950         eng                      234
## 2019 2.276694e-01 2.981527e-01   1960         eng                      168
## 2020 3.607704e-02 1.254093e-01   1970         eng                      300
## 2021 5.589076e-01 4.716678e-01   1960         eng                      296
## 2022 1.027846e-01 5.564139e-02   1980         eng                      184
## 2023 3.191086e-03 5.014039e-01   1960         eng                      200
## 2024 9.058558e-02 2.958714e-01   1960         eng                      264
## 2025 2.177819e-02 7.102358e-02   1960         eng                      196
## 2026 5.246648e-03 4.824092e-02   1960         eur            eur       228
## 2027 1.407149e-02 1.775410e-01   1970         eng                      262
## 2028 1.461552e-02 6.781895e-02   1950         eng                     1290
## 2029 9.242719e-01 1.588514e-01   1950         eur            eur       160
## 2030 3.196812e-02 1.123684e-01   1970         eng                      244
## 2031 1.886797e-02 1.739560e-01   1970         eur            eur       296
## 2032 1.412114e-01 4.687493e-02   1960         eng                      456
## 2033 2.456033e-03 1.094872e-01   1950         eng                      264
## 2034 1.587189e-01 1.759651e-01   1960         eng                      320
## 2035 2.905864e-02 3.017000e-01   1960         eur            eur       264
## 2036 1.218540e-02 1.156692e-01   1950         eur            eur       202
## 2037 2.475768e-02 2.230398e-01   1970         eur            eur       224
## 2038 6.972886e-02 1.332725e-01   1960         eng                      748
## 2039 3.283334e-03 1.510233e-01   1960         eur            eur       162
## 2040 7.101340e-04 7.753311e-01   1970         eur            eur       232
## 2041 5.446778e-02 7.810147e-01   1960         eng                      298
## 2042 7.143208e-02 3.193133e-02   1950         eur            eur      1014
## 2043 1.911506e-01 5.816157e-01   1970         eur            eur       136
## 2044 2.055801e-01 2.128850e-01   1960         eng                      264
## 2045 3.667269e-02 2.965871e-01   1960         eng                      324
## 2046 3.105628e-01 6.688590e-01   1970         eur            eur       196
## 2047 2.443276e-01 8.440681e-02   1950         eng                      360
## 2048 2.747022e-03 6.985009e-02   1960         eng                      450
## 2049 2.427171e-01 2.361785e-01   1960         eur            eur       424
## 2050 9.427610e-03 7.862395e-01   1970         eur            eur       236
## 2051 1.180219e-03 2.155915e-01   1950         eur            eur       238
## 2052 2.445017e-02 6.111374e-02   1950         eur            eur       290
## 2053 3.236291e-02 7.495062e-02   1950         eur            eur       274
## 2054 1.657990e-03 1.403899e-01   1950         eur            eur       178
## 2055 2.748641e-03 2.451044e-01   1950         eur            eur       336
## 2056 3.046213e-03 2.364191e-01   1950         eur            eur       614
## 2057 9.770412e-01 6.153926e-02   1950         non        classic       466
## 2058 8.020468e-03 4.375300e-01   1960         eur            eur       294
## 2059 5.642169e-03 1.244323e-01   1960         eur            eur       284
## 2060 1.197097e-03 2.852667e-01   1950         eur            eur       248
## 2061 5.613400e-02 7.578977e-01   1950         eur            eur       128
## 2062 1.392590e-03 1.567302e-01   1950         eng                      298
## 2063 3.251999e-02 3.083890e-01   1970         eur            eur       344
## 2064 8.353833e-01 3.496679e-01   1950         eng                      558
## 2065 8.198867e-01 1.039264e-01   1970         eng                      264
## 2066 1.062353e-01 2.076006e-01   1950         eng                      236
## 2067 2.289869e-02 4.917105e-01   1960         eng                      264
## 2068 1.499696e-02 2.252194e-01   1960         non                      212
## 2069 4.766367e-02 2.328268e-01   1970         eur            eur       216
## 2070 1.731738e-02 8.182013e-02   1970         eur            eur       194
## 2071 2.701273e-03 1.576123e-01   1980         non        classic       236
## 2072 1.462093e-02 4.265476e-01   1950         eng                      218
## 2073 3.862657e-01 7.949071e-02   1970         eng                      202
## 2074 2.323125e-02 1.167052e-01   1960         eng                      296
## 2075 1.913429e-01 8.400528e-01   1970         eng                      332
## 2076 3.457315e-02 4.895449e-01   1970         eng                      236
## 2077 1.677520e-02 3.996420e-01   1980         eur            eur       400
## 2078 3.941395e-02 3.558919e-01   1960         eng                      646
## 2079 7.689813e-02 3.644613e-01   1960         eng                      364
## 2080 1.179838e-02 1.231063e-01   1980         eng                      280
## 2081 2.322644e-01 3.428694e-01   1960         eng                      360
## 2082 4.930176e-03 4.731561e-01   1950         eng                      234
## 2083 3.266480e-02 4.908036e-02   1950         eng                      450
## 2084 8.608557e-03 7.629461e-02   1970         eng                      214
## 2085 0.000000e+00 0.000000e+00   1970         eng                      202
## 2086 5.653853e-02 1.291821e-01   1980         eng                      396
## 2087 3.327877e-01 3.054137e-01   1960         eng                      222
## 2088 1.867677e-01 6.987025e-01   1960         eng                      200
## 2089 8.665827e-01 6.557483e-01   1960         eng                      198
## 2090 5.052827e-02 6.321032e-01   1970         eng                      408
## 2091 1.221380e-02 4.481292e-01   1970         eng                      398
## 2092 1.043340e-02 4.914459e-01   1970         eng                      488
## 2093 3.450156e-02 1.843835e-01   1960         eng                      216
## 2094 1.516261e-02 6.416139e-01   1970         eng                      168
## 2095 9.068969e-02 7.984525e-02   1960         eng                      550
## 2096 1.571806e-02 2.304898e-01   1970         eng                      308
## 2097 1.208289e-01 7.867648e-02   1980         eng                      328
## 2098 1.777400e-02 5.110121e-02   1970         eng                      330
## 2099 1.576159e-02 1.464230e-01   1970         eng                      296
## 2100 4.041633e-03 1.954324e-01   1970         eng                      264
## 2101 3.076111e-01 6.889929e-01   1960         eng                      200
## 2102 5.534900e-02 1.981959e-01   1980         eng                      296
## 2103 3.452046e-02 7.854741e-02   1950         eng                      272
## 2104 7.612989e-03 1.719170e-01   1970         eur            eur       328
## 2105 8.895786e-02 9.677856e-02   1960         eng                      424
## 2106 2.156997e-01 2.039987e-02   1960         eng                      272
## 2107 6.657521e-01 4.696415e-01   1970         eng                      276
## 2108 9.493998e-02 1.354519e-01   1980         eng                      234
## 2109 3.941524e-02 6.010358e-02   1960         eng                      936
## 2110 1.752956e-03 1.784291e-01   1960         eng                      200
## 2111 2.547431e-01 9.244631e-02   1960         eng                      298
## 2112 2.711401e-02 2.045691e-01   1960         eng                      200
## 2113 5.050096e-03 1.268612e-01   1950         eur            eur       264
## 2114 6.185649e-02 2.320880e-01   1960         eng                      426
## 2115 3.618595e-03 2.817922e-01   1980         eng                      226
## 2116 7.099695e-02 1.420191e-01   1960         eng                      264
## 2117 9.423005e-03 2.463259e-01   1970         eng                      264
## 2118 6.022364e-03 1.855411e-01   1960         eng                      264
## 2119 6.489239e-03 3.472116e-01   1960         eng                      264
## 2120 1.319608e-01 2.413837e-01   1950         eng                      264
## 2121 7.788938e-02 3.594714e-01   1950         eng                      248
## 2122 3.035712e-01 6.125571e-02   1950         eng                      200
## 2123 5.008871e-01 1.619512e-01   1950         eng                      326
## 2124 1.454495e-02 5.464841e-02   1960         eng                      200
## 2125 6.160900e-02 1.761304e-01   1950         eng                      300
## 2126 6.598052e-02 4.481172e-01   1970         eng                      200
## 2127 9.830798e-02 5.868556e-01   1970         eng                      234
## 2128 1.357970e-01 1.654116e-01   1950         eng                      168
## 2129 3.671153e-02 4.807076e-01   1970         eng                      312
## 2130 8.918497e-02 3.268622e-01   1960         eng                      436
## 2131 3.762106e-02 1.914520e-01   1960         eng                      330
## 2132 3.657463e-02 3.066421e-01   1960         eur            eur       256
## 2133 4.932801e-03 1.617867e-01   1960         non          easia       424
## 2134 2.921773e-02 1.756453e-01   1960         eur            eur       216
## 2135 3.900754e-03 1.465845e-01   1980         eng                      232
## 2136 2.690827e-02 1.368478e-01   1960         eng                      454
## 2137 7.801468e-02 5.038394e-01   1970         eng                      250
## 2138 3.891897e-03 2.410087e-01   1980         eng                      264
## 2139 7.334249e-02 1.192716e-01   1970         eng                      712
## 2140 3.990378e-02 4.662558e-01   1970         eng                      394
## 2141 7.877041e-02 1.498738e-01   1960         eng                      234
## 2142 6.181310e-03 1.084813e-01   1970         eur            eur       184
## 2143 1.525115e-02 1.133467e-01   1950         eur            eur       256
## 2144 9.349752e-01 1.980298e-01   1950         eng                      446
## 2145 6.574532e-01 8.339598e-01   1950         eur            eur       322
## 2146 7.418763e-03 7.847595e-01   1960         eur            eur       190
## 2147 3.590092e-02 1.713699e-01   1970         eur            eur       232
## 2148 2.269871e-02 3.392583e-01   1950         eur            eur       298
## 2149 3.390796e-02 4.067634e-01   1970         non          easia       234
## 2150 2.115677e-02 1.900513e-01   1950         eur            eur       460
## 2151 1.872230e-01 3.745312e-01   1960         eng                      324
## 2152 7.874833e-03 1.171698e-01   1970         eng                      224
## 2153 9.355139e-02 3.023022e-01   1980         eur            eur       300
## 2154 2.533627e-03 3.703763e-01   1960         eur            eur       174
## 2155 2.595948e-03 3.286211e-01   1960         eur            eur       388
## 2156 2.567960e-02 1.716341e-01   1950         eur            eur       170
## 2157 4.881885e-02 1.620560e-01   1960         eur            eur       552
## 2158 1.740120e-02 1.387018e-01   1950         eur            eur       484
## 2159 1.573886e-02 4.865189e-01   1970         eur            eur       788
## 2160 7.750373e-02 1.467762e-01   1970         eur            eur       228
## 2161 1.171988e-02 1.373834e-01   1970         eur            eur       264
## 2162 8.868312e-02 1.336556e-01   1970         eng                      264
## 2163 3.483388e-03 4.448265e-02   1970         eur            eur       164
## 2164 6.045131e-03 1.575611e-01   1960         eur            eur       202
## 2165 2.013627e-02 2.557805e-01   1970         eur            eur       296
## 2166 1.187145e-02 4.805088e-01   1970         eur            eur       436
## 2167 9.122553e-03 6.829978e-01   1970         eur            eur       314
## 2168 2.814570e-03 1.597638e-01   1950         eng                      456
## 2169 4.224062e-02 5.515933e-02   1970         eng                      712
## 2170 2.895531e-02 3.635070e-01   1970         eng                      380
## 2171 1.183776e-02 2.472344e-01   1970         eng                      342
## 2172 4.296827e-03 8.365487e-02   1970         eng                      222
## 2173 7.336958e-03 5.313097e-02   1960         eng                      326
## 2174 5.488459e-03 6.502279e-02   1970         eng                      218
## 2175 3.785475e-02 3.802513e-01   1970         eng                      328
## 2176 0.000000e+00 0.000000e+00   1970         eng                      424
## 2177 7.910204e-01 1.044696e-01   1950         eng                      264
## 2178 3.617533e-02 4.508978e-02   1950         eng                      416
## 2179 4.991369e-02 5.661193e-01   1960         eng                      296
## 2180 8.685661e-01 3.014114e-01   1950         eng                      216
## 2181 5.345755e-03 6.361043e-02   1970         eng                      264
## 2182 1.411370e-01 3.197246e-01   1970         eng                      344
## 2183 8.503658e-03 1.013060e-01   1960         eng                      456
## 2184 9.006406e-03 1.850693e-01   1950         eng                      264
## 2185 1.448094e-02 3.331005e-01   1960         eng                      248
## 2186 6.178867e-03 3.769971e-01   1960         eng                      264
## 2187 3.612990e-04 4.391144e-01   1970         eng                      230
## 2188 8.512235e-03 2.129864e-01   1960         eng                      232
## 2189 6.366454e-03 8.701805e-02   1970         eng                      224
## 2190 4.213891e-02 1.779837e-01   1970         eng                      320
## 2191 3.030069e-02 7.976528e-02   1960         eng                      168
## 2192 2.973652e-02 4.626006e-01   1970         non          easia       298
## 2193 9.358000e-04 3.834120e-01   1950         non          easia       394
## 2194 5.933071e-02 9.496713e-02   1950         non          easia       352
## 2195 1.244399e-02 3.807193e-01   1980         eur            eur       392
## 2196 1.389288e-03 3.897669e-01   1980         eur            eur       256
## 2197 1.280349e-01 5.287344e-01   1960         eur            eur       140
## 2198 1.160727e-01 8.355420e-02   1960         eur            eur       456
## 2199 1.000664e-02 6.799787e-02   1970         eng                      268
## 2200 4.554274e-02 1.403812e-01   1970         eng                      248
## 2201 3.261845e-02 1.546296e-01   1970         eng                      168
## 2202 1.599732e-01 3.838147e-01   1970         eur            eur       456
## 2203 5.045364e-02 1.444092e-01   1960         eng                      456
## 2204 4.035206e-02 7.288684e-01   1950         eng                      262
## 2205 1.117896e-02 1.088808e-01   1960         eng                      202
## 2206 5.133442e-02 5.267612e-02   1970         eng                      344
## 2207 7.744675e-02 4.814881e-01   1950         eng                      322
## 2208 2.440173e-02 5.832231e-01   1980         eng                      260
## 2209 2.115405e-02 3.245429e-01   1950         eur            eur       420
## 2210 6.009570e-01 2.185690e-01   1950         non        classic       356
## 2211 7.484985e-03 3.386174e-01   1950         eur            eur       238
## 2212 2.747090e-02 2.182560e-01   1970         eur            eur       216
## 2213 2.399116e-03 2.194244e-01   1950         eur            eur       446
## 2214 1.058946e-01 5.876923e-02   1950         non          easia       200
## 2215 4.274805e-02 1.661320e-01   1970         eur            eur       388
## 2216 6.276473e-01 9.344644e-02   1970         eur            eur       184
## 2217 3.473975e-03 5.282374e-01   1970         eur            eur       454
## 2218 1.172233e-02 3.478001e-01   1970         eur            eur       144
## 2219 2.577286e-01 3.633919e-01   1960         eur            eur       326
## 2220 4.597513e-01 1.107259e-01   1960         eng                      170
## 2221 1.031942e-02 1.877934e-01   1970         eur            eur       412
## 2222 2.193601e-02 3.854723e-01   1980         eur            eur       144
## 2223 5.968982e-02 4.560020e-02   1950         eng                      298
## 2224 5.271613e-01 1.351642e-01   1960         eng                      200
## 2225 2.051186e-01 4.545057e-02   1960         eng                      328
## 2226 1.433072e-02 2.585567e-01   1970         eng                      774
## 2227 8.576183e-03 6.336055e-02   1960         non          easia       296
## 2228 3.804724e-02 1.271071e-01   1980         eng                      200
## 2229 8.730981e-03 5.666332e-02   1950         eur            eur       206
## 2230 7.910819e-03 7.148848e-02   1970         eur            eur       292
## 2231 2.275240e-03 6.371471e-02   1960         eur            eur       204
## 2232 1.632514e-02 3.306583e-02   1970         eur            eur       144
## 2233 1.763550e-02 8.060649e-02   1960         eng                      576
## 2234 1.676364e-02 7.017012e-01   1970         eur            eur       328
## 2235 2.823699e-02 5.655613e-02   1970         eng                      430
## 2236 1.375064e-02 5.761263e-02   1960         eng                      366
## 2237 0.000000e+00 0.000000e+00   1970         eng                      238
## 2238 1.220142e-02 5.774977e-02   1950         eng                      324
## 2239 5.566333e-03 4.582933e-01   1970         eng                      168
## 2240 5.593478e-02 9.480364e-02   1950         eng                      284
## 2241 4.546585e-02 2.087823e-01   1970         eng                      280
## 2242 8.968910e-03 8.030083e-02   1970         eur            eur       152
## 2243 6.049423e-03 3.208379e-01   1960         eur            eur       424
## 2244 1.197877e-02 6.120305e-02   1960         eng                      328
## 2245 3.409804e-03 4.353940e-01   1970         eng                      196
## 2246 2.101973e-01 2.854628e-01   1960         eur            eur       360
## 2247 7.934839e-03 5.865889e-02   1980         eng                      728
## 2248 4.379792e-02 1.986190e-01   1950         eur            eur       186
## 2249 7.043425e-02 4.606499e-01   1970         non        mideast       224
## 2250 7.975548e-03 1.201037e-01   1970         eng                      360
## 2251 9.142844e-02 4.947923e-01   1950         non          easia       328
## 2252 1.597864e-01 1.199448e-01   1970         eur            eur       330
## 2253 5.916901e-02 5.875922e-02   1970         eng                      296
## 2254 8.820354e-03 2.580964e-01   1950         eur            eur       168
## 2255 8.346930e-04 2.315797e-01   1960         eur            eur       172
## 2256 2.584079e-03 7.689292e-02   1960         eur            eur       136
## 2257 1.679441e-02 4.013308e-02   1970         eng                      328
## 2258 5.533497e-02 3.635673e-02   1960         eur            eur       264
## 2259 2.555747e-01 1.881119e-01   1950         eng                      326
## 2260 1.930356e-01 1.314426e-01   1980         eng                      490
## 2261 1.956523e-02 3.103698e-01   1980         non          easia       408
## 2262 6.092902e-03 1.037399e-01   1980         eng                      264
## 2263 1.800400e-02 6.134511e-01   1960         eng                      220
## 2264 7.446430e-04 5.580847e-02   1960         eng                      320
## 2265 1.554345e-03 4.637329e-02   1960         eng                      344
## 2266 4.583922e-01 4.742100e-02   1980         eng                      256
## 2267 2.282869e-02 1.358680e-01   1960         eng                      304
## 2268 2.645861e-03 2.494800e-01   1950         eur            eur       180
## 2269 6.973373e-02 5.399421e-01   1970         eng                      344
## 2270 4.860780e-04 6.315785e-02   1960         eur            eur       276
## 2271 1.677996e-02 2.747477e-01   1980         eng                      252
## 2272 3.778407e-02 1.212917e-01   1970         eur            eur       344
## 2273 1.728468e-02 3.050267e-01   1970         eur            eur       364
## 2274 2.408528e-03 1.877471e-01   1950         eur            eur       414
## 2275 5.250980e-04 5.487687e-01   1970         eur            eur       232
## 2276 2.215208e-02 3.090139e-01   1960         eur            eur       320
## 2277 2.181144e-03 9.615211e-02   1960         non          sasia       256
## 2278 1.136824e-02 1.260878e-02   1960         eur            eur       250
## 2279 5.430359e-02 1.792727e-02   1950         eur            eur       164
## 2280 2.167916e-01 4.350050e-02   1960         eur            eur       136
## 2281 1.413101e-03 5.100802e-01   1970         eur            eur       168
## 2282 1.952725e-02 3.347356e-01   1980         eng                      280
## 2283 7.116678e-03 9.376779e-02   1960         eng                      166
## 2284 2.542319e-01 4.805349e-01   1960         eur            eur       156
## 2285 1.244793e-01 4.404005e-01   1980         eng                      304
## 2286 6.289078e-02 1.754435e-01   1980         eng                      312
## 2287 1.744234e-02 7.746134e-02   1970         eng                      240
## 2288 2.023035e-02 9.727905e-02   1960         eng                      264
## 2289 2.453334e-02 3.913354e-02   1970         eng                      200
## 2290 3.957523e-02 5.129349e-02   1960         eng                      380
## 2291 8.721480e-04 4.791718e-01   1970         non          easia       296
## 2292 2.372526e-02 1.280022e-01   1950         eur            eur       256
## 2293 2.527027e-01 3.753750e-01   1960         eur            eur       216
## 2294 1.998944e-02 1.076850e-01   1980         eur            eur       220
## 2295 6.977051e-01 4.873442e-02   1960         non          easia       276
## 2296 3.359504e-02 1.932183e-01   1960         eng                      168
## 2297 9.090017e-03 2.677156e-01   1960         eur            eur       324
## 2298 6.461470e-02 3.621097e-01   1970         non        mideast       328
## 2299 3.073485e-02 1.826173e-01   1970         non          easia       250
## 2300 5.277148e-03 2.991358e-01   1970         eng                      334
## 2301 4.993452e-01 3.830300e-01   1960         eur            eur       152
## 2302 2.167638e-02 2.032058e-01   1980         eng                      312
## 2303 1.711226e-02 3.389986e-01   1970         eng                      624
## 2304 0.000000e+00 0.000000e+00   1970         eng                      200
## 2305 9.877100e-02 1.869282e-01   1970         eur            eur       716
## 2306 2.179383e-02 3.623367e-01   1980         eng                      264
## 2307 2.853030e-01 9.390146e-02   1950         eng                      456
## 2308 5.799930e-03 2.874508e-02   1960         eur            eur       164
## 2309 2.988813e-03 6.356922e-02   1950         eur            eur       208
## 2310 8.973723e-03 2.394135e-01   1950         eur            eur       232
## 2311 1.183099e-03 2.764816e-01   1960         eur            eur       424
## 2312 2.914914e-03 2.491009e-01   1970         eur            eur       454
## 2313 1.494595e-03 1.763561e-01   1950         eur            eur       236
## 2314 1.066181e-01 5.123421e-01   1970         eur            eur       188
## 2315 2.301094e-01 3.834877e-01   1970         eur            eur       136
## 2316 4.421764e-03 6.878043e-02   1950         eur            eur       328
## 2317 2.562220e-02 4.542834e-01   1970         eur            eur       170
## 2318 3.358682e-03 1.704525e-01   1970         eur            eur       696
## 2319 1.404113e-02 1.177727e-01   1960         eng                      224
## 2320 1.169144e-02 1.167978e-01   1970         eng                      250
## 2321 3.402728e-02 2.409078e-01   1960         eur            eur       392
## 2322 1.623420e-02 3.958897e-01   1960         non         africa       296
## 2323 1.421069e-02 1.144330e-01   1980         non          easia       248
## 2324 1.838305e-01 2.068167e-01   1960         non          easia       264
## 2325 4.572343e-02 2.341557e-01   1970         non          easia       184
## 2326 1.240059e-01 1.010239e-01   1970         non          easia       344
## 2327 2.576456e-02 5.442028e-02   1950         eur            eur       312
## 2328 1.856372e-02 6.466681e-01   1950         eur            eur       244
## 2329 1.616871e-03 3.671839e-02   1960         eur            eur       326
## 2330 2.374503e-03 2.940795e-01   1970         eur            eur       246
## 2331 3.260623e-03 1.310274e-01   1960         eur            eur       264
## 2332 1.468833e-02 2.422907e-01   1950         eur            eur       330
## 2333 4.674487e-02 1.749511e-01   1950         eur            eur       714
## 2334 1.598740e-03 3.385159e-01   1970         eur            eur        94
## 2335 3.797799e-03 1.844684e-01   1960         eur            eur       168
## 2336 8.303320e-04 8.975205e-02   1970         eur            eur       188
## 2337 2.044080e-02 2.593097e-01   1970         eur            eur       192
## 2338 3.846373e-02 3.154043e-01   1980         eng                      264
## 2339 6.976638e-03 6.173048e-01   1980         eur            eur       264
## 2340 2.460657e-02 1.253670e-01   1960         eur            eur       200
## 2341 5.092154e-02 3.023231e-02   1970         eng                      296
## 2342 2.037824e-01 3.758077e-01   1980         eng                      184
## 2343 5.351679e-03 5.092499e-01   1960         non          sasia       270
## 2344 2.810639e-02 1.646227e-01   1970         eng                      392
## 2345 9.279201e-01 1.603464e-01   1960         eng                      420
## 2346 1.159360e-01 7.590529e-01   1980         eng                      206
## 2347 0.000000e+00 0.000000e+00   1960         eur            eur       168
## 2348 5.402139e-02 7.755192e-02   1960         eur            eur       264
## 2349 3.280538e-01 2.149250e-01   1960         eng                      432
## 2350 2.939738e-01 1.760565e-01   1960         non        classic       322
## 2351 8.113623e-02 1.796747e-01   1970         eur            eur       202
## 2352 1.027174e-02 1.483621e-01   1960         eng                      522
## 2353 3.516537e-01 3.300548e-01   1950         eur            eur       182
## 2354 1.143507e-01 2.512679e-01   1970         eng                      264
## 2355 1.253760e-02 4.478908e-01   1970         eng                      264
## 2356 1.224456e-02 4.960797e-02   1970         eur            eur       148
## 2357 1.363620e-02 2.763174e-01   1950         eur            eur       166
## 2358 7.956241e-02 4.668289e-02   1950         eur            eur       172
## 2359 6.454340e-04 1.446221e-01   1960         eur            eur       300
## 2360 2.152169e-03 4.867409e-02   1960         eur            eur       308
## 2361 9.349769e-03 4.716754e-01   1980         eng                      360
## 2362 1.263487e-02 2.045348e-01   1970         eur            eur       176
## 2363 3.485203e-03 8.207381e-02   1970         eur            eur       294
## 2364 3.939447e-03 4.593888e-01   1970         eur            eur       174
## 2365 2.854042e-02 1.250770e-01   1980         eng                      360
## 2366 0.000000e+00 0.000000e+00   1960         eur            eur       134
## 2367 6.000852e-03 7.245804e-02   1970         eur            eur       152
## 2368 3.049017e-03 2.243220e-01   1970         eur            eur      1074
## 2369 3.215268e-02 2.355659e-01   1970         eng                      246
## 2370 5.500588e-02 1.517724e-01   1960         non          easia       682
## 2371 3.707623e-03 1.135401e-01   1960         eng                      336
## 2372 1.038925e-02 3.937958e-01   1950         eur            eur       580
## 2373 8.232921e-02 4.194937e-01   1960         non        classic       358
## 2374 5.204749e-03 2.038298e-01   1950         eur            eur       136
## 2375 1.914187e-03 1.563249e-01   1980         eur            eur       362
## 2376 2.293252e-03 1.257890e-01   1950         eur            eur       224
## 2377 4.622463e-03 2.376543e-01   1960         eur            eur       490
## 2378 5.027706e-02 1.066762e-01   1950         eur            eur       292
## 2379 7.124674e-03 4.677192e-02   1970         eng                      264
## 2380 7.302491e-01 5.470131e-01   1970         eng                      200
## 2381 1.211357e-01 2.941701e-01   1970         eng                      198
## 2382 7.560995e-03 8.541917e-02   1970         eur            eur       136
## 2383 2.854245e-03 2.817886e-01   1970         eur            eur       348
## 2384 1.225525e-01 2.579123e-01   1960         eng                      222
## 2385 8.760355e-02 5.351150e-02   1960         eur            eur       392
## 2386 7.955448e-02 1.265301e-01   1970         eur            eur       164
## 2387 6.331761e-03 2.084891e-01   1970         eng                      432
## 2388 1.282846e-01 5.049648e-01   1970         eur            eur       104
## 2389 1.303720e-01 2.686709e-01   1960         eng                      232
## 2390 1.953778e-02 2.363545e-01   1960         eur            eur       648
## 2391 1.906915e-01 7.317493e-02   1960         eur            eur       456
## 2392 4.930412e-01 4.486553e-01   1950         eng                      186
## 2393 2.227280e-02 1.586214e-01   1960         eur            eur       134
## 2394 2.801098e-03 3.194340e-01   1970         eur            eur        82
## 2395 5.695745e-02 5.754616e-02   1970         eur            eur       298
## 2396 6.829243e-02 9.514788e-02   1980         eng                      312
## 2397 2.675536e-02 2.271263e-01   1950         eng                      200
## 2398 4.024656e-03 2.422600e-01   1960         eur            eur       168
## 2399 3.388915e-02 3.881239e-01   1970         eur            eur       202
## 2400 1.735244e-02 3.206518e-01   1950         eur            eur       162
## 2401 1.463043e-01 3.594029e-01   1970         non        mideast       296
## 2402 8.717894e-03 2.845525e-01   1960         eur            eur       588
## 2403 2.764375e-03 2.570629e-01   1950         eur            eur       332
## 2404 5.588137e-02 3.409841e-01   1980         eng                      360
## 2405 1.028057e-01 2.741088e-01   1960         non        classic       198
## 2406 7.239692e-01 1.684149e-02   1950         eng                      362
## 2407 1.390071e-02 2.837257e-01   1950         eur            eur       136
## 2408 1.630146e-01 6.792734e-01   1970         non          sasia       160
## 2409 2.586762e-02 3.189995e-01   1980         non          sasia       212
## 2410 3.208002e-02 2.536044e-01   1970         eur            eur       200
## 2411 2.026377e-03 9.241350e-02   1970         non          sasia       210
## 2412 4.669274e-02 9.645692e-02   1970         eur            eur       248
## 2413 1.214577e-02 2.643759e-01   1950         eng                      424
## 2414 1.288036e-02 5.211724e-01   1970         eng                      264
## 2415 6.347157e-03 1.957759e-01   1980         eng                      464
## 2416 0.000000e+00 0.000000e+00   1960         eng                      314
## 2417 3.880599e-02 4.290503e-01   1970         eng                      296
## 2418 9.547620e-04 1.738868e-01   1970         non          sasia       440
## 2419 2.183665e-02 5.509512e-01   1970         non          sasia       122
## 2420 9.454514e-03 1.794008e-01   1970         non          sasia       226
## 2421 4.058219e-03 5.185326e-01   1970         non          sasia       110
## 2422 3.084729e-02 9.880005e-02   1970         eur            eur       176
## 2423 1.197392e-02 1.441818e-01   1970         eur            eur       404
## 2424 1.769869e-02 1.210391e-01   1980         eur            eur       232
## 2425 3.803116e-02 1.800992e-01   1980         eur            eur       392
## 2426 1.499820e-02 2.218991e-01   1970         eur            eur       328
## 2427 4.306491e-03 4.274929e-01   1970         eur            eur       232
## 2428 2.034597e-03 4.523671e-01   1970         eur            eur       376
## 2429 4.316541e-02 7.911302e-01   1960         eur            eur       294
## 2430 4.938266e-01 2.584374e-01   1970         eur            eur       162
## 2431 1.708119e-02 3.204637e-01   1950         eur            eur       584
## 2432 3.962888e-02 1.959730e-02   1950         eur            eur       172
## 2433 2.424587e-03 7.446820e-02   1960         eur            eur       136
## 2434 7.908846e-03 6.540049e-01   1970         eur            eur       236
## 2435 1.458196e-02 2.704885e-01   1960         eur            eur       646
## 2436 4.133376e-01 3.048713e-01   1960         eur            eur       128
## 2437 1.010121e-03 8.422640e-01   1950         eur            eur       104
## 2438 2.357758e-02 2.332073e-01   1980         non        classic       178
## 2439 7.097497e-03 7.548916e-02   1960         eur            eur       136
## 2440 1.690098e-01 2.502138e-01   1970         non        classic       272
## 2441 8.477522e-03 7.257798e-01   1980         eur            eur       152
## 2442 3.478272e-01 3.142586e-01   1970         eng                      264
## 2443 7.342585e-02 1.766686e-01   1960         eur            eur       200
## 2444 2.674232e-02 1.204507e-01   1950         eur            eur       294
## 2445 5.817087e-03 2.704278e-01   1950         eur            eur       470
## 2446 4.496723e-02 1.776149e-01   1970         eur            eur       158
## 2447 3.615347e-02 1.676073e-01   1960         eur            eur       232
## 2448 2.131352e-02 1.972923e-01   1960         eng                      328
## 2449 3.526011e-02 2.799428e-01   1960         eng                      298
## 2450 1.100074e-03 6.010702e-01   1960         eur            eur       332
## 2451 1.117515e-03 2.364340e-01   1960         non          easia       160
## 2452 8.385719e-02 8.159100e-02   1960         eur            eur       264
## 2453 1.814054e-02 4.775415e-01   1960         eur            eur       168
## 2454 1.981920e-04 1.967263e-01   1950         eng                      264
## 2455 2.969893e-02 7.447988e-01   1960         eur            eur       412
## 2456 2.104114e-01 3.444274e-01   1980         eur            eur       474
## 2457 2.996037e-02 9.008909e-02   1960         eur            eur       200
## 2458 2.857116e-03 3.201895e-01   1960         eur            eur       200
## 2459 1.757334e-03 8.471965e-02   1980         eng                      200
## 2460 8.597999e-03 2.423219e-01   1970         eng                      232
## 2461 9.526723e-02 1.291767e-01   1960         eng                      458
## 2462 5.411082e-02 2.072550e-01   1950         eng                      198
## 2463 7.206202e-03 2.508706e-01   1950         eur            eur       402
## 2464 2.706531e-02 3.455603e-01   1960         eng                      520
## 2465 4.320471e-03 1.029482e-01   1970         non         africa       166
## 2466 1.788071e-01 1.072860e-01   1970         eur            eur       200
## 2467 1.088782e-02 2.237832e-01   1980         eur            eur       336
## 2468 1.034249e-01 3.662361e-01   1970         eng                      220
## 2469 2.671814e-01 6.138132e-01   1960         eng                      236
## 2470 9.036589e-03 3.935902e-01   1980         eur            eur       356
## 2471 3.262955e-02 7.042310e-01   1960         non          easia       262
## 2472 5.234207e-02 2.021060e-01   1970         non        mideast       168
## 2473 1.790245e-01 5.020625e-02   1960         eng                      328
## 2474 2.785502e-01 2.997336e-01   1970         eng                      392
## 2475 2.214036e-03 3.506265e-01   1950         eur            eur       398
## 2476 6.654100e-02 1.568974e-01   1960         eur            eur       280
## 2477 5.334410e-02 3.034596e-02   1960         eur            eur       250
## 2478 3.684448e-03 5.412930e-01   1980         non        classic       248
## 2479 8.305400e-04 6.425811e-01   1950         non          easia       218
## 2480 2.469852e-02 1.083484e-01   1950         eur            eur       332
## 2481 0.000000e+00 0.000000e+00   1960         eur            eur       380
## 2482 5.251777e-02 5.153367e-01   1950         eur            eur       396
## 2483 1.104031e-01 5.159954e-01   1970         eur            eur       188
## 2484 1.340255e-01 4.390188e-01   1970         eur            eur       208
## 2485 9.201840e-04 1.583596e-01   1970         eng                      288
## 2486 1.136389e-02 2.209291e-01   1950         eng                      360
## 2487 1.451107e-02 2.316790e-01   1950         eur            eur       468
## 2488 1.338989e-01 2.839804e-01   1950         eur            eur       388
## 2489 1.543755e-01 1.940699e-01   1960         eur            eur       246
## 2490 3.169293e-01 9.248418e-02   1950         eur            eur       140
## 2491 1.628394e-01 1.742779e-01   1960         eur            eur       260
## 2492 1.984170e-01 2.182344e-01   1970         eng                      200
## 2493 5.450428e-03 3.909676e-02   1970         eng                      252
## 2494 4.117728e-02 1.405794e-01   1960         eng                      454
## 2495 1.018200e-02 2.307143e-01   1970         eur            eur       136
## 2496 1.423842e-01 2.843480e-01   1950         eng                      264
## 2497 8.580750e-04 3.511213e-01   1950         eng                      234
## 2498 1.767497e-01 2.832343e-01   1960         eng                      184
## 2499 1.324309e-01 2.143660e-01   1950         eur            eur       216
## 2500 1.733420e-01 4.902875e-01   1960         eur            eur       232
## 2501 1.033174e-01 1.723654e-01   1970         eng                      168
## 2502 0.000000e+00 0.000000e+00   1960         non        classic       176
## 2503 8.696520e-03 3.455435e-01   1960         eng                      308
## 2504 2.806592e-02 7.898708e-01   1970         eng                      404
## 2505 7.917248e-03 1.171764e-01   1960         eur            eur       298
## 2506 2.931893e-02 2.970583e-01   1970         eng                      376
## 2507 1.603724e-01 1.263209e-01   1970         eur            eur       214
## 2508 6.533284e-03 4.348921e-02   1980         eng                      560
## 2509 2.470714e-03 2.344022e-01   1980         eur            eur       360
## 2510 4.042797e-02 6.341982e-01   1980         eur            eur       136
## 2511 3.160200e-02 4.236792e-01   1980         non        classic       264
## 2512 1.050697e-02 2.461653e-01   1950         eur            eur       232
## 2513 4.269226e-03 2.882370e-01   1960         eur            eur       276
## 2514 6.861366e-01 4.637874e-01   1980         eur            eur       136
## 2515 1.353739e-01 1.015522e-01   1970         eng                      408
## 2516 1.242784e-02 2.828847e-01   1950         eur            eur       408
## 2517 3.828452e-02 6.050323e-02   1950         eur            eur       546
## 2518 8.997064e-03 4.109553e-01   1970         eng                      248
## 2519 9.555361e-01 1.608894e-01   1970         eur            eur       206
## 2520 1.270612e-02 2.622595e-01   1960         eur            eur       394
## 2521 1.442012e-01 5.601357e-01   1950         eur            eur       840
## 2522 8.219188e-01 4.364888e-01   1960         non          easia       644
## 2523 7.413681e-02 2.197119e-01   1980         non          easia       446
## 2524 1.667395e-03 1.313142e-01   1980         eng                      468
## 2525 4.416595e-01 2.366446e-01   1950         eur            eur       264
## 2526 7.370531e-03 2.254042e-01   1980         non                      288
## 2527 1.384430e-01 3.659857e-01   1970         eur            eur       274
## 2528 1.713043e-01 7.915191e-02   1950         eng                      264
## 2529 5.510562e-03 1.245812e-01   1970         eur            eur       200
## 2530 7.266936e-03 1.963163e-01   1960         eur            eur       168
## 2531 1.178384e-03 2.026200e-01   1960         eur            eur       270
## 2532 4.504390e-04 2.081795e-01   1960         eur            eur       538
## 2533 9.601070e-04 4.110466e-01   1970         eur            eur       174
## 2534 6.236287e-03 2.903938e-01   1950         eur            eur       362
## 2535 2.734010e-03 2.833205e-01   1970         eur            eur       232
## 2536 5.021954e-01 2.705997e-01   1960         eur            eur       196
## 2537 7.397879e-03 9.528481e-02   1970         eng                      362
## 2538 6.141646e-02 1.879321e-02   1970         eng                      362
## 2539 8.486936e-03 2.307590e-01   1970         non          easia       354
## 2540 6.134240e-04 4.764567e-01   1950         eur            eur       416
## 2541 7.324428e-01 3.459049e-01   1950         eng                      268
## 2542 1.653486e-03 1.657918e-02   1960         non          sasia       138
## 2543 3.177832e-03 5.205258e-02   1960         non          sasia       132
## 2544 1.800204e-02 2.732475e-01   1970         eur            eur       104
## 2545 2.191820e-02 3.934409e-02   1960         eng                      426
## 2546 7.538113e-03 8.062035e-02   1960         eng                      128
## 2547 4.245109e-03 6.844320e-01   1950         eur            eur       426
## 2548 1.974784e-02 2.524778e-01   1960         eng                      328
## 2549 9.586798e-03 1.098910e-01   1970         eng                      536
## 2550 1.848775e-01 1.934251e-01   1970         eng                      696
## 2551 1.480802e-03 3.690500e-01   1950         eur            eur       328
## 2552 2.463530e-04 6.769950e-02   1950         eur            eur       420
## 2553 6.845441e-02 4.379229e-01   1960         eur            eur       276
## 2554 5.711032e-03 5.727402e-01   1970         eur            eur       296
## 2555 5.940900e-03 2.965286e-02   1950         eur            eur       170
## 2556 3.649603e-01 2.695004e-01   1960         eng                      650
## 2557 4.976396e-02 6.616526e-02   1950         eng                      458
## 2558 4.570288e-02 2.897164e-01   1980         eur            eur       668
## 2559 5.916109e-02 1.916944e-01   1970         eng                      176
## 2560 3.970669e-01 1.030746e-01   1970         non          easia       168
## 2561 8.785779e-01 1.075765e-01   1950         eng                      272
## 2562 2.152466e-02 6.955429e-01   1970         eng                      392
## 2563 9.760717e-03 3.247683e-01   1960         eur            eur       458
## 2564 3.188565e-02 1.810442e-01   1950         eur            eur       252
## 2565 8.199356e-02 9.978213e-02   1970         eng                      964
## 2566 3.941990e-02 6.038073e-01   1950         eng                      266
## 2567 1.708971e-02 6.258339e-01   1970         eur            eur       504
## 2568 2.902488e-03 4.719118e-01   1950         eur            eur       330
## 2569 1.502813e-01 1.366557e-01   1980         eng                     1320
## 2570 5.505696e-03 5.410946e-02   1960         eng                      202
## 2571 1.313690e-01 4.520588e-01   1970         eng                      244
## 2572 2.319650e-02 5.040569e-01   1960         eng                      234
## 2573 2.516085e-02 1.938686e-01   1960         eur            eur       372
## 2574 2.514288e-02 2.968860e-01   1980         eur            eur       264
## 2575 5.143158e-02 1.495364e-01   1970         eng                      160
## 2576 8.653005e-02 6.394349e-02   1950         eur            eur       212
## 2577 2.905961e-02 2.859903e-01   1970         eur            eur       296
## 2578 6.271316e-02 4.995400e-01   1950         non          easia       116
## 2579 2.364046e-02 2.036878e-01   1980         eur            eur       168
## 2580 4.182820e-04 1.568427e-01   1950         eur            eur       298
## 2581 6.174090e-04 7.937978e-01   1980         non          easia       216
## 2582 2.805192e-03 8.120758e-01   1960         eng                      216
## 2583 1.633141e-01 4.629558e-01   1950         non        mideast       270
## 2584 5.639920e-01 7.925070e-01   1980         eur            eur       328
## 2585 9.785436e-03 4.647261e-01   1960         eur            eur       264
## 2586 2.319601e-01 7.498704e-02   1970         eng                      248
## 2587 6.258447e-02 3.468431e-01   1950         eur            eur       136
## 2588 8.380689e-02 6.088900e-01   1960         eng                      200
## 2589 8.347927e-03 9.677479e-02   1960         eur            eur       664
## 2590 4.481037e-03 6.174668e-01   1960         eur            eur       340
## 2591 1.203897e-02 3.617794e-01   1960         eur            eur       308
## 2592 3.703348e-02 1.437295e-01   1970         eng                      328
## 2593 2.890542e-02 2.645148e-01   1960         eur            eur       352
## 2594 5.288861e-02 9.543979e-02   1980         non          sasia       156
## 2595 8.508270e-03 2.525628e-01   1980         eur            eur       224
## 2596 4.495384e-03 8.442107e-01   1960         non          easia       196
## 2597 1.113536e-01 8.346443e-01   1950         eur            eur       170
## 2598 1.075024e-02 1.653640e-01   1970         non          easia       234
## 2599 2.517013e-03 1.062979e-01   1960         non          sasia       250
## 2600 1.908663e-01 2.229495e-01   1970         eur            eur       398
## 2601 6.291985e-03 1.661422e-01   1950         eng                      338
## 2602 1.102325e-02 2.711343e-01   1950         eng                      282
## 2603 1.032262e-01 6.335056e-01   1980         eur            eur       104
## 2604 3.670300e-04 7.389249e-02   1960         eur            eur       172
## 2605 5.684658e-02 2.908702e-02   1960         eur            eur       248
## 2606 1.217927e-01 2.020157e-01   1980         eng                      342
## 2607 1.076308e-01 1.807538e-01   1970         eng                      420
## 2608 4.667452e-02 6.475262e-02   1960         eur            eur       186
## 2609 5.201061e-03 2.765018e-01   1970         eng                      200
## 2610 1.597407e-01 9.829755e-02   1970         eng                      328
## 2611 1.502861e-02 2.631046e-01   1960         eng                      456
## 2612 8.931199e-02 1.843277e-01   1970         eng                      344
## 2613 5.826739e-03 6.431434e-01   1970         non          sasia       106
## 2614 1.068100e-02 7.933375e-01   1980         eng                      184
## 2615 7.249622e-01 5.509754e-01   1970         eur            eur       184
## 2616 9.845149e-01 1.718946e-01   1970         non            eur       130
## 2617 6.404987e-02 2.526027e-01   1970         eur            eur       360
## 2618 1.121108e-03 3.807521e-01   1960         eng                      200
## 2619 2.462532e-02 2.163009e-01   1950         non        classic       190
## 2620 1.327292e-02 9.680191e-02   1970         eur            eur       276
## 2621 3.863828e-02 3.921654e-01   1970         eur            eur       206
## 2622 2.237920e-04 2.938260e-01   1970         eur            eur       176
## 2623 1.997936e-03 5.469613e-01   1970         eur            eur       212
## 2624 7.380583e-01 5.784459e-02   1970         eng                      144
## 2625 2.437835e-01 7.986016e-02   1980         eur            eur       242
## 2626 3.087783e-01 1.017252e-01   1970         eng                      374
## 2627 1.443112e-01 5.098424e-01   1970         eng                      280
## 2628 2.194223e-01 1.017444e-01   1970         eur            eur       850
## 2629 2.662633e-03 1.122786e-01   1960         non          easia       264
## 2630 7.418126e-03 2.437945e-01   1960         eur            eur       364
## 2631 9.383500e-04 5.545265e-01   1980         non          easia       214
## 2632 1.059757e-02 1.546559e-01   1970         eng                      304
## 2633 4.303916e-02 2.275024e-01   1960         eng                      424
## 2634 2.067720e-03 3.398887e-01   1970         eur            eur       200
## 2635 1.190576e-02 3.160730e-01   1970         non          easia       200
## 2636 7.274749e-02 1.710462e-01   1960         eur            eur       424
## 2637 5.084595e-03 2.224347e-02   1950         eur            eur       200
## 2638 6.643219e-01 5.075432e-01   1970         non                      344
## 2639 1.284147e-02 2.508095e-01   1950         eur            eur       684
## 2640 3.015234e-03 1.120703e-01   1950         eur            eur       594
## 2641 2.302672e-03 2.687269e-01   1980         eur            eur       272
## 2642 5.056936e-03 3.467765e-02   1980         eur            eur       168
## 2643 1.436978e-02 6.800885e-01   1960         eur            eur       184
## 2644 2.586137e-03 2.255135e-01   1970         eur            eur       236
## 2645 8.670000e-05 2.276697e-01   1970         eur            eur       234
## 2646 1.088965e-02 3.025457e-01   1980         non          easia       384
## 2647 9.492002e-02 2.569443e-01   1980         non          easia       120
## 2648 3.110740e-02 3.021972e-01   1980         eng                      328
## 2649 3.082187e-02 1.226428e-01   1960         eng                      196
## 2650 2.041250e-02 4.186157e-01   1980         eng                      444
## 2651 3.914264e-02 5.857404e-01   1960         eng                      130
## 2652 7.316270e-02 3.525874e-02   1970         non        mideast       134
## 2653 5.743754e-03 1.259307e-01   1980         eng                      376
## 2654 7.921571e-03 2.073002e-01   1950         eng                      520
## 2655 1.649269e-01 1.170311e-01   1970         eng                      164
## 2656 5.959545e-01 7.844542e-02   1970         eur            eur       296
## 2657 0.000000e+00 0.000000e+00   1970         eng                      156
## 2658 6.992584e-03 1.115975e-01   1980         non        classic       264
## 2659 2.267760e-04 4.791974e-01   1960         eur            eur       220
## 2660 1.166448e-01 9.805983e-02   1960         eur            eur       392
## 2661 3.931852e-02 1.537313e-01   1980         non        classic       378
## 2662 6.983021e-02 6.085789e-01   1970         eur            eur       328
## 2663 2.436889e-02 3.068014e-01   1980         non          easia       216
## 2664 8.484852e-03 4.601322e-01   1980         non          easia       296
## 2665 7.930226e-03 1.308360e-01   1970         eur            eur       164
## 2666 1.027040e-01 3.063438e-01   1960         non        classic       224
## 2667 3.782063e-02 2.676863e-01   1950         non            eur       296
## 2668 1.128436e-03 2.871744e-01   1970         eur            eur       170
## 2669 1.558264e-02 1.628889e-01   1960         eng                      360
## 2670 5.981391e-03 1.290791e-01   1960         eur            eur       522
## 2671 7.361237e-02 2.500969e-01   1970         eur            eur       216
## 2672 5.547300e-03 1.777052e-01   1950         eur            eur       356
## 2673 7.569650e-04 7.941969e-02   1950         eur            eur       188
## 2674 1.245517e-01 2.905040e-01   1970         eur            eur       192
## 2675 1.562603e-02 3.632921e-01   1970         non          easia       234
## 2676 9.682647e-03 1.588086e-01   1950         eur            eur       264
## 2677 2.155038e-02 4.447929e-02   1970         non        mideast       268
## 2678 9.715001e-03 4.654970e-01   1960         eur            eur       226
## 2679 6.655194e-02 4.140681e-02   1960         eng                      328
## 2680 1.645404e-03 3.093673e-01   1980         eur            eur       134
## 2681 5.548073e-03 1.697302e-01   1950         eng                      698
## 2682 6.541249e-02 8.978553e-02   1970         eng                      382
## 2683 2.803500e-03 2.085900e-01   1980         eur            eur       168
## 2684 5.172755e-01 5.075755e-02   1970         eng                      200
## 2685 3.473948e-01 5.940545e-01   1980         eng                     1352
## 2686 4.490445e-02 2.865150e-01   1960         eur            eur       256
## 2687 6.492687e-02 1.495192e-01   1960         eur            eur       216
## 2688 7.527230e-02 8.895115e-02   1960         eng                      458
## 2689 7.974812e-02 5.237828e-02   1950         eng                      174
## 2690 8.004428e-03 6.700647e-02   1970         eng                      236
## 2691 2.729758e-03 3.536796e-02   1980         eng                      248
## 2692 3.179142e-02 3.624356e-01   1970         eur            eur       414
## 2693 1.099781e-01 1.578004e-01   1970         eng                      192
## 2694 5.169733e-03 1.364838e-01   1970         eng                      200
## 2695 4.923761e-01 2.583715e-01   1970         eur            eur       184
## 2696 9.625277e-02 1.513539e-01   1950         eur            eur       298
## 2697 2.842055e-03 1.906297e-01   1960         eur            eur       366
## 2698 1.503999e-01 1.427841e-01   1980         eng                      456
## 2699 6.743758e-03 7.053988e-02   1970         eng                      238
## 2700 3.058490e-02 2.368663e-01   1980         non          easia       154
## 2701 2.234163e-01 1.036865e-01   1980         eng                      260
## 2702 7.458321e-02 1.681177e-01   1970         eng                      200
## 2703 4.300953e-02 5.068253e-01   1970         non          easia       186
## 2704 3.963049e-03 3.125518e-01   1970         eur            eur       172
## 2705 1.475834e-01 2.404325e-01   1970         eng                      232
## 2706 9.461733e-02 1.181257e-01   1970         eng                      200
## 2707 1.570983e-01 4.925404e-01   1960         non        mideast       288
## 2708 2.201364e-03 2.220644e-01   1950         eur            eur       440
## 2709 1.199649e-01 5.448689e-02   1960         eng                      232
## 2710 2.328109e-03 6.568251e-02   1970         eur            eur       160
## 2711 0.000000e+00 0.000000e+00   1970         eur            eur       136
## 2712 1.288561e-02 1.965016e-01   1970         eur            eur       200
## 2713 5.211277e-03 8.009958e-02   1980         eur            eur       168
## 2714 4.232077e-03 4.499120e-01   1950         eng                      380
## 2715 5.042635e-02 3.870859e-01   1970         non         africa       364
## 2716 7.726264e-03 7.306211e-02   1950         eng                      256
## 2717 6.677684e-02 1.623498e-01   1970         eng                      168
## 2718 1.136422e-02 8.403654e-02   1950         eur            eur       268
## 2719 9.971860e-04 1.405826e-01   1980         eur            eur       160
## 2720 2.628970e-04 4.965262e-01   1970         eur            eur       298
## 2721 6.651113e-01 3.690929e-01   1970         non        mideast       360
## 2722 4.178445e-01 3.595138e-01   1950         non        mideast       194
## 2723 2.722095e-02 6.986881e-01   1970         eur            eur       392
## 2724 3.692322e-03 1.277305e-01   1950         eur            eur       292
## 2725 4.883958e-02 3.272120e-01   1970         eng                      280
## 2726 1.939499e-01 1.505492e-01   1950         eng                      366
## 2727 1.919925e-01 1.146243e-01   1950         eng                      330
## 2728 6.470383e-02 5.056751e-01   1950         eur            eur       802
## 2729 6.561664e-02 3.553322e-01   1970         eur            eur       222
## 2730 9.460528e-03 5.731224e-02   1950         eur            eur       136
## 2731 6.826096e-03 9.928359e-02   1980         eng                      200
## 2732 1.254574e-02 2.728707e-01   1950         eur            eur       264
## 2733 2.314115e-01 6.276881e-02   1970         eng                      232
## 2734 2.365298e-02 1.002254e-01   1960         eur            eur       396
## 2735 1.212989e-01 1.927766e-01   1950         eur            eur       264
## 2736 1.376464e-03 5.668751e-02   1980         eur            eur       150
## 2737 9.038417e-02 2.826841e-01   1970         eng                      232
## 2738 1.364449e-01 1.146749e-02   1980         eng                      312
## 2739 6.275564e-03 5.517708e-01   1980         eur            eur       160
## 2740 2.947682e-03 7.814433e-02   1980         eng                      264
## 2741 4.574540e-03 2.253262e-01   1980         eng                      294
## 2742 2.627441e-02 4.611819e-01   1980         eur            eur       184
## 2743 3.031350e-01 2.768713e-01   1980         eng                      264
## 2744 3.204808e-02 5.357896e-01   1980         eng                      184
## 2745 2.621116e-01 6.368174e-01   1980         eur            eur       232
## 2746 1.009574e-01 1.905435e-01   1950         eur            eur       644
## 2747 1.134940e-01 5.887240e-01   1960         eur            eur       246
## 2748 1.256400e-01 5.514631e-01   1980         non        mideast       324
## 2749 2.201904e-02 4.047238e-02   1960         eng                      350
## 2750 3.621964e-03 7.121454e-01   1970         non          easia       220
## 2751 3.628738e-02 5.117429e-01   1970         non          sasia       136
## 2752 2.211110e-01 4.475461e-01   1970         eng                      134
## 2753 5.070795e-02 1.311108e-01   1960         eur            eur       218
## 2754 7.325845e-02 6.720014e-01   1980         eng                      136
## 2755 3.796468e-01 1.255989e-01   1960         eng                      228
## 2756 5.831179e-02 1.516449e-01   1970         eur            eur       136
## 2757 4.848300e-03 5.889050e-02   1980         eng                      344
## 2758 1.921453e-01 7.181768e-01   1980         eng                      284
## 2759 1.111265e-01 1.471441e-01   1950         eng                      394
## 2760 2.183185e-01 4.333927e-01   1980         eur            eur       680
## 2761 3.941217e-02 6.333468e-02   1960         eng                      312
## 2762 1.368261e-02 4.509942e-01   1980         eng                      310
## 2763 4.200627e-02 7.039883e-02   1960         eng                      216
## 2764 8.876781e-02 1.189990e-01   1970         eng                      466
## 2765 1.737602e-02 3.499913e-01   1960         non        mideast       454
## 2766 1.334013e-01 3.231544e-01   1960         eng                      422
## 2767 3.020061e-01 3.486915e-01   1980         non        mideast       232
## 2768 4.422432e-02 3.072371e-01   1980         eur            eur       408
## 2769 7.078894e-02 5.443338e-01   1970         eur            eur       344
## 2770 5.891428e-02 9.353283e-02   1960         non          easia       350
## 2771 1.411045e-02 6.693898e-01   1980         eng                      190
## 2772 6.148469e-03 2.183329e-01   1980         eng                      402
## 2773 3.313584e-02 2.851190e-01   1950         eur            eur       238
## 2774 8.776295e-03 1.403673e-01   1950         eur            eur       486
## 2775 8.700457e-02 2.125955e-01   1970         eng                      580
## 2776 1.834811e-02 8.554129e-02   1980         non          easia       224
## 2777 9.817819e-03 8.778508e-02   1970         eur            eur       332
## 2778 8.284974e-02 3.863439e-01   1950         eng                      318
## 2779 5.830366e-01 2.338512e-01   1950         eur            eur       102
## 2780 9.959850e-01 1.870997e-01   1960         eng                      136
## 2781 1.640667e-01 1.172230e-01   1950         eur            eur       532
## 2782 8.189260e-04 6.416707e-02   1950         eur            eur       208
## 2783 1.112293e-02 2.202006e-01   1950         eur            eur       452
## 2784 9.351885e-02 1.910810e-01   1970         eng                      256
## 2785 4.345191e-03 1.780559e-01   1970         eur            eur       262
## 2786 1.134261e-02 4.207415e-02   1980         eur            eur       152
## 2787 5.894513e-02 1.940488e-01   1980         eng                      232
## 2788 4.865370e-03 6.912129e-02   1980         eng                      282
## 2789 4.446589e-02 2.108603e-01   1970         eur            eur       232
## 2790 1.436921e-01 2.222449e-01   1980         eng                      328
## 2791 6.568587e-02 2.909586e-02   1980         eng                      184
## 2792 1.134470e-02 1.713633e-01   1980         eur            eur       150
## 2793 7.585036e-02 4.009786e-01   1980         eng                      762
## 2794 1.118457e-02 3.788420e-01   1980         eng                      426
## 2795 6.280775e-03 5.756871e-01   1980         non          easia       232
## 2796 0.000000e+00 0.000000e+00   1980         eng                      338
## 2797 3.703410e-01 3.495374e-01   1970         eng                      868
## 2798 7.549879e-03 8.625039e-02   1950         eur            eur       458
## 2799 9.671208e-03 2.163296e-01   1970         eng                      216
## 2800 8.423144e-01 8.229776e-01   1960         eng                      198
## 2801 1.213331e-01 8.318421e-02   1950         eng                      460
## 2802 3.076481e-01 2.314946e-01   1960         eur            eur       326
## 2803 2.213387e-02 3.939741e-01   1970         eur            eur       292
## 2804 5.103610e-02 2.220167e-01   1980         eur            eur       536
## 2805 1.080344e-01 2.034089e-01   1980         eng                      360
## 2806 3.754716e-03 1.443818e-01   1970         non          easia       408
## 2807 1.071003e-01 3.867535e-01   1950         eur            eur       382
## 2808 5.682294e-01 7.766900e-01   1950         eng                      318
## 2809 1.191345e-01 7.964154e-02   1980         eur            eur       372
## 2810 1.853358e-01 3.789464e-01   1960         eur            eur      1076
## 2811 0.000000e+00 0.000000e+00   1970         eng                      710
## 2812 5.922473e-03 8.420224e-02   1960         eur            eur       232
## 2813 2.040000e-05 1.317432e-01   1960         eng                      248
## 2814 2.981003e-02 6.306327e-02   1950         eng                      326
## 2815 7.092379e-02 1.095951e-01   1950         eng                      304
## 2816 8.788672e-03 5.449111e-01   1960         eng                      276
## 2817 4.102325e-02 1.773260e-01   1980         eur            eur       232
## 2818 5.650590e-03 1.876445e-01   1970         eng                     1956
## 2819 4.093579e-02 2.548573e-01   1980         eur            eur       294
## 2820 1.013012e-01 4.556722e-01   1950         non          easia       496
## 2821 7.834912e-02 4.761260e-02   1980         eur            eur       202
## 2822 1.277027e-01 1.640172e-01   1980         eng                      232
## 2823 8.210108e-02 9.002362e-02   1980         eng                      200
## 2824 1.036937e-02 7.294832e-02   1970         eng                      442
## 2825 2.704057e-02 2.677877e-01   1960         eng                      316
## 2826 2.357796e-02 3.152011e-01   1970         eur            eur       252
## 2827 6.452978e-03 1.268553e-01   1950         non                      216
## 2828 1.052157e-01 2.726182e-01   1980         eur            eur       196
## 2829 1.520900e-02 5.284661e-02   1960         eur            eur       136
## 2830 7.383583e-03 5.661782e-01   1970         eng                      200
## 2831 1.810346e-02 1.680922e-01   1980         eng                      424
## 2832 4.338867e-03 1.708182e-01   1980         eng                      328
## 2833 1.294701e-01 2.277728e-01   1980         eur            eur       244
## 2834 5.829073e-02 3.840364e-02   1980         eng                      232
## 2835 9.215674e-02 6.694660e-01   1950         eng                      266
## 2836 9.098863e-01 2.156244e-01   1980         eur            eur       136
## 2837 3.255970e-01 5.192301e-01   1980         non          easia       104
## 2838 4.227572e-03 1.989216e-01   1960         eng                      400
## 2839 9.063330e-04 3.559406e-01   1970         eur            eur       164
## 2840 4.576550e-04 3.944645e-01   1970         eur            eur       226
## 2841 2.508273e-03 6.977178e-02   1970         eng                      392
## 2842 2.756210e-02 7.842480e-02   1950         eur            eur       344
## 2843 2.759417e-02 8.264335e-01   1980         non          easia       256
## 2844 9.168129e-03 5.823662e-02   1960         eur            eur       192
## 2845 5.540791e-02 4.639328e-01   1970         non          easia       226
## 2846 5.198867e-02 1.992109e-01   1960         eng                      200
## 2847 8.127438e-02 1.849762e-01   1960         eng                      264
## 2848 2.709804e-01 9.482034e-02   1980         eng                      488
## 2849 2.503807e-02 5.007913e-01   1970         eur            eur       272
## 2850 5.392268e-03 3.002696e-01   1950         eur            eur       414
## 2851 5.101392e-03 3.651810e-01   1960         eng                      374
## 2852 6.081915e-02 2.176265e-01   1950         eur            eur       200
## 2853 8.116770e-03 4.312910e-01   1970         eur            eur       296
## 2854 1.247354e-02 2.553332e-01   1970         eur            eur       168
## 2855 2.572099e-01 3.828448e-01   1970         eng                      488
## 2856 2.207191e-02 6.928804e-02   1950         eng                      188
## 2857 7.017970e-04 1.763785e-01   1980         eur            eur       376
## 2858 6.728297e-02 3.087791e-01   1950         eng                      200
## 2859 5.428194e-02 2.091971e-01   1950         eng                      354
## 2860 6.569271e-02 2.550879e-01   1980         eur            eur       288
## 2861 2.497669e-02 5.742073e-01   1980         eur            eur       184
## 2862 9.830427e-03 1.555199e-01   1960         eur            eur       232
## 2863 3.111728e-02 5.428911e-02   1970         eng                      198
## 2864 2.875245e-02 6.533939e-01   1970         eur            eur       168
## 2865 5.557240e-02 1.517917e-02   1960         eur            eur       232
## 2866 2.331602e-02 1.062941e-01   1970         eur            eur       264
## 2867 3.782851e-03 1.926973e-01   1970         eur            eur       296
## 2868 3.266545e-03 4.170551e-01   1970         eur            eur       136
## 2869 7.007458e-02 3.292712e-01   1980         eng                      562
## 2870 1.533555e-01 4.639596e-01   1980         non          sasia       234
## 2871 2.977570e-04 4.055068e-01   1950         eur            eur       480
## 2872 4.438630e-04 3.274554e-01   1980         eur            eur       136
## 2873 1.642665e-02 2.599966e-01   1950         eng                      516
## 2874 9.409038e-02 1.332723e-01   1950         eng                      170
## 2875 2.874892e-01 4.035870e-01   1970         non          sasia       140
## 2876 5.097955e-03 1.097539e-01   1970         eur            eur       232
## 2877 4.586609e-01 5.105744e-01   1960         non            eur       122
## 2878 0.000000e+00 0.000000e+00   1970         non        classic       312
## 2879 1.250672e-02 2.481404e-01   1970         eng                      264
## 2880 5.153071e-02 1.201544e-01   1980         eng                      328
## 2881 5.333356e-03 1.283055e-01   1980         eng                      328
## 2882 1.573510e-02 2.387061e-01   1970         eur            eur       136
## 2883 2.980860e-02 4.225114e-01   1980         eng                      294
## 2884 5.745787e-01 2.736045e-01   1960         eur            eur       138
## 2885 2.009965e-01 1.065951e-01   1950         eng                      248
## 2886 3.477347e-02 3.034516e-01   1970         eur            eur       296
## 2887 1.070822e-02 7.149418e-02   1960         eng                      232
## 2888 1.575219e-01 5.576920e-01   1960         eur            eur       472
## 2889 3.110411e-02 8.709487e-02   1960         eng                      226
## 2890 7.811483e-03 4.141400e-01   1970         eur            eur       246
## 2891 9.860801e-01 1.421644e-01   1950         eng                      304
## 2892 7.966712e-03 2.584441e-01   1960         non        classic       278
## 2893 1.298860e-02 8.769515e-02   1960         eur            eur       216
## 2894 2.528943e-01 1.459810e-01   1950         eur            eur       362
## 2895 1.579816e-01 7.818375e-01   1980         eur            eur       188
## 2896 4.977378e-03 9.735287e-02   1970         eur            eur       248
## 2897 1.075407e-03 8.340792e-01   1980         eur            eur       272
## 2898 7.070791e-03 4.039821e-02   1950         non          easia       332
## 2899 7.451672e-03 3.488222e-02   1970         eur            eur       296
## 2900 1.796395e-02 8.215305e-01   1970         eur            eur       264
## 2901 1.089998e-02 1.453473e-01   1960         eur            eur       232
## 2902 7.932854e-02 1.511112e-01   1960         eng                      360
## 2903 1.264538e-01 9.655019e-02   1970         eng                      522
## 2904 5.004504e-01 5.726341e-01   1950         non          easia       220
## 2905 3.118279e-01 3.139524e-01   1960         non        classic       438
## 2906 1.280195e-01 1.122845e-01   1960         eng                      216
## 2907 0.000000e+00 0.000000e+00   1960         eur            eur       264
## 2908 0.000000e+00 0.000000e+00   1960         eur            eur       262
## 2909 1.939084e-03 1.928576e-01   1960         eur            eur       214
## 2910 3.093057e-02 2.718718e-01   1960         eur            eur       200
## 2911 1.816363e-01 9.545122e-02   1960         eur            eur       238
## 2912 1.391193e-02 2.999516e-01   1960         non          sasia       328
## 2913 5.353678e-01 3.841056e-01   1950         eur            eur       282
## 2914 5.028083e-03 9.034753e-02   1960         eng                      776
## 2915 1.273999e-03 1.819990e-01   1960         eur            eur       172
## 2916 9.283790e-04 1.106325e-01   1980         eng                      360
## 2917 1.528271e-02 1.801831e-01   1950         eng                      264
## 2918 1.488756e-02 1.975662e-01   1960         eng                      296
## 2919 1.300521e-01 1.592582e-01   1960         eur            eur       240
## 2920 6.109152e-02 3.405683e-01   1970         non        classic       224
## 2921 2.311472e-03 1.657487e-01   1970         eur            eur       134
## 2922 3.069435e-02 1.664996e-01   1970         eng                      336
## 2923 4.463740e-03 3.619780e-01   1970         eur            eur       496
## 2924 1.966167e-01 1.610767e-01   1950         eur            eur       508
## 2925 1.425460e-03 1.164447e-01   1960         eur            eur       330
## 2926 2.694957e-03 3.515747e-01   1970         eur            eur       134
## 2927 4.047074e-02 2.197907e-01   1980         eur            eur       230
## 2928 9.803103e-01 1.883734e-01   1970         eur            eur       248
## 2929 1.837636e-03 3.647915e-01   1950         eng                      594
## 2930 5.208937e-02 2.944706e-01   1970         eng                      458
## 2931 2.841895e-01 2.187419e-01   1960         eng                      314
## 2932 2.065020e-03 6.571569e-01   1960         eur            eur       352
## 2933 8.355844e-03 1.215160e-02   1980         eng                      176
## 2934 2.281275e-02 2.695094e-01   1980         eur            eur       386
## 2935 8.998458e-02 4.337145e-02   1950         eng                      226
## 2936 4.778549e-01 6.210130e-02   1950         eng                      300
## 2937 4.595732e-01 5.320425e-01   1980         eng                      502
## 2938 1.823199e-03 3.736224e-01   1960         eur            eur       136
## 2939 2.236660e-02 5.776379e-01   1970         eng                      420
## 2940 2.852644e-02 6.454902e-01   1970         non          easia       256
## 2941 2.665488e-02 1.359084e-01   1980         eng                      192
## 2942 2.581170e-04 5.254382e-01   1980         eur            eur        80
## 2943 8.562727e-03 3.633651e-02   1980         eng                      250
## 2944 1.890982e-01 4.155657e-01   1960         eng                      234
## 2945 6.235489e-03 3.745795e-01   1980         eng                      234
## 2946 1.851247e-02 6.594518e-01   1980         eur            eur       396
## 2947 2.252963e-03 2.491825e-01   1970         eur            eur       174
## 2948 6.506373e-01 2.485776e-01   1970         eng                      448
## 2949 1.030603e-03 3.256137e-01   1970         eur            eur       232
## 2950 1.483162e-02 7.117689e-02   1980         eng                      250
## 2951 2.889096e-03 1.294582e-01   1960         eur            eur       232
## 2952 4.546939e-03 3.271135e-01   1970         eur            eur       136
## 2953 4.727111e-02 4.393089e-01   1980         eng                      392
## 2954 3.510530e-02 5.446256e-01   1970         eur            eur       218
## 2955 2.501537e-02 2.260851e-02   1970         eng                      200
## 2956 1.931891e-02 3.027480e-01   1980         eur            eur       272
## 2957 2.550595e-02 3.715592e-02   1960         eng                      198
## 2958 2.015031e-01 1.787076e-01   1980         eng                      264
## 2959 1.007721e-02 2.427653e-01   1980         eng                     1050
## 2960 6.018601e-02 2.070033e-01   1950         eur            eur       264
## 2961 5.008444e-03 9.929486e-02   1950         eur            eur       328
## 2962 6.095255e-02 1.580547e-01   1960         eur            eur       264
## 2963 2.080238e-02 2.556290e-01   1970         eng                      296
## 2964 1.470561e-02 1.939764e-01   1970         non        mideast       428
## 2965 2.124828e-02 1.587826e-01   1960         eur            eur       200
## 2966 3.652991e-03 1.043584e-01   1970         eur            eur       328
## 2967 5.746000e-04 3.079886e-01   1970         non        classic       336
## 2968 1.669653e-02 1.797637e-01   1960         non          easia       594
## 2969 1.234041e-01 7.692739e-02   1960         eng                      232
## 2970 3.023531e-03 2.718088e-01   1960         eur            eur       144
## 2971 1.573902e-02 1.592710e-01   1950         eur            eur       168
## 2972 1.063163e-01 1.400162e-01   1980         eur            eur       294
## 2973 4.187859e-02 2.219328e-01   1980         eur            eur       376
## 2974 6.466466e-02 3.374797e-01   1970         eng                      266
## 2975 2.703360e-01 1.061138e-01   1970         eur            eur       344
## 2976 9.525829e-02 4.652025e-02   1970         eur            eur       304
## 2977 4.576898e-02 2.340033e-01   1980         eng                      264
## 2978 2.093622e-01 4.239001e-02   1960         eur            eur       328
## 2979 3.708115e-01 2.033315e-01   1980         eng                      368
## 2980 3.004954e-01 6.440629e-01   1970         eng                      272
## 2981 2.945703e-02 3.878673e-01   1970         eng                      476
## 2982 6.214859e-01 6.820391e-01   1970         eur            eur       264
## 2983 3.179896e-03 8.048561e-02   1950         eur            eur       338
## 2984 3.417646e-01 3.976661e-02   1980         non        mideast       264
## 2985 6.202687e-03 5.282421e-02   1950         eur            eur       236
## 2986 5.694272e-03 2.865882e-01   1960         eur            eur       352
## 2987 3.190567e-01 4.765970e-01   1960         eur            eur       162
## 2988 1.531660e-02 1.726893e-01   1960         eur            eur       248
## 2989 2.217783e-02 1.129135e-01   1980         non          easia       348
## 2990 8.480377e-02 6.128800e-02   1950         eng                      492
## 2991 4.972812e-02 4.376901e-01   1970         eur            eur       320
## 2992 4.198054e-02 6.703712e-01   1970         eur            eur       220
## 2993 1.546184e-01 8.040097e-02   1970         eng                      424
## 2994 1.103797e-02 1.903572e-01   1980         eur            eur       420
## 2995 8.563633e-02 2.980573e-01   1960         eng                      216
## 2996 5.624279e-02 4.364503e-01   1970         non          easia       410
## 2997 6.600923e-02 2.490496e-01   1980         eur            eur       404
## 2998 1.969552e-01 1.963614e-01   1970         eur            eur       168
## 2999 3.703898e-02 1.549540e-01   1960         eur            eur       244
## 3000 2.184856e-03 1.140917e-01   1970         eur            eur       216
## 3001 3.553669e-02 2.792948e-01   1970         eng                      312
## 3002 0.000000e+00 0.000000e+00   1970         eur            eur       636
## 3003 2.087437e-02 1.170282e-01   1950         eng                      360
## 3004 2.964130e-02 1.048543e-01   1960         eng                      232
## 3005 1.191864e-01 1.687157e-01   1950         eur            eur       200
## 3006 0.000000e+00 0.000000e+00   1960         eur            eur       308
## 3007 6.381250e-02 6.232366e-01   1980         eng                      232
## 3008 2.743368e-02 8.243238e-02   1980         non        classic       370
## 3009 1.690148e-01 4.348847e-01   1960         eur            eur       184
## 3010 3.906026e-02 2.322465e-01   1970         eur            eur       248
## 3011 4.241129e-02 3.172124e-01   1950         eur            eur       176
## 3012 7.263252e-03 2.123166e-01   1960         eur            eur       144
## 3013 3.047951e-03 1.702016e-01   1960         eur            eur       392
## 3014 2.146998e-02 1.140362e-01   1960         eur            eur       340
## 3015 1.475871e-03 2.299383e-01   1950         eur            eur       478
## 3016 4.389071e-03 7.051296e-02   1960         eng                      296
## 3017 1.263277e-03 4.210661e-01   1950         eur            eur       264
## 3018 4.423502e-01 7.580970e-02   1970         eng                      582
## 3019 9.210349e-01 3.362394e-01   1960         eur            eur       158
## 3020 2.650839e-03 2.778562e-01   1970         eur            eur       190
## 3021 2.821864e-02 7.718823e-01   1970         eur            eur       390
## 3022 1.784466e-03 1.503330e-01   1980         eng                      270
## 3023 3.083968e-02 2.605424e-01   1980         eur            eur       296
## 3024 3.982553e-02 2.362504e-01   1950         eur            eur       304
## 3025 1.149587e-01 2.311376e-01   1950         eng                      264
## 3026 4.517270e-04 1.823788e-01   1950         eur            eur       216
## 3027 1.751249e-02 1.464637e-01   1970         eng                      264
## 3028 1.184353e-02 2.733073e-01   1960         eur            eur       552
## 3029 2.389270e-02 2.404631e-01   1960         eur            eur       184
## 3030 1.238042e-03 2.370055e-01   1960         eng                      246
## 3031 1.535009e-01 2.720901e-01   1960         eur            eur       164
## 3032 8.844365e-02 7.918800e-01   1960         eur            eur       208
## 3033 9.188289e-03 5.460073e-01   1980         eur            eur       200
## 3034 1.602547e-02 1.383790e-01   1950         eng                      488
## 3035 1.762895e-02 1.200895e-01   1970         eur            eur       216
## 3036 4.820111e-01 3.291412e-02   1950         eng                      326
## 3037 1.078239e-01 3.568716e-01   1970         eng                       96
## 3038 1.387414e-02 2.645809e-01   1970         non          easia       224
## 3039 6.010177e-01 3.512492e-01   1970         eng                      292
## 3040 1.172696e-02 2.023005e-01   1960         eng                      260
## 3041 0.000000e+00 0.000000e+00   1980         eur            eur       328
## 3042 9.139383e-01 2.471644e-01   1960         eng                      112
## 3043 7.139173e-03 7.030914e-02   1960         non        mideast       262
## 3044 1.302180e-03 2.258614e-01   1960         non        mideast       298
## 3045 5.115413e-02 1.951973e-01   1970         eur            eur       308
## 3046 2.101715e-01 8.810898e-02   1970         eng                      330
## 3047 8.750431e-03 2.447713e-01   1960         eur            eur       200
## 3048 3.747037e-02 2.606980e-01   1970         eur            eur       328
## 3049 4.319430e-01 2.655035e-01   1960         non          easia       140
## 3050 1.058066e-02 1.096127e-01   1970         eur            eur       298
## 3051 2.094343e-02 1.701303e-01   1950         eng                      268
## 3052 3.108626e-03 1.505764e-01   1980         eng                      326
## 3053 9.390064e-01 7.255053e-01   1950         eng                      200
## 3054 3.243466e-02 3.412525e-01   1960         eur            eur       392
## 3055 6.304280e-04 4.335443e-01   1950         eur            eur       196
## 3056 3.688180e-02 2.483141e-01   1970         eng                      228
## 3057 2.164329e-02 8.913511e-02   1950         eng                      292
## 3058 7.178958e-02 1.231324e-01   1980         eur            eur       152
## 3059 9.829514e-01 2.080985e-01   1950         eur            eur       236
## 3060 1.757986e-02 4.363846e-01   1970         eur            eur      1248
## 3061 2.167660e-02 6.621044e-02   1950         eur            eur       328
## 3062 3.888658e-02 1.370923e-01   1950         eng                      330
## 3063 5.830500e-02 2.057393e-01   1950         eur            eur       260
## 3064 1.405343e-01 3.746159e-01   1970         eur            eur       834
## 3065 2.397407e-02 3.405272e-01   1970         eur            eur       174
## 3066 2.013081e-01 3.222706e-01   1970         eur            eur       426
## 3067 1.767011e-02 2.929415e-01   1970         eng                      184
## 3068 1.618096e-02 3.276154e-01   1970         eur            eur       584
## 3069 2.884503e-02 9.970671e-02   1960         eur            eur       136
## 3070 4.691157e-03 2.440184e-01   1970         eng                      200
## 3071 9.402255e-03 7.735891e-01   1970         non        classic       426
## 3072 1.724574e-01 5.477816e-01   1970         eng                      608
## 3073 5.504246e-03 3.697769e-01   1970         eng                      360
## 3074 1.537597e-02 4.450126e-01   1970         eng                      364
## 3075 1.265840e-01 4.051801e-01   1960         non        classic       176
## 3076 1.696280e-01 1.179205e-01   1960         eur            eur       216
## 3077 5.037876e-02 2.930865e-01   1980         eur            eur       432
## 3078 7.808692e-02 1.967874e-01   1970         eng                      330
## 3079 1.159933e-01 1.602476e-01   1970         eng                      276
## 3080 3.646471e-02 1.597285e-01   1950         eur            eur       208
## 3081 4.366688e-03 1.746002e-01   1980         eng                      392
## 3082 5.532052e-03 5.323924e-01   1980         non          easia       176
## 3083 1.756988e-03 6.212890e-01   1970         eur            eur       232
## 3084 1.461300e-03 8.519259e-02   1960         eur            eur       350
## 3085 1.751339e-02 1.641927e-01   1950         eur            eur       458
## 3086 2.978960e-02 2.631153e-01   1970         eur            eur       200
## 3087 5.693850e-02 7.118499e-02   1960         non                      250
## 3088 1.359592e-03 3.488489e-01   1980         eng                      488
## 3089 3.917800e-03 5.065513e-02   1970         eur            eur       156
## 3090 3.597898e-02 1.936379e-01   1960         eng                      298
## 3091 1.428644e-01 4.976354e-01   1980         eur            eur       120
## 3092 1.872315e-02 4.376561e-01   1960         eur            eur       298
## 3093 1.703397e-02 7.508861e-03   1950         eur            eur       170
## 3094 8.859466e-03 1.938376e-01   1950         eur            eur       488
## 3095 1.905086e-03 2.886088e-02   1960         eng                      186
## 3096 4.146136e-02 6.266506e-01   1960         non          easia       210
## 3097 5.854116e-02 3.452559e-01   1950         eur            eur       264
## 3098 6.025372e-03 2.290678e-01   1960         eur            eur       236
## 3099 6.267867e-01 6.175248e-01   1980         non        classic       112
## 3100 1.705622e-02 4.220792e-01   1970         eur            eur       382
## 3101 9.102944e-01 2.905163e-02   1950         eng                      326
## 3102 6.890890e-01 9.756187e-02   1970         eng                      170
## 3103 1.182762e-03 1.623649e-01   1970         eur            eur       170
## 3104 7.027870e-03 1.872422e-01   1970         non          easia       408
## 3105 7.208397e-03 2.485447e-01   1980         eng                      214
## 3106 6.166900e-02 1.187134e-01   1960         non        classic       396
## 3107 3.989592e-02 7.132744e-01   1970         eng                      216
## 3108 6.182363e-01 2.739277e-01   1960         eur            eur       152
## 3109 5.443651e-02 1.045926e-01   1970         eur            eur       136
## 3110 4.063980e-04 1.395159e-01   1950         eur            eur       618
## 3111 4.429950e-04 4.890144e-02   1970         non          sasia       128
## 3112 1.754560e-04 2.462590e-01   1970         non          sasia       134
## 3113 3.998567e-02 4.089340e-01   1980         eur            eur       224
## 3114 2.287683e-02 4.391460e-01   1980         eur            eur       224
## 3115 3.612007e-03 2.635893e-01   1950         eng                      268
## 3116 5.981098e-03 4.593906e-01   1980         eng                      262
## 3117 5.056389e-02 2.143606e-02   1960         eng                      324
## 3118 5.661115e-03 2.805288e-01   1960         eng                      296
## 3119 1.548948e-02 7.968004e-02   1950         eng                      232
## 3120 5.291554e-03 4.237565e-01   1980         eur            eur       186
## 3121 5.578988e-02 1.463515e-01   1980         non          easia       264
## 3122 8.361630e-04 1.632828e-01   1960         eur            eur       346
## 3123 1.277065e-01 1.128426e-01   1970         eur            eur       248
## 3124 0.000000e+00 0.000000e+00   1970         non          easia       134
## 3125 5.573207e-03 2.617246e-01   1960         non          easia       482
## 3126 9.437680e-04 1.915683e-01   1960         eng                      264
## 3127 1.070724e-01 1.515902e-01   1980         eng                      228
## 3128 5.155082e-02 3.228358e-01   1980         eur            eur       234
## 3129 6.837894e-02 1.413833e-01   1980         eng                      294
## 3130 8.180850e-04 8.003227e-02   1970         eur            eur       588
## 3131 1.057399e-02 2.033205e-01   1950         eur            eur       520
## 3132 1.400198e-02 8.518330e-02   1960         eur            eur       200
## 3133 3.438542e-02 2.576421e-01   1970         eur            eur       428
## 3134 4.471129e-01 2.180586e-01   1970         eng                      128
## 3135 9.306976e-01 1.875152e-01   1970         non                      186
## 3136 1.905644e-02 1.551112e-01   1980         eur            eur       100
## 3137 4.022005e-03 1.099989e-01   1950         eng                      262
## 3138 3.782397e-01 5.582901e-02   1950         eng                      394
## 3139 3.518115e-01 2.088224e-01   1960         eng                      136
## 3140 4.902028e-03 2.077412e-01   1960         eur            eur       198
## 3141 2.179901e-02 8.483654e-02   1980         eng                      392
## 3142 4.896181e-01 3.181656e-02   1960         eur            eur       200
## 3143 2.372369e-02 3.691464e-01   1970         eur            eur       410
## 3144 1.439925e-01 1.948038e-01   1970         eur            eur       476
## 3145 4.289299e-02 3.644465e-01   1970         eng                      440
## 3146 8.116023e-03 2.549093e-01   1980         non          easia       686
## 3147 8.158798e-03 4.910572e-02   1950         eng                      260
## 3148 3.278244e-02 1.491561e-01   1970         eng                      200
## 3149 6.747765e-03 1.939821e-01   1970         eng                      464
## 3150 9.375180e-03 1.165369e-01   1960         eur            eur       292
## 3151 6.790328e-03 3.368476e-01   1960         eur            eur       238
## 3152 1.504495e-02 8.919590e-02   1970         eur            eur       138
## 3153 1.451536e-02 1.349784e-01   1960         eur            eur       248
## 3154 2.572336e-02 8.315852e-02   1960         eur            eur       184
## 3155 4.935705e-03 6.050207e-01   1960         eur            eur       232
## 3156 4.646505e-02 5.276681e-01   1970         eur            eur       232
## 3157 2.655898e-01 9.842339e-02   1980         eur            eur       328
## 3158 1.516806e-01 1.978330e-01   1950         eur            eur       396
## 3159 4.682310e-02 4.082641e-01   1950         non          easia       464
## 3160 1.714782e-02 4.600091e-01   1980         non          easia       392
## 3161 2.309840e-03 1.275364e-01   1960         eur            eur       328
## 3162 1.295696e-02 1.040423e-02   1960         eur            eur       118
## 3163 3.780295e-02 8.282888e-02   1970         eng                      152
## 3164 2.307119e-03 1.035332e-01   1960         eur            eur       212
## 3165 7.989193e-03 9.783933e-02   1960         eng                      236
## 3166 1.272311e-01 3.009594e-01   1970         non          easia       188
## 3167 1.122917e-02 2.083294e-01   1960         eng                      330
## 3168 2.104612e-02 3.638144e-01   1970         eur            eur       360
## 3169 6.705561e-03 1.770641e-01   1970         eng                      456
## 3170 3.700961e-03 1.771840e-01   1950         eng                      450
## 3171 6.340294e-02 1.450933e-01   1950         eng                      216
## 3172 1.510461e-02 2.221007e-01   1970         eng                      368
## 3173 7.468749e-03 9.273425e-02   1950         eng                      262
## 3174 8.878050e-04 2.609282e-01   1960         eur            eur       200
## 3175 1.657392e-02 1.831799e-01   1980         eng                      284
## 3176 6.692734e-02 2.529626e-01   1980         eng                     1380
## 3177 1.440317e-02 8.068292e-01   1970         eng                      168
## 3178 3.922839e-02 1.255708e-01   1970         non                      444
## 3179 4.805792e-02 6.472641e-02   1960         eng                      364
## 3180 1.111106e-03 5.662366e-02   1960         eng                      478
## 3181 9.585907e-03 2.884521e-01   1980         eur            eur       344
## 3182 2.030674e-02 1.307848e-01   1980         eng                      264
## 3183 1.963021e-02 4.796616e-01   1970         non        classic       188
## 3184 4.561285e-02 8.925196e-02   1980         eng                      326
## 3185 3.143716e-03 2.426119e-01   1980         eur            eur       160
## 3186 4.326096e-02 1.863010e-01   1970         eur            eur       456
## 3187 3.452052e-02 4.481911e-01   1970         eur            eur       188
## 3188 3.178755e-03 3.893022e-01   1960         non            eur       408
## 3189 2.107491e-02 2.109826e-01   1970         eng                      440
## 3190 9.104144e-02 3.234929e-01   1980         eng                      390
## 3191 1.932590e-02 4.185912e-02   1960         eng                      360
## 3192 6.878382e-02 4.711214e-02   1950         eng                      312
## 3193 2.755100e-02 9.904613e-02   1970         eng                      360
## 3194 3.145766e-02 7.688241e-01   1960         eur            eur       390
## 3195 9.978450e-03 2.355829e-01   1950         eur            eur       556
## 3196 5.784446e-03 7.153464e-02   1970         eng                      296
## 3197 2.696441e-02 3.649700e-01   1950         eng                      298
## 3198 2.300129e-02 3.817088e-01   1960         eng                      264
## 3199 1.830859e-02 1.635131e-01   1950         eng                      278
## 3200 3.756640e-04 1.577658e-01   1960         eur            eur       200
## 3201 5.456078e-02 6.816556e-01   1950         eng                      296
## 3202 2.043118e-03 8.444259e-02   1960         non          sasia       212
## 3203 1.014383e-03 4.846304e-01   1970         eur            eur       246
## 3204 1.300625e-01 9.737713e-02   1970         eng                      136
## 3205 5.730037e-03 5.166317e-01   1980         eng                      298
## 3206 4.597917e-02 1.636310e-01   1950         eur            eur       634
## 3207 6.538441e-02 1.514543e-01   1950         non          easia       268
## 3208 2.379455e-03 1.975870e-01   1970         eur            eur       114
## 3209 3.803339e-02 2.886035e-01   1950         non        classic       270
## 3210 4.078816e-02 5.276905e-01   1980         eur            eur       264
## 3211 7.170462e-02 3.940798e-01   1970         eur            eur       260
## 3212 5.671144e-03 1.440949e-01   1970         eur            eur       220
## 3213 5.765728e-01 2.366175e-01   1960         eng                      264
## 3214 1.462572e-02 1.202377e-01   1950         eng                      412
## 3215 1.017271e-02 4.782682e-02   1980         eur            eur       296
## 3216 0.000000e+00 0.000000e+00   1960         eur            eur       426
## 3217 1.727934e-01 2.217326e-01   1960         eng                      168
## 3218 1.551630e-01 8.372435e-01   1980         eur            eur       152
## 3219 1.563116e-02 8.789445e-02   1980         eng                      360
## 3220 1.994378e-03 1.033137e-01   1960         eur            eur       194
## 3221 6.736136e-01 1.691924e-01   1980         eng                      244
## 3222 2.108844e-01 7.947899e-01   1960         eng                      292
## 3223 7.554539e-01 5.880737e-01   1950         non          easia       136
## 3224 2.341929e-02 2.029278e-01   1970         eur            eur       136
## 3225 1.970178e-02 1.451630e-01   1970         eng                      184
## 3226 1.482686e-02 6.335787e-01   1970         eur            eur       156
## 3227 5.380509e-02 3.067470e-01   1980         eng                      232
## 3228 2.765482e-02 7.122257e-02   1960         eur            eur       344
## 3229 5.357750e-02 1.790737e-01   1970         non          easia       240
## 3230 1.381260e-02 3.582532e-01   1980         non          easia       128
## 3231 1.101379e-01 4.855511e-01   1970         eur            eur       296
## 3232 4.166600e-02 1.398702e-01   1990         non        mideast       168
## 3233 1.062759e-01 4.902237e-01   1990         eur            eur       248
## 3234 8.382520e-03 2.414544e-01   1990         eng                      300
## 3235 2.334908e-02 4.543793e-01   1990         eur            eur       160
## 3236 1.547800e-02 5.204425e-01   1990         eng                      216
## 3237 8.310147e-02 1.067133e-01   1990         eng                      312
## 3238 0.000000e+00 0.000000e+00   1990         eng                      280
## 3239 8.786000e-02 9.615466e-02   1980         eng                      280
## 3240 7.377167e-03 1.207482e-01   1980         eng                      456
## 3241 6.240568e-03 2.083732e-01   1960         eur            eur       248
## 3242 3.418399e-02 2.596954e-01   1980         eng                      264
## 3243 6.037588e-02 2.624530e-01   1970         non        classic       264
## 3244 3.096863e-01 2.849384e-01   1960         eng                      200
## 3245 1.089012e-02 2.652141e-01   1950         eur            eur       526
## 3246 5.298162e-01 1.161313e-01   1950         eng                      136
## 3247 2.143813e-02 7.574644e-02   1970         eng                      296
## 3248 9.246550e-04 1.724349e-01   1960         eur            eur       440
## 3249 1.071215e-02 1.825263e-01   1950         eur            eur       304
## 3250 4.396225e-03 1.493443e-01   1970         eur            eur       152
## 3251 5.759205e-03 1.536227e-01   1960         eur            eur       200
## 3252 7.376360e-02 8.662367e-02   1970         eur            eur       272
## 3253 3.251840e-01 3.517862e-01   1970         eng                      320
## 3254 2.104660e-02 4.072368e-01   1960         eur            eur       318
## 3255 5.669141e-03 4.730506e-01   1980         non          easia       192
## 3256 1.288751e-03 2.035803e-01   1970         eur            eur       184
## 3257 1.223471e-03 4.002358e-01   1970         eur            eur       152
## 3258 9.357859e-02 9.323110e-02   1950         eur            eur       264
## 3259 1.969898e-01 1.135807e-01   1980         eng                      234
## 3260 1.897182e-01 1.099849e-01   1960         eng                      164
## 3261 2.517181e-02 1.407746e-01   1980         eng                      424
## 3262 9.692541e-02 4.840735e-01   1950         eng                      250
## 3263 1.505816e-02 3.363627e-01   1950         eng                      236
## 3264 3.628877e-01 4.247887e-01   1960         non          sasia       190
## 3265 3.642650e-02 6.148418e-01   1970         eur            eur       504
## 3266 1.779414e-02 2.506137e-01   1980         eur            eur       296
## 3267 2.401415e-02 1.693890e-01   1970         eng                      264
## 3268 4.097180e-04 7.790820e-01   1980         eur            eur       136
## 3269 9.536293e-01 3.619239e-01   1960         eng                      244
## 3270 1.686540e-04 1.410457e-01   1980         eur            eur       178
## 3271 2.168271e-01 1.840318e-01   1960         eur            eur       328
## 3272 2.063754e-02 5.644089e-01   1960         eur            eur       168
## 3273 3.177020e-04 6.209864e-01   1970         eur            eur       392
## 3274 2.035068e-02 3.281140e-01   1970         eur            eur       320
## 3275 1.727559e-02 1.701982e-01   1970         eng                      164
## 3276 7.229878e-03 1.993517e-01   1950         eur            eur       234
## 3277 5.357161e-01 6.593467e-01   1980         eur            eur       294
## 3278 1.032387e-01 6.213288e-02   1980         eng                      184
## 3279 5.935452e-01 4.800619e-01   1960         non        classic       124
## 3280 1.160705e-01 2.737927e-01   1960         eur            eur       454
## 3281 5.601508e-02 4.187777e-01   1960         eur            eur       582
## 3282 2.024973e-02 1.648674e-01   1970         non          sasia       134
## 3283 1.019850e-04 2.407817e-01   1970         non          sasia       228
## 3284 9.081666e-03 3.085913e-01   1980         eng                      376
## 3285 2.706243e-01 2.728589e-01   1960         eur            eur       120
## 3286 5.340396e-03 9.756710e-02   1960         eur            eur       400
## 3287 7.170000e-05 1.110265e-01   1980         eur            eur       166
## 3288 3.138245e-02 1.461377e-01   1960         eng                      552
## 3289 9.464627e-02 1.461002e-01   1960         eng                      200
## 3290 4.632999e-02 5.836087e-01   1980         eur            eur       338
## 3291 5.233112e-03 9.624335e-02   1960         eng                      168
## 3292 7.270189e-03 2.476841e-01   1970         non          easia       186
## 3293 6.995588e-02 4.659325e-01   1980         eur            eur       208
## 3294 1.783519e-01 1.411545e-01   1970         eng                      296
## 3295 3.743738e-01 1.960516e-01   1960         eng                      424
## 3296 7.853072e-02 3.826553e-01   1950         eng                      238
## 3297 1.864262e-01 4.670090e-02   1960         eng                      268
## 3298 1.226336e-02 4.415547e-01   1970         eur            eur       270
## 3299 6.096849e-02 4.216985e-02   1960         eur            eur       232
## 3300 7.406705e-02 1.190882e-01   1960         eur            eur       330
## 3301 9.398212e-02 5.521112e-01   1970         non          easia       224
## 3302 1.256713e-02 5.968690e-01   1970         eur            eur       168
## 3303 7.728775e-03 5.696726e-02   1960         eur            eur       362
## 3304 1.846733e-01 1.894280e-01   1970         eng                      232
## 3305 3.189169e-03 1.609962e-01   1960         eur            eur       310
## 3306 1.037271e-02 2.778610e-01   1960         eur            eur       214
## 3307 1.876964e-01 4.246866e-01   1960         eur            eur       252
## 3308 5.499771e-03 1.987475e-01   1980         eng                      186
## 3309 6.671917e-03 1.831300e-01   1970         eur            eur       344
## 3310 4.356612e-03 1.247623e-01   1970         eur            eur       152
## 3311 1.206864e-02 9.564033e-02   1970         eng                      556
## 3312 2.171027e-02 5.279267e-01   1970         eng                      866
## 3313 4.754923e-02 3.373523e-01   1960         eur            eur       328
## 3314 6.564248e-02 7.171416e-01   1960         eng                      232
## 3315 1.328668e-02 6.214719e-02   1960         eur            eur       232
## 3316 1.769900e-01 1.938761e-01   1980         eur            eur       232
## 3317 1.761331e-02 1.176799e-01   1980         eur            eur       416
## 3318 2.291220e-02 1.649040e-01   1960         eng                      526
## 3319 4.322315e-02 5.326528e-02   1960         eng                      104
## 3320 8.279835e-03 1.762239e-01   1980         eng                      392
## 3321 1.065866e-03 3.345222e-01   1960         eur            eur       184
## 3322 1.155614e-02 2.387254e-01   1950         eng                      390
## 3323 1.740456e-02 4.901123e-02   1970         eng                      326
## 3324 5.294576e-01 1.269388e-01   1970         eng                      200
## 3325 1.457688e-01 3.032970e-01   1980         eur            eur       262
## 3326 1.659953e-01 1.921184e-01   1950         eng                      682
## 3327 3.495125e-02 1.043634e-01   1970         eur            eur       160
## 3328 5.220865e-02 2.292184e-01   1970         non        mideast       156
## 3329 6.221223e-03 4.717457e-02   1970         non        mideast       166
## 3330 2.833762e-01 1.110066e-01   1980         eng                      200
## 3331 1.286939e-02 4.866116e-01   1970         eng                      296
## 3332 8.592122e-03 1.168154e-01   1980         eng                      260
## 3333 2.425991e-02 7.880996e-01   1980         eng                      282
##      mean_sent_length mean_word_length type_token_ratio inferreddate grouping
## 1           10.184413         4.058808        0.4729950         1998     1990
## 2           23.406114         4.361483        0.4785426         1998     1990
## 3           18.174751         4.184482        0.4303490         1974     1970
## 4           16.883886         4.183326        0.4598292         1959     1950
## 5           16.837074         4.277024        0.4559455         1961     1960
## 6           11.680877         4.479392        0.4689663         1975     1970
## 7           15.994869         4.536886        0.4827041         1976     1970
## 8           18.157853         4.269546        0.4932397         1976     1970
## 9           26.001363         4.346730        0.4771829         1976     1970
## 10          23.001364         4.396958        0.4809407         1976     1970
## 11          20.256463         4.370185        0.4899686         1970     1970
## 12          12.219695         4.377602        0.5008476         1979     1970
## 13          20.282182         4.400817        0.4973063         1954     1950
## 14          18.017994         4.183558        0.4675055         1955     1950
## 15          16.899414         4.092852        0.4248281         1959     1950
## 16          17.169108         4.122013        0.4182726         1957     1950
## 17          22.479974         4.162543        0.4194544         1970     1970
## 18          12.626448         4.252673        0.5215264         1989     1980
## 19           9.347757         4.035806        0.4391435         1963     1960
## 20           8.976300         3.920523        0.4780605         1961     1960
## 21          15.003402         4.195051        0.4557104         1970     1970
## 22          14.178585         4.353068        0.4619528         1990     1990
## 23          23.769030         4.292260        0.4791351         1992     1990
## 24           7.942474         4.193876        0.4596671         1970     1970
## 25          20.843178         4.547921        0.4842596         1970     1970
## 26          13.201115         4.209983        0.4315391         1991     1990
## 27          15.619761         3.980797        0.4527338         1993     1990
## 28          17.333764         4.159056        0.4103483         1996     1990
## 29          11.146191         4.281175        0.4885299         1995     1990
## 30          28.793272         4.146406        0.4395758         1992     1990
## 31          13.081759         4.387266        0.4876023         1998     1990
## 32          19.158065         4.115887        0.4661672         1979     1970
## 33          14.659593         4.205144        0.4565754         1990     1990
## 34           9.599210         4.322354        0.4770406         2000     2000
## 35          13.482616         4.255139        0.4725321         2005     2000
## 36          31.276060         4.383131        0.4451520         2007     2000
## 37          16.063793         4.104002        0.4281067         2007     2000
## 38          25.859738         4.482819        0.4904979         1983     1980
## 39          26.299322         4.222918        0.4253711         1966     1960
## 40          28.821359         4.591049        0.4731123         1968     1960
## 41          19.536316         4.191789        0.4743236         1952     1950
## 42          14.262833         4.098959        0.4503650         1986     1980
## 43          13.006334         4.168600        0.4333000         1991     1990
## 44          14.909048         4.295528        0.4805853         1965     1960
## 45          12.754635         4.151538        0.4588119         1983     1980
## 46          23.429719         4.409173        0.4866225         1976     1970
## 47          18.738919         4.153491        0.4496547         1974     1970
## 48          13.137056         4.068102        0.4499773         1983     1980
## 49          11.911795         4.384904        0.4522562         1968     1960
## 50          23.796271         4.447074        0.4844818         1967     1960
## 51          19.354721         4.143648        0.4464781         1965     1960
## 52          16.954811         4.077827        0.4447700         1971     1970
## 53          12.485849         4.087361        0.4288034         1970     1970
## 54          19.511751         4.419564        0.4604628         1958     1950
## 55          14.333962         4.255267        0.4453911         1988     1980
## 56          12.584087         4.097292        0.4355885         1994     1990
## 57          17.321952         4.394371        0.4630413         2008     2000
## 58          11.467839         4.210267        0.4560238         1971     1970
## 59          19.947779         4.465380        0.4526176         1991     1990
## 60          14.671079         4.447000        0.4913000         1989     1980
## 61          16.259130         4.350556        0.5119482         1989     1980
## 62          12.621477         4.389267        0.4664985         1950     1950
## 63          13.830289         4.278730        0.4484586         1950     1950
## 64          13.880523         4.163366        0.4573777         1990     1990
## 65          10.487080         4.122800        0.4499000         1990     1990
## 66          19.825704         4.298038        0.4621454         1989     1980
## 67          16.732659         4.229819        0.4255797         1990     1990
## 68           7.508024         3.883500        0.3481000         1990     1990
## 69          12.510828         4.217700        0.4831000         1990     1990
## 70           7.903526         4.195332        0.4458005         1989     1980
## 71          13.724325         4.331312        0.4896251         1990     1990
## 72          14.785237         4.318800        0.4391000         1989     1980
## 73          19.047838         4.279300        0.4486000         1988     1980
## 74          12.956157         3.981223        0.4230956         1987     1980
## 75          23.046165         4.467171        0.4881575         1989     1980
## 76          11.209371         4.222070        0.4555808         1988     1980
## 77          12.892414         4.228328        0.4373444         1988     1980
## 78          15.956049         4.426980        0.4478118         1990     1990
## 79           9.607203         4.186839        0.4353406         1990     1990
## 80          16.342840         4.493100        0.4827000         1989     1980
## 81          14.738593         4.283983        0.4651524         1990     1990
## 82          15.930788         4.305468        0.4673683         1977     1970
## 83           9.235467         4.117894        0.4756233         1989     1980
## 84          11.510440         4.133769        0.4890450         1989     1980
## 85          12.973111         4.224692        0.4722109         1970     1970
## 86          22.229682         4.336149        0.4598751         1990     1990
## 87          14.885759         4.279506        0.4760032         1972     1970
## 88          18.814920         4.259170        0.4815038         1989     1980
## 89          11.890071         4.238478        0.4866350         1988     1980
## 90           9.338613         4.181700        0.4365000         1990     1990
## 91          25.526295         4.257041        0.4509758         1989     1980
## 92          18.302551         4.282537        0.4538489         1972     1970
## 93          15.642886         4.314630        0.4829055         1960     1960
## 94          10.469664         4.412063        0.5252972         1974     1970
## 95          11.580127         4.327692        0.4643621         1973     1970
## 96          12.654574         4.367901        0.4710900         1964     1960
## 97          14.421090         4.413011        0.5185854         1989     1980
## 98          13.119679         4.223430        0.4260298         1985     1980
## 99          18.661759         4.506707        0.4746286         1989     1980
## 100         14.315560         4.281114        0.4932539         1989     1980
## 101         13.833464         4.034366        0.4305095         1990     1990
## 102         16.531693         4.392556        0.4614446         1988     1980
## 103         11.002811         4.122622        0.4551018         1989     1980
## 104         12.830579         4.316359        0.4553238         1989     1980
## 105         14.759807         4.141500        0.4606000         1986     1980
## 106         19.244248         4.176891        0.4362754         1989     1980
## 107         23.303148         4.576298        0.4914230         1990     1990
## 108         14.016712         4.272000        0.4514000         1989     1980
## 109         17.857875         4.354834        0.4720317         1989     1980
## 110         13.623490         4.120200        0.4517000         1989     1980
## 111         14.186527         4.287501        0.4666828         1988     1980
## 112         20.029017         4.027100        0.4199000         1961     1960
## 113         22.505389         4.207785        0.4676630         1963     1960
## 114         18.537628         4.240032        0.4306473         1957     1950
## 115         20.010765         4.284602        0.4943978         1960     1960
## 116          9.282910         4.311247        0.4765178         1950     1950
## 117         29.698606         4.572747        0.4959684         1965     1960
## 118         16.193877         4.335464        0.4892864         1961     1960
## 119         17.798754         3.994100        0.3917000         1958     1950
## 120         17.600928         4.227933        0.4761615         1958     1950
## 121         10.409942         4.218156        0.4429565         1975     1970
## 122         23.963887         4.390732        0.4408031         1950     1950
## 123         29.132555         4.125982        0.4008745         1953     1950
## 124          9.017360         3.828477        0.4306401         1982     1980
## 125         15.871483         4.353720        0.4714304         1986     1980
## 126         13.476026         4.270955        0.4222292         1985     1980
## 127         13.300102         4.125643        0.4555783         1979     1970
## 128         11.079123         3.955597        0.4360883         1970     1970
## 129         21.052905         4.398798        0.4817777         1962     1960
## 130         11.269045         4.025767        0.4565881         1961     1960
## 131         12.432864         4.209724        0.4533723         1964     1960
## 132         13.108440         4.074700        0.4350644         1961     1960
## 133         13.824530         4.181976        0.4697167         1972     1970
## 134         20.958194         4.276634        0.4666530         1970     1970
## 135         15.787409         4.214191        0.4779286         1970     1970
## 136         16.337994         4.141300        0.4252000         1974     1970
## 137         20.382969         4.211684        0.4580563         1968     1960
## 138         15.530259         4.147224        0.4755561         1965     1960
## 139         22.759020         4.181310        0.4576007         1961     1960
## 140         11.753153         4.175902        0.4506363         1964     1960
## 141         13.897446         4.304468        0.4560152         1966     1960
## 142         22.335168         4.317899        0.4757171         1971     1970
## 143         13.069150         4.191015        0.4476447         1966     1960
## 144         15.020783         4.097066        0.4599511         1971     1970
## 145         25.769943         3.981853        0.4337678         1954     1950
## 146         18.045618         4.247740        0.4493712         1956     1950
## 147         58.421180         4.339987        0.4787723         1969     1960
## 148         17.708411         4.271157        0.4258445         1954     1950
## 149         12.835190         4.081321        0.4485319         1971     1970
## 150         14.924846         4.270641        0.4503810         1984     1980
## 151          9.072391         3.803200        0.4309000         1983     1980
## 152         17.640336         4.221467        0.4269514         1967     1960
## 153          9.256876         4.122617        0.4156162         1992     1990
## 154         22.551274         4.022440        0.3876858         1951     1950
## 155         10.794398         4.276900        0.4770000         1987     1980
## 156         13.153102         4.076600        0.4508000         1989     1980
## 157         10.975572         4.082900        0.4418000         1988     1980
## 158         14.288301         4.028800        0.4381000         1991     1990
## 159         15.962272         4.035758        0.3658046         1991     1990
## 160         14.679999         4.468954        0.4886507         1988     1980
## 161         11.868511         3.993001        0.4396179         1987     1980
## 162         19.091594         4.168900        0.4451000         1990     1990
## 163         15.762309         4.445124        0.4804592         1991     1990
## 164         13.257641         4.248800        0.4635000         1989     1980
## 165         13.915657         4.339514        0.4794014         1990     1990
## 166         12.864686         4.173304        0.4214738         1990     1990
## 167         13.899110         4.316826        0.4905267         1990     1990
## 168         12.954180         4.186397        0.4499139         1990     1990
## 169         14.086104         4.128600        0.4534000         1990     1990
## 170          8.838551         3.855079        0.3935998         1983     1980
## 171         17.190151         4.227070        0.3980412         1971     1970
## 172         20.696646         4.349252        0.4877069         1977     1970
## 173         21.537673         4.246400        0.4575916         1967     1960
## 174         17.252495         4.103710        0.4432559         1969     1960
## 175         21.157414         4.097900        0.4558000         1960     1960
## 176         14.401567         4.231000        0.4446094         1971     1970
## 177         11.293947         4.056400        0.4483000         1971     1970
## 178         15.417003         4.097251        0.4570887         1982     1980
## 179         13.830018         3.880894        0.4081994         1954     1950
## 180         24.596259         4.281479        0.4286789         1960     1960
## 181          7.944968         4.037546        0.4479912         1961     1960
## 182         19.007010         4.047999        0.4266554         1957     1950
## 183         16.196879         4.436875        0.4725117         1961     1960
## 184         21.011333         4.576200        0.4746000         1970     1970
## 185         16.816851         4.077764        0.4303042         1968     1960
## 186          8.828442         3.958215        0.4136465         1971     1970
## 187         20.305372         4.325004        0.4880856         1971     1970
## 188          8.584823         4.040034        0.4274464         1962     1960
## 189         11.590131         4.094145        0.4658778         1962     1960
## 190         17.013162         4.057912        0.4325851         1987     1980
## 191         11.261275         4.116617        0.4965685         1989     1980
## 192         14.049924         4.236700        0.4319000         1989     1980
## 193         16.644135         4.330173        0.4627334         1956     1950
## 194         16.870696         4.355670        0.4628722         1956     1950
## 195         20.655202         4.338100        0.4803000         1990     1990
## 196         11.968768         4.211734        0.4552111         1991     1990
## 197         17.246044         4.325404        0.4357171         1989     1980
## 198          9.921515         4.028728        0.4628487         1990     1990
## 199         13.525027         4.009323        0.4067021         1990     1990
## 200         15.666878         4.311934        0.4658614         1991     1990
## 201         12.917661         4.258000        0.4904000         1990     1990
## 202         12.544760         4.176912        0.4459863         1990     1990
## 203         16.115584         4.317900        0.4553000         1990     1990
## 204         21.067264         4.046500        0.4280392         1977     1970
## 205         10.457263         3.794300        0.4396000         1991     1990
## 206         15.925425         4.368500        0.4953000         1992     1990
## 207         11.374761         4.056674        0.4553781         1989     1980
## 208         11.919524         4.213800        0.4679000         1991     1990
## 209         34.349636         4.556166        0.4769235         1972     1970
## 210         15.293758         4.371000        0.4538000         1987     1980
## 211         12.691117         3.879951        0.4043776         1979     1970
## 212         10.222133         4.129900        0.4304000         1992     1990
## 213         22.165124         4.384614        0.4734757         1992     1990
## 214         22.671248         4.507126        0.5013954         1991     1990
## 215         13.854754         4.171003        0.4646537         1992     1990
## 216         36.613838         4.376932        0.4661263         1990     1990
## 217         14.740450         4.329600        0.4841000         1992     1990
## 218         13.709253         4.087800        0.4383000         1992     1990
## 219         15.031929         4.315900        0.4628000         1991     1990
## 220          9.403617         3.988200        0.4518000         1986     1980
## 221         11.089651         4.112532        0.4573932         1992     1990
## 222         13.194390         4.317300        0.4922000         1992     1990
## 223         10.912651         4.131500        0.4683000         1995     1990
## 224         16.131126         3.867993        0.3739416         1969     1960
## 225         15.320927         4.332600        0.4860000         1992     1990
## 226          9.980213         4.120900        0.4564268         1992     1990
## 227         18.929476         4.204253        0.4414775         1992     1990
## 228         15.214486         4.208015        0.4695299         1991     1990
## 229         28.200172         4.273800        0.4284000         1990     1990
## 230          9.642081         4.048204        0.4680472         1990     1990
## 231         11.122128         3.980958        0.4012903         1991     1990
## 232         12.913303         4.151600        0.4715000         1991     1990
## 233         14.712791         4.343652        0.4598894         1991     1990
## 234         11.935924         4.183825        0.4906431         1990     1990
## 235         13.413326         4.308700        0.4509000         1992     1990
## 236         11.661585         4.247022        0.4762497         1991     1990
## 237         10.547943         4.521500        0.4724000         1991     1990
## 238         14.630541         4.247124        0.4786494         1991     1990
## 239         11.265363         4.459091        0.4915662         1991     1990
## 240         10.722193         4.149102        0.4687377         1987     1980
## 241         12.140608         3.947700        0.4147000         1990     1990
## 242         14.461625         4.107590        0.4580316         1992     1990
## 243         27.365164         4.468000        0.5066000         1979     1970
## 244         14.168804         4.147700        0.4264000         1970     1970
## 245         30.024272         3.967356        0.4299441         1952     1950
## 246          9.961258         4.257100        0.5080000         1993     1990
## 247         11.859104         4.193900        0.4387000         1986     1980
## 248         13.401894         4.268400        0.4710000         1991     1990
## 249         16.229473         4.167800        0.4108000         1986     1980
## 250         12.872158         4.320241        0.5006875         1991     1990
## 251         13.523677         4.262300        0.4392000         1991     1990
## 252         11.673924         3.847900        0.3813000         1991     1990
## 253         15.936185         4.166467        0.4664666         1965     1960
## 254          8.798803         3.983100        0.4266000         1991     1990
## 255         18.573918         4.001881        0.4448333         1991     1990
## 256         11.855999         4.252307        0.4746337         1992     1990
## 257         16.212326         3.911500        0.4286000         1990     1990
## 258          7.924898         4.270772        0.5216529         1991     1990
## 259         13.357440         4.293800        0.4700000         1989     1980
## 260         17.924884         4.391843        0.4454459         1966     1960
## 261         26.315619         4.506100        0.4752000         1971     1970
## 262         11.353085         4.147228        0.4488970         1961     1960
## 263         10.586102         4.250687        0.4691391         1965     1960
## 264         23.322967         3.773248        0.3580567         1967     1960
## 265         16.111341         4.184143        0.4710731         1994     1990
## 266         20.949522         4.220168        0.4534066         1994     1990
## 267         18.960601         4.202700        0.4747000         1993     1990
## 268         11.031997         4.048800        0.4411000         1993     1990
## 269          9.974879         4.223591        0.4498771         1951     1950
## 270         11.818587         4.151400        0.4581000         1993     1990
## 271          8.127812         4.425715        0.4929954         1993     1990
## 272         16.312694         3.883000        0.4109000         1993     1990
## 273         13.635577         4.149200        0.4299000         1993     1990
## 274         11.381769         4.338000        0.5440000         1993     1990
## 275         14.571087         4.120222        0.4646016         1992     1990
## 276         11.108409         4.173640        0.4522282         1992     1990
## 277         25.342124         4.500355        0.4738374         1992     1990
## 278         17.177008         3.958937        0.3543968         1992     1990
## 279         15.003010         4.218215        0.4803414         1990     1990
## 280         13.077925         4.225823        0.4474217         1991     1990
## 281         11.825073         4.061000        0.4222000         1992     1990
## 282         17.713826         4.113000        0.4517000         1992     1990
## 283         22.676710         4.253900        0.4611000         1992     1990
## 284         10.897174         4.425122        0.4344455         1993     1990
## 285         14.855558         3.881283        0.3580377         1988     1980
## 286         17.887990         4.492551        0.4723137         1988     1980
## 287         21.200769         4.498886        0.4433327         1993     1990
## 288         11.436489         4.030100        0.4546000         1989     1980
## 289         14.723579         4.431921        0.5123809         1993     1990
## 290         13.763000         3.868800        0.4078000         1990     1990
## 291         17.974349         4.194800        0.4425000         1992     1990
## 292         11.201124         4.128900        0.4725000         1993     1990
## 293         13.790960         4.260100        0.4881000         1992     1990
## 294         14.675807         3.908594        0.3736055         1986     1980
## 295         17.396492         4.106200        0.4457000         1994     1990
## 296         17.199838         4.271422        0.4989068         1992     1990
## 297         20.763056         4.396109        0.4121829         1994     1990
## 298         17.944394         4.226400        0.4362000         1993     1990
## 299         10.725937         3.796838        0.3311135         1993     1990
## 300         12.920302         4.032600        0.4293000         1993     1990
## 301         12.246092         4.105200        0.4812000         1993     1990
## 302          9.619306         4.210300        0.4918000         1993     1990
## 303         11.600196         4.335406        0.5016970         1988     1980
## 304         17.025075         4.415400        0.4490000         1993     1990
## 305         12.764808         4.301800        0.4936000         1992     1990
## 306         22.092222         4.463900        0.4719000         1992     1990
## 307         15.437663         4.175884        0.4582080         1993     1990
## 308         10.178374         4.303800        0.4789000         1993     1990
## 309         25.869239         4.521176        0.5328457         1991     1990
## 310         11.742101         4.298133        0.5056251         1992     1990
## 311         10.812951         4.272800        0.4899000         1993     1990
## 312         17.539720         4.203450        0.4719713         1989     1980
## 313         13.463335         3.958036        0.3652978         1993     1990
## 314         12.787488         4.387200        0.5062000         1992     1990
## 315          9.385824         4.379676        0.4835645         1992     1990
## 316         13.245514         4.286633        0.4548624         1993     1990
## 317         13.875576         4.172078        0.4535259         1992     1990
## 318         16.270408         4.193941        0.4571211         1991     1990
## 319         13.192385         4.361500        0.4365000         1993     1990
## 320         15.239564         4.210500        0.4032000         1991     1990
## 321         12.894100         3.920837        0.4153868         1988     1980
## 322         13.485326         4.298700        0.4740000         1987     1980
## 323         26.259071         4.605071        0.5296133         1990     1990
## 324         10.571957         4.267469        0.4795045         1980     1980
## 325         13.282656         4.385433        0.4641687         1987     1980
## 326         13.830470         4.131700        0.4997000         1992     1990
## 327         11.740585         4.420081        0.5025047         1994     1990
## 328         28.619169         4.177956        0.4200514         1989     1980
## 329         12.725234         4.075500        0.4010000         1969     1960
## 330         20.827771         4.124649        0.4371797         1962     1960
## 331         29.894007         4.527997        0.4773609         1952     1950
## 332         13.600024         4.197228        0.4448800         1958     1950
## 333         11.516859         4.350780        0.4976943         1971     1970
## 334         12.589568         4.195500        0.4691381         1994     1990
## 335         26.096836         4.295865        0.4408942         1994     1990
## 336         11.503351         3.877534        0.4338080         1993     1990
## 337         19.405039         3.994001        0.4431931         1992     1990
## 338         13.871968         4.240252        0.4530891         1993     1990
## 339         10.981010         4.318100        0.4536000         1995     1990
## 340         19.857304         4.091831        0.4368416         1995     1990
## 341         11.480619         4.253498        0.4180571         1995     1990
## 342         14.767467         4.363100        0.4881000         1992     1990
## 343         12.512162         4.012068        0.4560116         1960     1960
## 344         22.836960         4.473263        0.4872441         1971     1970
## 345         12.805573         4.250700        0.5013000         1971     1970
## 346         18.519394         4.478921        0.4619721         1977     1970
## 347         13.586885         3.996056        0.4097687         1957     1950
## 348         25.100396         4.493488        0.4916293         1961     1960
## 349         13.063893         4.328039        0.4841303         1984     1980
## 350         17.520120         4.322900        0.5163000         1994     1990
## 351          9.075610         4.084400        0.4039000         1994     1990
## 352         11.573855         4.155988        0.4772159         1990     1990
## 353         14.289944         4.171207        0.3991580         1994     1990
## 354         10.542250         4.017800        0.4402000         1995     1990
## 355         13.216599         4.335200        0.4745000         1986     1980
## 356          9.070358         4.235578        0.4545652         1992     1990
## 357         17.100703         4.280500        0.4686000         1995     1990
## 358         16.999966         4.156442        0.4068850         1994     1990
## 359         19.787909         4.216527        0.4178379         1994     1990
## 360         10.351646         3.848218        0.4276497         1994     1990
## 361         14.671972         4.243503        0.4631789         1991     1990
## 362         14.473467         4.040700        0.3887000         1992     1990
## 363         11.949939         4.207822        0.4692254         1991     1990
## 364          8.051836         3.926100        0.4385000         1994     1990
## 365         15.653820         4.119806        0.4484418         1994     1990
## 366         19.796337         4.473600        0.4585000         1990     1990
## 367         13.346463         4.306024        0.4510254         1992     1990
## 368         10.323755         4.102200        0.4864000         1991     1990
## 369         18.232299         4.255322        0.4674810         1982     1980
## 370         13.482581         4.092900        0.3916000         1963     1960
## 371         13.494164         4.011998        0.4303449         1994     1990
## 372          9.679694         4.172400        0.4694000         1993     1990
## 373         12.693022         4.276300        0.4645000         1993     1990
## 374         12.225077         3.843580        0.3295943         1992     1990
## 375         17.778146         4.217700        0.4071000         1992     1990
## 376         14.850045         4.319600        0.4673000         1994     1990
## 377         12.760284         4.460200        0.4993000         1994     1990
## 378         17.880759         4.459546        0.5070726         1994     1990
## 379         13.289273         4.066031        0.4093716         1977     1970
## 380         18.062814         4.247760        0.4266970         1977     1970
## 381         13.787803         4.265605        0.4782199         1969     1960
## 382         11.643552         4.168259        0.4522737         1959     1950
## 383         12.114289         4.052661        0.4329023         1962     1960
## 384         16.396784         4.164312        0.4322729         1966     1960
## 385         12.981141         4.121300        0.4546000         1973     1970
## 386         16.298975         4.190050        0.4179355         1957     1950
## 387         12.073468         4.138694        0.4542794         1989     1980
## 388         12.879110         4.436634        0.4530318         1995     1990
## 389         16.602677         4.097800        0.4512000         1992     1990
## 390         13.854840         4.323600        0.4638000         1995     1990
## 391         13.994343         3.936713        0.4013342         1994     1990
## 392          9.959387         4.089100        0.4317000         1995     1990
## 393         13.789291         4.222366        0.4699447         1971     1970
## 394         18.533142         4.125012        0.3965032         1970     1970
## 395         15.854416         4.344979        0.4359361         1966     1960
## 396         15.007619         4.297955        0.4850024         1971     1970
## 397         12.161711         3.908001        0.4160902         1997     1990
## 398         10.888570         4.111500        0.4620000         1994     1990
## 399         15.544655         4.231100        0.4505000         1991     1990
## 400         15.955065         4.235235        0.4307853         1992     1990
## 401          6.863179         3.963817        0.4057219         1994     1990
## 402         10.216909         3.914600        0.4043000         1995     1990
## 403         11.267259         4.124700        0.4239000         1993     1990
## 404         27.964342         4.350830        0.4826698         1994     1990
## 405          9.858317         4.206900        0.4605000         1996     1990
## 406         19.319631         3.955889        0.4037590         1970     1970
## 407         15.991693         4.568721        0.4627558         1994     1990
## 408         16.404907         4.166318        0.4437437         1962     1960
## 409         16.097184         4.237900        0.4407000         1997     1990
## 410         17.668828         4.233900        0.4599000         1997     1990
## 411         10.037910         4.096600        0.4556000         1997     1990
## 412         12.371534         4.179015        0.4957771         1953     1950
## 413         13.687531         4.371822        0.4613318         1980     1980
## 414         21.989981         4.158255        0.4485762         1975     1970
## 415         31.589332         4.123742        0.4249318         1953     1950
## 416         10.675059         4.186117        0.4667375         1997     1990
## 417         15.393187         4.072103        0.4462740         1977     1970
## 418         11.141489         4.282696        0.4545350         1956     1950
## 419         10.761418         4.159321        0.4379057         1996     1990
## 420          8.475666         3.827400        0.3467000         1995     1990
## 421          8.575494         4.224725        0.4510378         1992     1990
## 422         17.467632         4.423041        0.4809573         1974     1970
## 423         17.891576         4.302132        0.4886485         1995     1990
## 424         11.152903         4.081840        0.4508887         1995     1990
## 425         20.980017         4.399135        0.4742469         1986     1980
## 426         13.442735         4.430800        0.4748000         1996     1990
## 427         15.800812         3.797200        0.3821000         1997     1990
## 428         14.155938         3.942403        0.4353154         1997     1990
## 429         19.654218         4.400900        0.4927000         1997     1990
## 430         20.638820         4.012629        0.4179262         1996     1990
## 431         10.558891         3.991529        0.4109838         1996     1990
## 432         14.271469         4.298345        0.4271447         1997     1990
## 433          6.258854         3.856200        0.3320000         1997     1990
## 434         19.426737         4.210968        0.4354907         1995     1990
## 435         12.185184         4.071023        0.4227819         1971     1970
## 436         14.201994         4.101091        0.4010251         1992     1990
## 437         11.440423         4.409591        0.4708276         1993     1990
## 438         17.959844         4.102055        0.4104843         1964     1960
## 439         13.801160         4.175200        0.4769000         1997     1990
## 440         11.519669         4.357001        0.5045145         1998     1990
## 441         14.989745         4.194078        0.5031243         1988     1980
## 442          8.698716         4.135734        0.4471335         1959     1950
## 443         14.943515         4.460200        0.5243000         1997     1990
## 444         18.479583         4.426600        0.4873000         1998     1990
## 445         14.919937         4.389500        0.5050000         1999     1990
## 446         13.418944         4.241186        0.4499298         1973     1970
## 447         11.277695         4.206893        0.4357892         1987     1980
## 448         11.461960         4.026861        0.4366174         1999     1990
## 449         29.741880         4.339304        0.4421320         1970     1970
## 450         29.584658         3.981400        0.4072000         1973     1970
## 451         13.064047         4.122402        0.4605671         1999     1990
## 452         10.290402         3.944000        0.4209000         1985     1980
## 453         19.917222         4.377000        0.4829000         1998     1990
## 454          9.105602         4.166496        0.4856743         1999     1990
## 455         50.562203         4.389970        0.4688536         1999     1990
## 456         17.792801         4.108800        0.4590000         2000     2000
## 457         16.204243         4.481838        0.5096956         1958     1950
## 458         13.396101         4.452000        0.5069000         1998     1990
## 459         18.292097         3.643144        0.3752782         1997     1990
## 460         10.444221         4.331000        0.4455000         1998     1990
## 461         12.241459         4.188300        0.4094000         1999     1990
## 462         11.211024         4.037912        0.4506785         2000     2000
## 463         10.713150         4.262169        0.4092373         1999     1990
## 464         15.092810         4.320400        0.4595000         1998     1990
## 465         30.018019         4.424890        0.4460664         2000     2000
## 466          9.680127         4.196400        0.4262000         1999     1990
## 467         17.619798         4.389523        0.4698178         1951     1950
## 468         18.253809         4.413119        0.4720845         1951     1950
## 469         10.325387         4.114018        0.4312108         1951     1950
## 470          8.430515         4.065265        0.4355020         1999     1990
## 471         68.681009         4.538600        0.4609000         1998     1990
## 472         10.155037         3.839865        0.3960374         1998     1990
## 473         14.854467         4.474600        0.5021000         2000     2000
## 474         13.947199         4.329400        0.4442000         1960     1960
## 475         10.444336         3.930084        0.3379356         2002     2000
## 476         13.235907         4.002939        0.4378493         2000     2000
## 477         12.862096         4.201193        0.4721192         2001     2000
## 478         17.052499         4.253703        0.4818087         1999     1990
## 479         15.419729         4.241200        0.4555000         1999     1990
## 480         20.641416         4.226571        0.4568459         1998     1990
## 481         13.423726         4.259000        0.4786000         2000     2000
## 482         12.522776         4.097042        0.4378294         1999     1990
## 483         21.424285         4.461900        0.4777000         2000     2000
## 484          9.951038         3.787700        0.3790000         1995     1990
## 485         12.746083         3.952623        0.3699514         2001     2000
## 486         14.754438         3.949500        0.4296000         1997     1990
## 487         15.957902         4.077946        0.4602255         1999     1990
## 488         11.021647         3.846600        0.3931000         1956     1950
## 489         17.670307         4.149400        0.4413000         1999     1990
## 490         14.549007         3.961500        0.4178000         1998     1990
## 491         12.671595         4.254400        0.4555000         1998     1990
## 492         11.519834         4.082234        0.4317042         2001     2000
## 493          8.244974         4.058176        0.4332204         2000     2000
## 494          9.769752         4.135100        0.4637000         1999     1990
## 495         21.360141         3.882490        0.3685152         1957     1950
## 496         17.316490         4.366373        0.4819145         1969     1960
## 497         12.324313         3.954100        0.4257000         2000     2000
## 498         17.438651         4.140805        0.4474122         2002     2000
## 499         15.294602         4.280100        0.4706000         2000     2000
## 500         16.371291         4.279600        0.4656000         2001     2000
## 501         18.282009         4.330700        0.5090000         1993     1990
## 502         13.805747         4.276400        0.4564000         1970     1970
## 503         13.983901         3.969066        0.3940133         1957     1950
## 504          9.235606         4.055400        0.4406000         2002     2000
## 505         12.533233         4.305500        0.4820000         1999     1990
## 506         13.341168         3.958970        0.4429516         2002     2000
## 507         17.542765         4.437500        0.4733000         1987     1980
## 508         21.951885         4.138911        0.4753500         1960     1960
## 509         18.736668         4.230500        0.4383000         2000     2000
## 510         12.680244         4.176500        0.4577000         1987     1980
## 511         17.264837         4.396300        0.4584000         2000     2000
## 512         13.230240         3.926592        0.3700405         2001     2000
## 513         13.878176         4.194728        0.4274442         1986     1980
## 514         22.290670         4.280709        0.4476164         1952     1950
## 515         23.247354         4.167500        0.4131000         1973     1970
## 516         29.278475         4.511667        0.4845501         1973     1970
## 517         17.855556         4.290941        0.4439656         1969     1960
## 518         13.084081         4.070617        0.4475290         2007     2000
## 519         17.601181         4.253976        0.4428998         1971     1970
## 520         16.265701         4.357612        0.4599054         1957     1950
## 521         14.640117         4.135641        0.4414651         1951     1950
## 522         16.992166         4.241194        0.4336071         1962     1960
## 523         13.712345         4.407940        0.5181127         1969     1960
## 524         13.674006         4.036483        0.4394562         1971     1970
## 525         12.718939         4.352419        0.4590265         1954     1950
## 526          9.689190         4.146392        0.4520708         1963     1960
## 527         16.674745         4.274241        0.4152443         2001     2000
## 528         21.265616         4.354072        0.4527068         1986     1980
## 529         12.026222         4.167457        0.4459910         2003     2000
## 530         11.938270         4.081882        0.3877365         2000     2000
## 531         11.357594         3.949528        0.4671301         2003     2000
## 532         11.375204         4.213600        0.4928000         2002     2000
## 533         15.314918         4.341619        0.4654605         2003     2000
## 534         18.064946         3.997500        0.4012000         1976     1970
## 535         11.145309         4.289700        0.4272000         2003     2000
## 536         11.467464         4.032900        0.4513000         2006     2000
## 537          9.586428         4.220073        0.4794208         2006     2000
## 538         11.704434         3.714100        0.3851000         2005     2000
## 539         11.048991         4.007913        0.4850922         2006     2000
## 540         10.788663         4.173318        0.4500885         2006     2000
## 541         11.357201         4.076001        0.4223728         2003     2000
## 542         15.810411         3.991028        0.4533572         2003     2000
## 543         10.600821         4.140917        0.4328553         2003     2000
## 544         10.412157         3.985600        0.4674000         2005     2000
## 545         11.616628         4.126918        0.4029401         2003     2000
## 546         15.712431         4.185606        0.4570461         2002     2000
## 547         17.217606         4.322832        0.4387399         2000     2000
## 548         13.474517         4.099484        0.4623014         2001     2000
## 549         10.668896         4.183625        0.4362993         2003     2000
## 550         21.031793         4.052000        0.4347000         2002     2000
## 551         10.030513         4.103734        0.5184425         2002     2000
## 552         10.330363         3.908915        0.4456504         2003     2000
## 553         11.551187         4.313700        0.4735000         2002     2000
## 554         12.203177         4.406300        0.4788000         2002     2000
## 555         16.052691         4.196700        0.4578000         1998     1990
## 556          9.504657         4.158200        0.3964000         1998     1990
## 557         12.082523         4.023312        0.4490316         1992     1990
## 558         15.817148         4.072195        0.4180252         1990     1990
## 559         15.054675         4.129405        0.4551886         2002     2000
## 560         17.343422         4.233520        0.4399464         2003     2000
## 561         13.987124         3.939830        0.4804234         2003     2000
## 562         11.626973         4.002100        0.4081000         2002     2000
## 563         14.364740         4.174646        0.4270807         2003     2000
## 564         10.964016         4.168005        0.4694444         1995     1990
## 565          9.942342         4.175280        0.4659081         2004     2000
## 566         17.720687         4.332732        0.4708901         1997     1990
## 567         10.120484         4.092500        0.4573000         2003     2000
## 568         14.111105         4.138702        0.4320436         2001     2000
## 569         14.219492         4.173100        0.4656000         2003     2000
## 570         13.382015         3.965800        0.4467000         2003     2000
## 571         14.035043         4.051400        0.4417000         2003     2000
## 572         15.103442         4.089472        0.4297615         2004     2000
## 573         17.090184         4.264488        0.4526287         2004     2000
## 574         14.193603         4.472100        0.4854000         2003     2000
## 575         11.324920         4.153763        0.4517285         2001     2000
## 576         10.181624         4.396080        0.4936320         2001     2000
## 577         11.779921         4.052371        0.4120771         2002     2000
## 578         10.838626         4.062290        0.4277090         2001     2000
## 579         14.858842         4.056700        0.4330000         2000     2000
## 580         13.322159         4.449200        0.5117000         2004     2000
## 581         17.571808         4.404500        0.5148000         1998     1990
## 582         14.706813         4.153866        0.4706741         2004     2000
## 583         10.560703         4.139003        0.4188953         2004     2000
## 584         11.577700         4.078604        0.4247762         2003     2000
## 585         15.974763         3.851638        0.3750097         1962     1960
## 586         17.520233         4.536043        0.4800313         2002     2000
## 587         17.363903         4.479500        0.4507000         2000     2000
## 588         17.008062         4.366166        0.4930512         1961     1960
## 589         11.266199         4.221218        0.4186412         1962     1960
## 590         14.942446         4.005341        0.4064156         1981     1980
## 591         10.458902         3.910298        0.3649078         2003     2000
## 592          8.293796         4.040718        0.4566898         2004     2000
## 593         14.699691         4.132600        0.4651000         2003     2000
## 594         11.027190         4.039241        0.4462146         2004     2000
## 595         14.413045         4.137265        0.4737819         1964     1960
## 596          8.962849         4.065000        0.4672000         1997     1990
## 597         12.273621         3.980600        0.4090000         2002     2000
## 598         21.654681         4.169271        0.4282348         1998     1990
## 599         17.560897         4.214500        0.4255000         2004     2000
## 600         16.892029         4.216900        0.4676000         1995     1990
## 601         14.562479         4.091978        0.4373034         2004     2000
## 602         21.443041         4.176092        0.4873867         2004     2000
## 603         13.885673         3.949087        0.4258303         2004     2000
## 604         11.779573         4.029600        0.4334000         2007     2000
## 605         13.174355         4.310853        0.5028192         1953     1950
## 606          9.937486         4.237900        0.4347000         2004     2000
## 607         20.397506         4.480835        0.5175495         2002     2000
## 608         13.551514         4.414029        0.4497029         2007     2000
## 609         14.483158         4.233089        0.4845753         2005     2000
## 610          7.659178         3.991971        0.4590719         2005     2000
## 611         30.309106         4.318300        0.4751000         2004     2000
## 612         12.338460         3.839780        0.4270443         2005     2000
## 613         24.434954         4.336965        0.4417888         2004     2000
## 614         14.555133         3.864100        0.4279000         2005     2000
## 615         17.200834         4.340900        0.4740000         2004     2000
## 616         13.951616         4.213954        0.4569499         1971     1970
## 617         12.822089         4.535500        0.5090000         2003     2000
## 618         12.319526         4.202200        0.4275000         2002     2000
## 619         15.005710         4.193789        0.4755686         1993     1990
## 620         13.772770         4.182900        0.4783000         2004     2000
## 621         10.438517         4.315788        0.5132642         2004     2000
## 622          9.849443         4.349653        0.4836537         2005     2000
## 623         24.644970         4.373800        0.5000000         2004     2000
## 624          9.512814         3.960018        0.3817557         1998     1990
## 625         11.141071         4.144200        0.4396000         2005     2000
## 626          9.737065         4.150936        0.4390293         1993     1990
## 627         11.981422         4.200800        0.5061000         2005     2000
## 628         13.715040         4.513628        0.4892281         1969     1960
## 629         18.109578         4.257200        0.4815000         2002     2000
## 630         11.310089         4.153600        0.4896000         2005     2000
## 631         20.002073         4.207300        0.4814000         2005     2000
## 632         10.616689         4.169200        0.4699000         2005     2000
## 633         11.914599         3.959655        0.4235873         2005     2000
## 634         15.078654         4.065600        0.4438000         2004     2000
## 635         13.107251         4.211656        0.4810518         2005     2000
## 636         12.534082         4.312716        0.4813346         1987     1980
## 637         19.147142         4.290596        0.4573297         2003     2000
## 638         15.041228         4.140700        0.4456000         2003     2000
## 639         10.968640         4.205362        0.4387374         2005     2000
## 640          8.740279         3.582800        0.3954000         2005     2000
## 641         14.461793         4.490988        0.4895511         2000     2000
## 642         21.063079         4.247155        0.4260393         1968     1960
## 643         20.040458         4.118022        0.4051227         1957     1950
## 644         28.112184         4.165933        0.4298609         1988     1980
## 645         17.100409         4.751997        0.5067459         1987     1980
## 646         16.516130         3.973223        0.4095837         1967     1960
## 647         12.332939         4.121872        0.4597036         1962     1960
## 648         16.745941         4.065927        0.4136326         1974     1970
## 649         22.911077         4.012200        0.4118000         1992     1990
## 650         14.272555         4.207100        0.4310000         1991     1990
## 651         10.080593         4.066200        0.4246000         2006     2000
## 652         10.897764         3.933834        0.4322638         2006     2000
## 653         17.152637         4.032688        0.3918180         2006     2000
## 654         14.659827         3.943819        0.4277985         1951     1950
## 655         13.754401         4.294252        0.4335134         2000     2000
## 656         11.438987         4.085400        0.4442000         2003     2000
## 657         18.150327         4.321800        0.4369000         2001     2000
## 658         14.424473         4.129700        0.4349000         2002     2000
## 659         23.088537         4.070095        0.4050790         1999     1990
## 660         10.854977         3.931900        0.4421000         2005     2000
## 661         11.266970         4.430412        0.4881889         1955     1950
## 662         14.399718         4.236900        0.4476000         2006     2000
## 663          9.637116         4.064000        0.4734000         2006     2000
## 664          8.236461         3.766400        0.4092000         2005     2000
## 665         12.552141         4.164467        0.4704558         2006     2000
## 666          8.305613         4.029745        0.3472737         2005     2000
## 667         19.010959         4.225430        0.4180414         2004     2000
## 668         13.402951         4.368496        0.4857471         2005     2000
## 669         12.277078         4.165562        0.5111069         1998     1990
## 670         17.334746         4.205100        0.4494000         2005     2000
## 671         12.806343         3.910400        0.4410000         2004     2000
## 672         12.518197         4.242700        0.4516000         1995     1990
## 673         13.252768         4.076883        0.4670107         2006     2000
## 674         12.025145         4.102700        0.4977000         2005     2000
## 675         14.265920         3.876236        0.3622559         2006     2000
## 676         12.032541         4.464700        0.4777000         2004     2000
## 677         10.015540         3.911000        0.4129000         2003     2000
## 678         10.477614         3.929000        0.4343000         2000     2000
## 679         13.261166         3.816400        0.4193000         2006     2000
## 680         13.627956         3.965603        0.4539131         2006     2000
## 681         12.633692         4.179000        0.4659000         2003     2000
## 682          7.782719         3.816700        0.4447000         2006     2000
## 683         10.690396         4.182522        0.4401584         2006     2000
## 684          9.345534         4.192158        0.4514218         2006     2000
## 685         10.574354         4.186877        0.4657759         2008     2000
## 686          9.994841         4.197908        0.4542720         2006     2000
## 687         10.940117         3.939700        0.4385000         2006     2000
## 688         19.534130         4.022100        0.4234000         2006     2000
## 689         10.386033         3.897022        0.4201462         2006     2000
## 690         26.337219         3.939300        0.3340000         2005     2000
## 691         18.465039         4.240000        0.4996000         1995     1990
## 692          8.964335         3.956003        0.4191871         1997     1990
## 693         11.189293         4.215395        0.4700457         1959     1950
## 694         22.059542         4.089900        0.4386000         2005     2000
## 695         12.286330         4.304000        0.4697000         2008     2000
## 696         10.861879         3.924415        0.4563768         2008     2000
## 697         14.948263         4.017200        0.4251000         2008     2000
## 698         11.588396         4.329914        0.4785391         2008     2000
## 699         14.449624         4.213500        0.4192000         2008     2000
## 700         14.625354         4.352598        0.4709899         2008     2000
## 701         12.506694         4.150314        0.4647497         2007     2000
## 702          9.264200         4.119392        0.4633587         2008     2000
## 703         11.359876         4.256709        0.4476518         2008     2000
## 704         15.615399         4.243425        0.4524472         2007     2000
## 705         16.552411         4.234800        0.4446000         2006     2000
## 706         14.377348         4.285358        0.4673721         2006     2000
## 707         12.884986         4.178189        0.4541964         2007     2000
## 708         15.376047         4.264500        0.4405000         2007     2000
## 709         12.663775         4.256700        0.4792000         2007     2000
## 710         16.158837         4.492200        0.5179000         2005     2000
## 711         12.493859         4.076725        0.4515533         2002     2000
## 712         12.036136         3.944902        0.3033643         2001     2000
## 713         11.208820         4.218147        0.4435871         2007     2000
## 714         12.075433         4.049128        0.3901888         2006     2000
## 715         12.674896         4.136100        0.4540000         1996     1990
## 716         12.180467         4.076006        0.4398306         1970     1970
## 717         12.809916         4.182506        0.4345831         1976     1970
## 718         11.417921         4.207848        0.4733868         1950     1950
## 719         12.173662         4.277068        0.4719018         1978     1970
## 720         14.156325         4.254126        0.4483059         1978     1970
## 721         14.755232         4.010562        0.4344599         1980     1980
## 722         10.822148         4.242666        0.4727273         1971     1970
## 723         17.568760         4.185434        0.4752335         1958     1950
## 724          8.964649         3.874600        0.4152000         1993     1990
## 725         11.103517         4.239997        0.4467496         1962     1960
## 726         11.096066         4.085679        0.4671822         1968     1960
## 727         10.894036         4.408645        0.4827246         1976     1970
## 728          8.623835         4.216000        0.4367000         1980     1980
## 729          7.484145         4.192453        0.4694371         1972     1970
## 730         14.838216         4.193245        0.4549209         1972     1970
## 731         12.638182         4.294718        0.4860394         1976     1970
## 732         10.739323         4.265155        0.4967485         1981     1980
## 733          9.183717         4.315620        0.4589437         1992     1990
## 734         23.196578         4.332263        0.4521912         1968     1960
## 735         12.358336         4.010805        0.4163318         1972     1970
## 736         15.373673         3.908934        0.4422876         1991     1990
## 737         14.219777         4.217827        0.4415059         1983     1980
## 738         11.250954         4.129913        0.4379833         1985     1980
## 739         14.953137         4.237000        0.4521000         1987     1980
## 740         15.635892         4.254569        0.4411581         1972     1970
## 741         10.592451         4.074579        0.4824994         1975     1970
## 742         12.403070         4.068860        0.4737728         1974     1970
## 743         14.829323         4.327228        0.4942318         1964     1960
## 744         11.847216         4.030427        0.4503133         1989     1980
## 745         12.730645         4.276598        0.4425183         1976     1970
## 746         18.918861         4.185479        0.4422319         1972     1970
## 747         17.183633         4.077300        0.4258000         1978     1970
## 748         12.269593         4.113033        0.4314247         1961     1960
## 749         10.613797         4.113143        0.4752461         1990     1990
## 750         10.025328         4.133039        0.4599887         1978     1970
## 751         12.019970         4.183930        0.4663825         1979     1970
## 752          8.851061         3.983043        0.4585257         1956     1950
## 753         16.440192         4.125739        0.4090194         1969     1960
## 754         17.833777         4.197889        0.4678723         1969     1960
## 755         12.034362         3.978015        0.4263514         1971     1970
## 756         11.585942         4.281900        0.5032000         2005     2000
## 757         10.425479         4.305880        0.4847098         1987     1980
## 758         10.279648         3.931600        0.4499000         2007     2000
## 759         18.097130         4.429400        0.5024000         2007     2000
## 760         13.006539         4.191700        0.4417000         2006     2000
## 761         12.596424         4.204006        0.4543857         2006     2000
## 762         11.413764         4.181400        0.4441000         2007     2000
## 763         14.636421         4.054233        0.4426472         2007     2000
## 764         13.482107         4.257680        0.4653496         1953     1950
## 765         15.595848         4.222770        0.4655191         2007     2000
## 766          9.237035         3.992797        0.4046810         2006     2000
## 767         12.814171         4.292352        0.3699891         2007     2000
## 768         21.533499         4.079083        0.4034672         2006     2000
## 769         23.077194         4.229200        0.4447000         1994     1990
## 770         20.567987         4.323485        0.4279092         1994     1990
## 771          9.217553         3.982090        0.4489644         2007     2000
## 772         37.662621         4.420200        0.4573000         2005     2000
## 773         34.888285         4.454600        0.4484000         2005     2000
## 774         16.912814         4.162100        0.4319000         2006     2000
## 775          9.483644         4.147199        0.4684440         2007     2000
## 776         43.713630         3.883984        0.3441350         1983     1980
## 777         22.683712         4.491567        0.4805485         1975     1970
## 778         23.691536         4.024670        0.4343279         1993     1990
## 779         18.689494         4.278900        0.4349000         1988     1980
## 780         21.223494         4.239363        0.4207540         1993     1990
## 781         15.638123         4.411587        0.4447792         1985     1980
## 782         11.416350         4.004003        0.4520067         1966     1960
## 783         13.871346         4.274359        0.4598527         1977     1970
## 784         15.517341         4.433471        0.4885867         1986     1980
## 785         16.967772         3.756756        0.3919374         1979     1970
## 786         10.423623         3.909798        0.4246991         1988     1980
## 787         15.753501         4.399328        0.5052954         1976     1970
## 788         16.731363         3.981377        0.3890025         1956     1950
## 789         13.245426         4.018300        0.4135000         1979     1970
## 790         16.061114         4.276276        0.4393973         1975     1970
## 791         27.644835         4.579746        0.4750961         1978     1970
## 792         20.856727         4.106085        0.4440204         1976     1970
## 793         24.592526         4.312453        0.4734482         1979     1970
## 794         21.871348         4.434158        0.4644517         1975     1970
## 795         16.933605         3.975917        0.4318335         1979     1970
## 796         24.930698         4.325777        0.4875028         1970     1970
## 797         15.309755         4.272578        0.4584123         1955     1950
## 798         22.823707         4.152548        0.4125295         1961     1960
## 799         14.247495         3.915294        0.3581365         1965     1960
## 800         14.312007         4.082401        0.4236278         1964     1960
## 801         14.208762         4.048993        0.4267330         1950     1950
## 802         13.413152         4.100622        0.4378299         1969     1960
## 803         11.455822         3.980422        0.4544797         1986     1980
## 804         11.207145         4.237556        0.4856315         1977     1970
## 805          8.511516         4.099800        0.4597000         1981     1980
## 806         12.268652         4.353760        0.4401596         2007     2000
## 807         14.699323         4.235589        0.4611018         2006     2000
## 808         21.609366         4.324700        0.4286000         2007     2000
## 809         23.354671         4.326400        0.4946000         2006     2000
## 810         13.622717         4.373500        0.4658000         2008     2000
## 811         22.350148         4.204400        0.4656000         2008     2000
## 812         13.448270         4.252215        0.4509061         2008     2000
## 813         18.579947         4.198800        0.4340000         2008     2000
## 814          8.671565         3.930788        0.3516347         2008     2000
## 815         11.799075         4.202804        0.4473310         1978     1970
## 816         19.111350         4.455934        0.4967529         1975     1970
## 817         16.988657         4.226118        0.4148081         1976     1970
## 818         15.626081         4.322975        0.4815301         1973     1970
## 819         14.176665         3.979363        0.4107249         1977     1970
## 820         17.109752         4.311763        0.4300945         1994     1990
## 821         23.101282         4.471202        0.4856650         1992     1990
## 822         10.872400         4.304588        0.4820730         1990     1990
## 823         27.650474         4.102530        0.4413470         1977     1970
## 824         13.503350         4.246054        0.4463090         1992     1990
## 825         11.377704         4.012500        0.4306000         1978     1970
## 826         30.045190         4.382561        0.5014710         1976     1970
## 827         10.581719         4.239668        0.4152343         1976     1970
## 828         16.333875         4.179101        0.4471346         1977     1970
## 829         17.489681         4.123020        0.4737365         2008     2000
## 830         11.840438         4.028576        0.4512237         2008     2000
## 831         20.688068         4.281573        0.4445955         2007     2000
## 832         11.672444         4.085400        0.4255000         2000     2000
## 833         15.003968         4.131164        0.4455633         1986     1980
## 834         11.047713         3.883700        0.4289000         2008     2000
## 835         14.182521         4.423000        0.4704000         2006     2000
## 836          8.595446         4.168872        0.4399554         2006     2000
## 837         10.317085         4.175300        0.4669000         2008     2000
## 838         18.088097         4.217051        0.4786089         1968     1960
## 839         14.887546         3.932900        0.3472000         2007     2000
## 840         12.935129         4.235600        0.4305000         2008     2000
## 841         17.327891         4.521941        0.4455460         1972     1970
## 842         20.299273         4.186998        0.4459846         1961     1960
## 843         13.795462         4.157686        0.4550495         1971     1970
## 844         12.535411         4.178041        0.4573801         1964     1960
## 845          8.883138         4.010092        0.4299342         1962     1960
## 846         11.943305         3.969131        0.3891822         1955     1950
## 847         14.116942         4.226146        0.4570276         1972     1970
## 848         14.718228         4.275587        0.4539352         1967     1960
## 849         21.385789         4.205439        0.4092740         1967     1960
## 850         19.713777         4.068072        0.4675268         1962     1960
## 851         12.995540         4.129254        0.4160629         1966     1960
## 852         16.842049         4.190123        0.4709319         1963     1960
## 853         19.675596         4.172749        0.4236473         1957     1950
## 854         18.077258         4.067811        0.4019804         1956     1950
## 855         15.552328         3.702152        0.3963699         1959     1950
## 856         17.677698         3.971300        0.4234000         1950     1950
## 857         23.387199         3.826248        0.4121742         1974     1970
## 858         21.643043         4.131311        0.4543839         1957     1950
## 859         18.324068         4.349797        0.4621339         1989     1980
## 860         20.288866         3.883854        0.3496715         1968     1960
## 861         12.695995         4.126003        0.4438434         1971     1970
## 862         13.036877         4.439303        0.4730014         1956     1950
## 863         17.622677         4.092058        0.4113089         1967     1960
## 864         44.061992         4.337938        0.4197441         1969     1960
## 865         16.967685         4.177068        0.4745297         1987     1980
## 866         21.164879         4.030457        0.4207044         1962     1960
## 867         17.885434         4.408065        0.5095551         1957     1950
## 868         17.584151         4.472529        0.4858448         1953     1950
## 869         10.831067         4.015431        0.4290311         1951     1950
## 870         18.127148         4.338700        0.4554000         1975     1970
## 871         16.589949         3.990261        0.3841303         1958     1950
## 872         14.500418         3.963700        0.4332000         1984     1980
## 873         20.018993         4.284379        0.4485898         1950     1950
## 874         20.454277         4.093857        0.4324142         1972     1970
## 875         14.569823         4.270413        0.4797827         1958     1950
## 876         24.025958         4.175800        0.4185000         1964     1960
## 877         15.490541         4.177500        0.4678000         1965     1960
## 878         20.658392         4.438021        0.5020183         2002     2000
## 879         15.815360         4.241000        0.4396448         1962     1960
## 880         19.350624         4.295413        0.4758812         1965     1960
## 881         10.142310         3.816400        0.4109000         1960     1960
## 882         15.332350         4.524689        0.4989705         1954     1950
## 883         19.191606         4.216725        0.4525675         1960     1960
## 884         12.764699         4.171156        0.4411436         1963     1960
## 885         13.866939         4.319026        0.4930245         1950     1950
## 886         18.088124         4.087593        0.4307255         1963     1960
## 887         21.694378         4.142300        0.4420000         1967     1960
## 888         17.725127         4.455783        0.4850887         1971     1970
## 889         15.964904         4.022200        0.4053000         1954     1950
## 890         14.732342         3.963586        0.3643061         1972     1970
## 891         19.100426         4.292667        0.4689792         1971     1970
## 892         29.902251         4.415444        0.4867853         1989     1980
## 893         31.329410         4.420131        0.5000499         1984     1980
## 894         14.026565         4.236266        0.4478401         1961     1960
## 895         12.179253         4.319505        0.4955898         1966     1960
## 896         23.162473         4.174122        0.4272924         1962     1960
## 897         14.272200         4.044620        0.4105631         1970     1970
## 898         11.940153         4.042240        0.4283654         1964     1960
## 899         12.474797         4.193147        0.4909840         1966     1960
## 900         17.096522         4.253633        0.4624798         1950     1950
## 901         12.926366         4.409589        0.4719760         1959     1950
## 902         11.789603         3.992793        0.3275310         1966     1960
## 903         22.802873         4.513993        0.4837852         1984     1980
## 904         17.839633         4.096959        0.4246516         1971     1970
## 905         15.444665         4.173652        0.4504517         1972     1970
## 906         15.014533         3.942841        0.4188601         1959     1950
## 907         11.978284         4.020383        0.4442692         1958     1950
## 908         14.506467         4.344085        0.4533831         1965     1960
## 909         17.574361         4.097295        0.4563473         1972     1970
## 910         10.338445         3.914700        0.4344000         2000     2000
## 911         12.909617         4.342208        0.4701128         1974     1970
## 912         16.991861         4.191564        0.4413370         1971     1970
## 913         13.048112         4.435734        0.4927019         1960     1960
## 914         22.801223         4.509600        0.4540000         1961     1960
## 915         25.762143         4.382422        0.4399213         1959     1950
## 916         13.733516         4.333347        0.4945266         1972     1970
## 917         17.452799         4.161767        0.4561374         1957     1950
## 918         14.045514         4.441292        0.4706614         1970     1970
## 919         14.865871         4.291849        0.4777933         1955     1950
## 920         13.003527         4.224798        0.5034660         1961     1960
## 921         10.832710         4.291000        0.5014000         1973     1970
## 922         12.203369         4.441442        0.4624428         1968     1960
## 923         32.005753         3.993447        0.4015282         1965     1960
## 924         13.493593         4.346338        0.4954492         1966     1960
## 925         22.408117         4.216586        0.4535584         1971     1970
## 926         18.726718         4.188236        0.4488037         1961     1960
## 927         17.356353         4.342363        0.4921178         1973     1970
## 928         11.588388         3.887567        0.4046783         1986     1980
## 929          8.066582         4.004718        0.3986998         1952     1950
## 930         11.090412         4.214407        0.4241935         1954     1950
## 931         12.859962         4.058510        0.4481657         1961     1960
## 932         12.657315         4.401056        0.4707750         1955     1950
## 933         21.684839         4.378230        0.5112274         1971     1970
## 934         10.559983         4.284576        0.4764547         1963     1960
## 935         11.962293         4.227330        0.4593030         1969     1960
## 936         19.344010         4.097210        0.4603009         1951     1950
## 937         10.721688         4.400575        0.4730202         1961     1960
## 938         15.661034         4.127363        0.4419478         1968     1960
## 939          8.814839         4.055301        0.4170603         1973     1970
## 940         11.700586         4.094061        0.4542155         1959     1950
## 941         14.381807         4.206600        0.4434000         1960     1960
## 942         11.424783         4.187054        0.4527478         1956     1950
## 943         14.525513         4.131700        0.4416000         1966     1960
## 944         16.178085         3.847773        0.4118233         1967     1960
## 945         13.114706         4.237240        0.4568752         1971     1970
## 946         14.046365         4.148508        0.4597760         1959     1950
## 947         17.689214         4.243520        0.4695699         1959     1950
## 948         15.531112         4.237200        0.4708000         1968     1960
## 949         17.355054         4.321969        0.4515327         1961     1960
## 950         26.771867         4.296323        0.4109711         1970     1970
## 951         10.500029         3.943879        0.4313338         1956     1950
## 952         10.700733         4.217594        0.4787918         1960     1960
## 953         10.704346         4.161447        0.4496611         1955     1950
## 954         10.017768         4.162747        0.4375173         1953     1950
## 955         14.315550         4.386845        0.4699067         1973     1970
## 956         15.904983         4.144500        0.4956000         1972     1970
## 957         14.201588         4.345585        0.4468198         2002     2000
## 958         12.099710         4.220058        0.4854550         1967     1960
## 959         12.018032         4.147105        0.4310164         1966     1960
## 960         13.078636         4.135963        0.4292269         1961     1960
## 961         20.969530         4.056189        0.4417597         1957     1950
## 962         11.825696         4.449500        0.5192000         1973     1970
## 963         13.485188         4.204747        0.4601075         1963     1960
## 964          9.963729         4.286802        0.4700206         1975     1970
## 965         17.268660         4.191728        0.4308268         1963     1960
## 966         10.325032         4.013095        0.4326610         1970     1970
## 967         15.400731         4.056112        0.4276843         1969     1960
## 968         14.963612         4.131482        0.4204239         1962     1960
## 969         15.530778         4.502218        0.5138218         1958     1950
## 970         16.528194         4.503900        0.4780000         1972     1970
## 971         15.853981         4.532349        0.4588939         1972     1970
## 972         13.260008         4.092094        0.4434178         1963     1960
## 973         14.736533         4.169278        0.4587024         1963     1960
## 974         14.594580         4.160909        0.4108320         1970     1970
## 975         16.522756         4.223132        0.4425652         1958     1950
## 976         24.808745         4.410634        0.4491538         1967     1960
## 977         12.556394         4.098410        0.4634726         1952     1950
## 978         19.942537         4.166985        0.4233780         1952     1950
## 979         12.063722         4.191581        0.4572070         1962     1960
## 980          7.775881         4.185376        0.3936780         1950     1950
## 981         17.767107         4.298572        0.4525268         1971     1970
## 982         11.565145         3.684703        0.4088223         1974     1970
## 983         14.998217         4.175700        0.4738000         1963     1960
## 984         12.548668         4.070420        0.4502819         1987     1980
## 985         13.477203         4.356482        0.4844136         1987     1980
## 986          8.863320         4.047829        0.4392460         1988     1980
## 987         12.798718         4.483316        0.4905016         1989     1980
## 988         13.264001         4.211542        0.4573177         1989     1980
## 989         20.138574         4.519400        0.4743000         1986     1980
## 990         10.160388         4.352998        0.4672016         1959     1950
## 991         20.751497         4.366922        0.5041075         1989     1980
## 992          7.738431         4.141809        0.4851692         1989     1980
## 993         13.508211         3.985400        0.4078000         1989     1980
## 994         10.365031         4.075800        0.4509000         1980     1980
## 995         16.296567         4.052756        0.4129677         1989     1980
## 996         18.572519         4.409500        0.5075000         1988     1980
## 997          8.874135         3.977655        0.4378865         1960     1960
## 998         30.407449         4.306345        0.4362578         1989     1980
## 999         15.101731         4.292924        0.4741546         1987     1980
## 1000        30.879394         4.555100        0.5180000         1984     1980
## 1001        12.546059         4.308974        0.4495092         1956     1950
## 1002        15.631198         4.073992        0.4404880         1983     1980
## 1003        10.172546         4.093726        0.4700956         1984     1980
## 1004        16.437996         4.165531        0.4636498         1984     1980
## 1005        11.299930         4.100823        0.4226824         1984     1980
## 1006        16.694313         4.187766        0.4716468         1984     1980
## 1007        18.622841         4.094445        0.4273339         1984     1980
## 1008        13.570776         4.186633        0.4505383         1985     1980
## 1009        16.146980         4.011835        0.4469904         1982     1980
## 1010        13.636378         4.429758        0.4640817         1983     1980
## 1011        14.950115         4.135500        0.4554000         1983     1980
## 1012         7.567738         4.212800        0.4384000         1981     1980
## 1013        12.114771         4.217958        0.4819784         1976     1970
## 1014        21.838597         4.437514        0.5093058         1984     1980
## 1015         9.420143         4.020779        0.4049834         1984     1980
## 1016         9.645292         3.852500        0.4234000         1983     1980
## 1017        17.737145         4.406197        0.4913529         1985     1980
## 1018        17.975694         4.221089        0.4664587         1984     1980
## 1019        21.948943         4.296200        0.4670000         1984     1980
## 1020        17.280792         4.187402        0.4555446         1985     1980
## 1021         8.604733         3.942673        0.4623862         1959     1950
## 1022        17.560278         4.305742        0.4671166         1950     1950
## 1023        14.176220         4.242128        0.4646460         1984     1980
## 1024        14.699801         4.327064        0.4910278         1984     1980
## 1025        22.854383         4.392031        0.4896678         1985     1980
## 1026        14.028995         4.075641        0.4308464         1980     1980
## 1027        16.234670         4.257968        0.4452232         1985     1980
## 1028        24.093369         3.940000        0.4174000         1984     1980
## 1029        20.813146         4.239928        0.4593535         1984     1980
## 1030        13.717833         3.912500        0.3864000         1986     1980
## 1031        12.797764         4.096205        0.4807792         1986     1980
## 1032        10.064070         4.283661        0.4816668         1986     1980
## 1033        14.295627         4.339300        0.4791000         1984     1980
## 1034        10.232366         4.088014        0.4714782         1985     1980
## 1035        13.230209         4.129695        0.4252543         1984     1980
## 1036        13.739935         4.271690        0.5051143         1984     1980
## 1037         9.294414         4.180795        0.4652786         1985     1980
## 1038        24.069666         4.324900        0.4897000         1983     1980
## 1039        16.259435         4.355421        0.4804090         1985     1980
## 1040        13.022093         4.345676        0.4602784         1983     1980
## 1041        17.571265         4.253180        0.4511599         1982     1980
## 1042         8.762622         4.033776        0.4488609         1983     1980
## 1043        12.787860         4.135815        0.4730343         1985     1980
## 1044        12.205857         4.182619        0.4786058         1983     1980
## 1045        18.592527         4.259595        0.4760423         1984     1980
## 1046        13.246533         4.257554        0.4602476         1984     1980
## 1047        17.793614         4.358122        0.4955083         1985     1980
## 1048        13.125807         4.348035        0.4621752         1984     1980
## 1049        16.871620         4.317500        0.4364000         1985     1980
## 1050        14.539180         4.324100        0.4553000         1985     1980
## 1051        13.737046         4.287500        0.4505000         1985     1980
## 1052        18.737385         4.212086        0.4570962         1985     1980
## 1053        26.007594         4.360846        0.4413040         1986     1980
## 1054        12.413785         4.174200        0.4457000         1985     1980
## 1055        11.833350         3.931200        0.4398000         1985     1980
## 1056        11.824258         4.270763        0.4654992         1984     1980
## 1057        13.992668         4.064400        0.4472000         1982     1980
## 1058        16.610419         4.154847        0.4251694         1975     1970
## 1059        12.125303         4.382924        0.4547350         1984     1980
## 1060         9.442276         4.042309        0.3898515         1984     1980
## 1061        14.252055         4.109900        0.4513000         1976     1970
## 1062        11.071566         4.058359        0.4409355         1973     1970
## 1063        13.877334         4.374517        0.4620507         1986     1980
## 1064        27.145278         4.223200        0.4581000         1985     1980
## 1065        10.287790         4.209967        0.4794414         1986     1980
## 1066        14.006817         3.970300        0.3917000         1980     1980
## 1067        19.498482         4.181900        0.4341000         1986     1980
## 1068        17.005865         5.107900        0.3387000         1984     1980
## 1069        14.006443         4.256700        0.4923000         1987     1980
## 1070         9.841716         4.114646        0.4558933         1986     1980
## 1071        15.891235         4.291732        0.4636474         1987     1980
## 1072        10.809417         4.073800        0.4562000         1986     1980
## 1073        10.965368         4.246703        0.4591824         1986     1980
## 1074        56.187892         4.380729        0.4608816         1986     1980
## 1075        12.628701         3.987004        0.4273463         1984     1980
## 1076         8.873905         4.268568        0.4438797         1985     1980
## 1077        12.222596         4.129601        0.4606287         1963     1960
## 1078        18.432162         4.219700        0.4594000         1985     1980
## 1079        20.332106         4.393953        0.4652497         1985     1980
## 1080        12.847255         4.170100        0.4870000         1986     1980
## 1081        16.696193         4.138570        0.4424411         1986     1980
## 1082        24.686430         4.482177        0.4759180         1986     1980
## 1083        18.822474         4.265960        0.4304464         1986     1980
## 1084        14.512738         4.084873        0.4528977         1985     1980
## 1085        15.957676         3.815598        0.4123080         1984     1980
## 1086        14.031648         4.179559        0.4364239         1984     1980
## 1087        21.588333         4.414092        0.4761239         1983     1980
## 1088        18.838772         4.028212        0.4405368         1979     1970
## 1089        15.874988         4.049693        0.4298747         1986     1980
## 1090        14.909309         4.465100        0.4975000         1987     1980
## 1091        12.395328         3.943518        0.4403449         1987     1980
## 1092        17.375090         4.241504        0.4372967         1977     1970
## 1093        16.192591         4.231165        0.4709053         1987     1980
## 1094        10.700975         4.079598        0.4505631         1983     1980
## 1095        11.890483         4.136437        0.3854100         1986     1980
## 1096        13.753566         4.357000        0.4653000         1988     1980
## 1097        15.952535         3.975025        0.3944867         1976     1970
## 1098        15.041829         3.787500        0.3436000         1985     1980
## 1099        14.185700         4.313779        0.4864408         1967     1960
## 1100        11.975526         3.937143        0.4139790         1962     1960
## 1101        11.635318         4.130205        0.4226360         1980     1980
## 1102        13.326161         4.019742        0.3851514         1981     1980
## 1103        10.494113         4.085538        0.4433129         1982     1980
## 1104        21.744172         4.426524        0.4134085         1982     1980
## 1105        10.964035         4.356798        0.4770763         1982     1980
## 1106        16.912597         4.040196        0.4440605         1982     1980
## 1107        15.016911         4.235385        0.4699900         1982     1980
## 1108        12.273038         4.142613        0.4812488         1982     1980
## 1109        15.642055         4.421912        0.4316680         1983     1980
## 1110        15.554700         4.348474        0.5074512         1980     1980
## 1111        18.057384         4.488036        0.5035686         1980     1980
## 1112        15.646009         4.141561        0.4368521         1981     1980
## 1113         9.845959         4.309800        0.4814000         1980     1980
## 1114        15.582535         4.203328        0.4305150         1977     1970
## 1115        10.537214         3.979938        0.4169723         1957     1950
## 1116        14.949717         4.190327        0.4609447         1989     1980
## 1117        16.070849         4.516454        0.4823489         1980     1980
## 1118        11.337425         4.290395        0.4543191         1979     1970
## 1119        17.766476         4.001000        0.4042000         1980     1980
## 1120        12.816214         4.393588        0.5454183         1980     1980
## 1121        13.959378         3.992400        0.4393000         1980     1980
## 1122        12.771286         4.043100        0.4362000         1984     1980
## 1123        12.015472         4.165649        0.4609642         1952     1950
## 1124        17.652984         4.363873        0.4929319         1981     1980
## 1125        20.565442         4.449039        0.4764843         1970     1970
## 1126        15.559781         4.346001        0.4614390         1980     1980
## 1127         7.516078         4.003868        0.4192196         1981     1980
## 1128        17.938989         4.271782        0.4774301         1965     1960
## 1129        17.802691         4.160743        0.4433346         1972     1970
## 1130        21.667271         4.274900        0.4259000         1979     1970
## 1131        14.853825         4.074097        0.4346843         1959     1950
## 1132        15.310594         4.181067        0.4540257         1980     1980
## 1133        13.062157         4.128516        0.4294864         1978     1970
## 1134        13.742104         4.025338        0.4397728         1979     1970
## 1135        10.688456         3.954466        0.4168778         1978     1970
## 1136        14.111504         3.847800        0.3398000         1965     1960
## 1137        13.261433         4.469800        0.4883000         1981     1980
## 1138        12.496118         4.086300        0.4188000         1976     1970
## 1139        25.239682         4.271628        0.4539168         1979     1970
## 1140        17.465943         4.299590        0.4547233         1979     1970
## 1141        10.350373         4.089522        0.4481465         1959     1950
## 1142        21.523106         4.149738        0.4248223         1980     1980
## 1143        16.203741         4.073381        0.4283431         1980     1980
## 1144        14.251229         4.271924        0.4412842         1979     1970
## 1145        15.350126         3.892143        0.4262484         1978     1970
## 1146        13.300607         4.379264        0.4461171         1978     1970
## 1147        13.737846         4.197313        0.4476446         1978     1970
## 1148        13.956022         4.220900        0.4757000         1977     1970
## 1149        20.526923         4.357832        0.4650501         1978     1970
## 1150        17.391369         4.262776        0.4584512         1978     1970
## 1151         9.147396         4.203426        0.4439257         1963     1960
## 1152        18.447170         3.766413        0.4122485         1958     1950
## 1153        16.968282         4.231528        0.4571943         1958     1950
## 1154        13.475534         4.414559        0.4741469         1986     1980
## 1155        12.009995         4.113960        0.4318979         1977     1970
## 1156        12.046174         4.177007        0.4408952         1977     1970
## 1157        15.306192         4.069296        0.4456437         1976     1970
## 1158        14.625374         3.971627        0.3874525         1974     1970
## 1159        13.297226         3.992200        0.4294000         1976     1970
## 1160        10.490893         3.936000        0.4369000         1976     1970
## 1161        11.056972         4.138807        0.4431409         1976     1970
## 1162        10.394383         4.475608        0.4973286         1975     1970
## 1163        38.349166         4.338667        0.4758058         1977     1970
## 1164        11.600781         4.210759        0.4524386         1954     1950
## 1165        14.418211         4.280584        0.4855091         1976     1970
## 1166        14.170416         4.094078        0.4431439         1978     1970
## 1167        13.138097         4.083040        0.4059062         1976     1970
## 1168        17.432035         4.175800        0.4540000         1976     1970
## 1169        29.496591         4.315900        0.4432000         1978     1970
## 1170        14.290278         4.306644        0.4693958         1977     1970
## 1171         7.649805         3.954500        0.3760000         1976     1970
## 1172         9.584997         4.266234        0.4706881         1978     1970
## 1173        11.111269         4.158157        0.4363535         1956     1950
## 1174        15.661203         4.349601        0.4714869         1975     1970
## 1175        34.259620         4.384600        0.4153000         1974     1970
## 1176        13.719947         4.326137        0.4735282         1976     1970
## 1177         8.605947         3.943700        0.4380000         1975     1970
## 1178        14.886365         4.308047        0.4639194         1976     1970
## 1179        13.649453         4.260095        0.4777986         1975     1970
## 1180        17.027858         4.007839        0.4352742         1976     1970
## 1181        16.424230         4.263858        0.4420540         1976     1970
## 1182        16.585416         4.425045        0.4935486         1976     1970
## 1183        22.554490         4.120100        0.4387000         1976     1970
## 1184        11.378542         4.149211        0.4649018         1957     1950
## 1185         8.841468         4.334400        0.5034000         1975     1970
## 1186        21.100515         4.420973        0.4552379         1977     1970
## 1187        18.889382         4.507725        0.4952065         1976     1970
## 1188        23.169243         4.265473        0.4538213         1957     1950
## 1189         8.811102         4.105359        0.4035617         1975     1970
## 1190        18.419687         4.064900        0.4166000         1964     1960
## 1191        12.894193         4.385471        0.4765990         1964     1960
## 1192        14.031116         4.636500        0.5051000         1976     1970
## 1193        15.832224         4.175240        0.4882615         1975     1970
## 1194        13.711783         4.016183        0.4620497         1978     1970
## 1195        20.279940         4.078678        0.5135438         1978     1970
## 1196        25.520948         4.203760        0.4014866         1978     1970
## 1197        13.294269         4.083184        0.4727142         1974     1970
## 1198        13.422039         4.290328        0.4578935         1961     1960
## 1199        16.415414         4.088050        0.4564620         1972     1970
## 1200        14.314919         4.221900        0.4353000         1974     1970
## 1201        21.094936         4.230100        0.4309000         1975     1970
## 1202        12.269087         4.027000        0.4328000         1974     1970
## 1203        14.805068         4.153095        0.4291161         1960     1960
## 1204         8.685251         4.074160        0.4312446         1955     1950
## 1205        14.017970         4.282500        0.4907000         1975     1970
## 1206        11.703898         4.239629        0.4657483         1962     1960
## 1207        12.323266         4.002171        0.4577900         1975     1970
## 1208        12.600781         3.572763        0.3761002         1961     1960
## 1209        16.447798         4.210300        0.4992778         1987     1980
## 1210        13.958315         4.137600        0.4424062         1963     1960
## 1211        10.880922         4.106144        0.4384367         1962     1960
## 1212        15.761555         4.418511        0.4824911         1955     1950
## 1213        20.880190         4.350070        0.4530598         1972     1970
## 1214        14.088611         4.361673        0.5058908         1963     1960
## 1215        12.611626         4.126952        0.4694198         1967     1960
## 1216        17.822010         3.949202        0.4226666         1970     1970
## 1217         9.439352         4.099264        0.4342844         1973     1970
## 1218        17.226655         4.375579        0.5098297         1953     1950
## 1219         9.865397         4.122400        0.4296000         1974     1970
## 1220        17.070800         4.194863        0.4521671         1963     1960
## 1221        10.701868         4.025909        0.4044072         1981     1980
## 1222        10.512508         4.255700        0.4643000         1983     1980
## 1223        10.789902         4.072100        0.4329000         1980     1980
## 1224        11.048315         4.063778        0.4160189         1960     1960
## 1225        19.291813         4.357097        0.4251755         1983     1980
## 1226        13.476180         4.229400        0.4275000         1979     1970
## 1227        11.318465         4.185000        0.4729000         1983     1980
## 1228        13.076177         4.243121        0.5052117         1984     1980
## 1229        17.351017         4.162793        0.4720103         1983     1980
## 1230        16.673175         4.172596        0.4459231         1982     1980
## 1231        24.560309         4.517732        0.4537481         1982     1980
## 1232        15.427566         4.527495        0.5102027         1986     1980
## 1233        26.809284         3.879573        0.4226886         1955     1950
## 1234        11.178119         4.219912        0.4645795         1986     1980
## 1235        14.265333         4.279991        0.4538968         1987     1980
## 1236        16.559463         4.295016        0.4627342         1983     1980
## 1237         9.076915         4.342509        0.5127010         1987     1980
## 1238        17.310971         4.405200        0.4871000         1987     1980
## 1239        17.151211         4.074800        0.4446000         1987     1980
## 1240        13.265119         4.162600        0.4656000         1988     1980
## 1241        23.523551         4.415611        0.4748911         1987     1980
## 1242        10.360834         4.148700        0.4676000         1987     1980
## 1243        17.685952         4.405655        0.4545923         1988     1980
## 1244         9.449682         4.312938        0.4990663         1988     1980
## 1245        17.772380         4.485390        0.4972251         1986     1980
## 1246        10.888241         4.005544        0.4023657         1988     1980
## 1247        15.767153         4.404816        0.4561911         1988     1980
## 1248        12.051190         4.333397        0.4754474         1988     1980
## 1249        20.207960         4.204236        0.4116084         1988     1980
## 1250        15.939163         4.031300        0.3520000         1986     1980
## 1251        25.223671         4.350516        0.4339901         1988     1980
## 1252        13.519821         4.202166        0.4616296         1960     1960
## 1253        14.745323         4.445500        0.4835000         1987     1980
## 1254        12.577935         4.270453        0.4698994         1988     1980
## 1255        11.877488         3.876541        0.3827392         1989     1980
## 1256         8.327828         3.957608        0.4683154         1985     1980
## 1257        12.152390         4.110398        0.4434398         1954     1950
## 1258        12.026476         4.228597        0.4640647         1975     1970
## 1259        16.428332         4.471897        0.4799619         1983     1980
## 1260        29.062591         4.396529        0.4631490         1974     1970
## 1261        14.256298         4.359100        0.4677000         1985     1980
## 1262        11.452474         4.375200        0.4681000         1988     1980
## 1263        25.463004         4.409770        0.4863122         1988     1980
## 1264        14.389524         4.181300        0.4691000         1987     1980
## 1265        23.101759         4.107812        0.4384949         1987     1980
## 1266        14.296377         4.379378        0.5054192         1988     1980
## 1267        15.034672         4.317600        0.4659000         1985     1980
## 1268        12.866213         4.238200        0.4473000         1988     1980
## 1269        28.318012         4.077600        0.3846000         1989     1980
## 1270        11.094912         4.086244        0.4058445         1989     1980
## 1271        11.425370         4.043760        0.4323581         1989     1980
## 1272        13.225890         3.770915        0.3687747         1989     1980
## 1273        21.092697         4.300500        0.4402000         1989     1980
## 1274        33.200919         4.410656        0.4327865         1989     1980
## 1275        18.014391         4.257750        0.4890489         1983     1980
## 1276        21.392426         4.160023        0.4505499         1958     1950
## 1277        19.701125         4.276181        0.4714946         1964     1960
## 1278        12.745726         4.083500        0.4172000         1983     1980
## 1279        13.204676         4.009807        0.3953697         1970     1970
## 1280        12.672734         4.137800        0.4226000         1982     1980
## 1281        13.134040         3.884209        0.3561377         1950     1950
## 1282        23.276031         4.031674        0.3952168         1964     1960
## 1283        17.820712         4.455000        0.4390000         1982     1980
## 1284        12.842165         3.762516        0.3404604         1983     1980
## 1285        12.091151         3.877900        0.3359000         1975     1970
## 1286        17.555625         3.835218        0.3680432         1981     1980
## 1287        12.686631         3.938611        0.3793550         1985     1980
## 1288        13.371424         3.807200        0.4034000         1985     1980
## 1289        10.469258         4.094130        0.4107448         1987     1980
## 1290        17.004906         4.153326        0.4445427         1987     1980
## 1291        17.624110         4.090412        0.4283461         1987     1980
## 1292        18.384617         3.984858        0.3838432         1952     1950
## 1293        18.005609         4.001011        0.4564829         1983     1980
## 1294        18.973944         4.015891        0.4014249         1965     1960
## 1295        17.293140         4.385832        0.4737149         1961     1960
## 1296        24.702280         3.950892        0.3459345         1980     1980
## 1297         8.381802         3.892965        0.3417822         1978     1970
## 1298        14.482593         4.307600        0.4865000         1980     1980
## 1299        18.800853         4.076077        0.4673632         1950     1950
## 1300        19.253756         4.084789        0.3908069         1977     1970
## 1301        22.574969         4.108200        0.3787000         1977     1970
## 1302        12.576121         3.930850        0.3618822         1964     1960
## 1303        31.099362         4.213708        0.4305773         1958     1950
## 1304        18.074560         3.947015        0.3913406         1967     1960
## 1305        17.232125         4.266895        0.4590799         1968     1960
## 1306        12.470780         4.252307        0.4336803         1977     1970
## 1307        12.626571         4.106200        0.4019000         1974     1970
## 1308        11.732026         4.124200        0.4165000         1974     1970
## 1309         9.971655         4.169283        0.4361425         1962     1960
## 1310        15.982993         4.155173        0.4100468         1970     1970
## 1311        21.529254         3.960163        0.3520092         1968     1960
## 1312        17.903280         4.283071        0.4350730         1970     1970
## 1313        12.452766         4.025419        0.3922258         1955     1950
## 1314        13.398313         3.753216        0.3715942         1967     1960
## 1315        15.709286         3.994130        0.3456153         1959     1950
## 1316        13.696185         3.853938        0.3331905         1971     1970
## 1317        20.588361         4.163943        0.3702760         1974     1970
## 1318        18.180119         4.169057        0.4257130         1965     1960
## 1319        18.519087         4.156697        0.4330642         1963     1960
## 1320        11.722440         4.153930        0.4780198         1975     1970
## 1321         9.388052         3.950329        0.3109783         1969     1960
## 1322        18.790264         4.117265        0.4061900         1968     1960
## 1323        18.750244         4.493604        0.4673779         1971     1970
## 1324        17.355597         4.210481        0.4701601         1971     1970
## 1325        17.442771         4.074307        0.4046000         1971     1970
## 1326        22.383476         3.980484        0.3640762         1967     1960
## 1327        19.807503         4.086583        0.3861781         1965     1960
## 1328        22.329746         3.878000        0.3349000         1954     1950
## 1329        16.587216         4.391397        0.4494543         1956     1950
## 1330        13.391863         3.930397        0.3464723         1969     1960
## 1331        18.060425         4.351934        0.4592382         1968     1960
## 1332        13.664024         4.034059        0.3892439         1966     1960
## 1333        19.732489         4.085135        0.3634519         1968     1960
## 1334        13.311049         4.348344        0.4567492         1966     1960
## 1335        11.388403         4.021388        0.4152115         1973     1970
## 1336        11.194325         3.963780        0.3798342         1972     1970
## 1337        11.972300         3.914969        0.3332868         1974     1970
## 1338        15.661485         4.062814        0.4021382         1952     1950
## 1339        17.315205         3.993746        0.4089085         1974     1970
## 1340        17.653907         4.263471        0.4627456         1966     1960
## 1341        18.486292         3.991251        0.3802835         1967     1960
## 1342        11.894400         3.920757        0.3533761         1962     1960
## 1343        12.720829         3.937653        0.3594247         1972     1970
## 1344        33.257271         4.166291        0.4416878         1960     1960
## 1345        10.442189         4.159158        0.4115850         1982     1980
## 1346        12.297790         4.380836        0.4328631         1987     1980
## 1347        12.828911         3.997322        0.3872636         1980     1980
## 1348        18.083298         4.038848        0.3910987         1974     1970
## 1349        17.243789         4.334495        0.4471644         1989     1980
## 1350        13.590577         4.369374        0.4997517         1988     1980
## 1351        13.254449         4.245701        0.4824866         1988     1980
## 1352        11.602382         4.480776        0.5169380         1985     1980
## 1353        14.818164         4.319193        0.4779414         1965     1960
## 1354        25.644852         4.460555        0.4795271         1975     1970
## 1355        17.364273         4.316339        0.4810327         1985     1980
## 1356         9.465371         4.140535        0.4440728         1982     1980
## 1357        14.964992         4.301938        0.4805795         1970     1970
## 1358        11.713126         4.047143        0.4570959         1962     1960
## 1359        18.838395         4.234561        0.4665914         1964     1960
## 1360        18.135333         4.381626        0.4440377         1966     1960
## 1361        15.690594         4.257000        0.4434000         1979     1970
## 1362        18.586907         4.307560        0.4760982         1968     1960
## 1363        26.744218         4.297115        0.4554241         1954     1950
## 1364        22.665276         4.393047        0.4760439         1957     1950
## 1365        15.000445         4.136698        0.4333910         1977     1970
## 1366        11.029491         3.853393        0.4223379         1975     1970
## 1367        15.763294         4.249611        0.4625028         1954     1950
## 1368        14.551807         4.043575        0.4120031         1974     1970
## 1369        12.527728         4.009276        0.4547110         1958     1950
## 1370        23.520512         4.336569        0.4550621         1953     1950
## 1371        24.192817         4.437306        0.4650992         1953     1950
## 1372        15.521298         4.170533        0.4189175         1958     1950
## 1373        22.974677         4.222132        0.4318357         1968     1960
## 1374        20.362907         4.089344        0.4195872         1968     1960
## 1375        16.531877         4.362982        0.4525052         1974     1970
## 1376         7.598262         3.973390        0.4225614         1974     1970
## 1377        12.531097         4.105400        0.4435000         1976     1970
## 1378        18.995474         4.021241        0.3689235         1964     1960
## 1379        22.659287         4.371442        0.4858473         1955     1950
## 1380        12.055421         4.081373        0.3999900         1971     1970
## 1381        10.895927         4.368389        0.5085558         1971     1970
## 1382        12.912398         4.308243        0.4837321         1962     1960
## 1383         9.852389         4.092400        0.4177000         1965     1960
## 1384        27.986240         4.546281        0.4610966         1953     1950
## 1385        22.058339         4.283877        0.4449321         1962     1960
## 1386        13.131647         4.309995        0.4613196         1963     1960
## 1387        17.069495         4.320639        0.4765938         1955     1950
## 1388        10.900656         4.160678        0.4836440         1975     1970
## 1389        19.289102         4.221687        0.4174341         1974     1970
## 1390        11.490312         4.249121        0.4554341         1982     1980
## 1391        13.728166         4.198276        0.4673997         1976     1970
## 1392        13.139782         4.083959        0.4353738         1980     1980
## 1393        13.383449         4.212549        0.4345166         1978     1970
## 1394        12.883032         4.032553        0.4446053         1977     1970
## 1395        12.367227         4.281634        0.4945186         1976     1970
## 1396        13.108427         4.159214        0.4203804         1981     1980
## 1397        15.383395         4.022389        0.4293779         1957     1950
## 1398        23.139927         4.331963        0.4432107         1981     1980
## 1399        16.281853         4.120144        0.4340458         1981     1980
## 1400        27.315509         4.560442        0.4949129         1959     1950
## 1401        18.642014         3.980055        0.4248882         1967     1960
## 1402         9.065563         3.909185        0.4618939         1968     1960
## 1403        11.352427         4.300388        0.4862394         1982     1980
## 1404        20.330095         4.231121        0.4381625         1966     1960
## 1405        19.854715         4.170963        0.4173190         1956     1950
## 1406        19.868867         3.977371        0.4009477         1966     1960
## 1407        10.225859         4.146422        0.4544277         1950     1950
## 1408        10.611065         4.367022        0.4792474         1971     1970
## 1409        22.943994         4.504667        0.4957531         1962     1960
## 1410        27.260500         4.450122        0.5116448         1956     1950
## 1411        12.100580         4.062085        0.4705267         1977     1970
## 1412         9.553023         4.374615        0.5029784         1957     1950
## 1413         8.974463         4.116397        0.4478602         1967     1960
## 1414        14.296719         4.465944        0.5024804         1964     1960
## 1415        13.761454         4.031694        0.4511970         1959     1950
## 1416        11.820971         4.072510        0.4253343         1979     1970
## 1417        16.140566         4.026493        0.4169408         1967     1960
## 1418        17.699693         4.102600        0.4732000         1958     1950
## 1419        14.877103         4.232238        0.4889023         1955     1950
## 1420        11.672966         4.358627        0.5070317         1975     1970
## 1421        19.328697         4.355596        0.4420368         1978     1970
## 1422        10.801769         4.202237        0.4693310         1974     1970
## 1423        11.361427         4.408948        0.4620959         1976     1970
## 1424        10.252781         4.262597        0.4675908         1963     1960
## 1425        12.830311         4.372400        0.4498000         1966     1960
## 1426        16.097799         4.351967        0.4430431         1956     1950
## 1427        15.540842         4.170032        0.4498871         1970     1970
## 1428        11.591825         4.073682        0.4500301         1970     1970
## 1429        12.482923         4.282090        0.4668693         1979     1970
## 1430        15.691120         4.256659        0.4524828         1963     1960
## 1431        17.902832         4.232351        0.4738625         1973     1970
## 1432        18.017153         4.086100        0.4534000         1975     1970
## 1433         9.721336         4.052673        0.4345329         1965     1960
## 1434         9.248487         4.063810        0.4623275         1979     1970
## 1435        14.964889         4.325482        0.4606140         1965     1960
## 1436        16.296713         4.524696        0.4566739         1968     1960
## 1437        12.592327         4.151600        0.4400000         1973     1970
## 1438        14.849389         4.254383        0.4547588         1982     1980
## 1439        10.866652         4.361328        0.4698349         1969     1960
## 1440        12.168330         4.252494        0.4486347         1956     1950
## 1441        17.077186         4.277900        0.5035000         1968     1960
## 1442         9.614832         4.018394        0.4206193         1952     1950
## 1443        10.382252         3.883762        0.4116620         1967     1960
## 1444        12.440378         3.942389        0.3966818         1969     1960
## 1445        14.418544         4.326095        0.4803359         1951     1950
## 1446        14.055939         4.295481        0.4555535         1973     1970
## 1447        15.074659         4.229317        0.4415439         1956     1950
## 1448        11.057485         4.290437        0.4781824         1966     1960
## 1449        15.457315         4.549982        0.5259306         1966     1960
## 1450        12.275906         4.172471        0.4511142         1959     1950
## 1451        10.217519         4.219105        0.4515244         1979     1970
## 1452         9.291292         4.242421        0.4699602         1979     1970
## 1453        29.131210         4.077069        0.4290545         1956     1950
## 1454        12.171542         4.014785        0.4219399         1951     1950
## 1455        18.587717         4.165139        0.4555892         1968     1960
## 1456         9.116633         4.145028        0.4370684         1974     1970
## 1457        15.446590         4.159184        0.4224123         1960     1960
## 1458        22.804924         4.309628        0.4638162         1961     1960
## 1459        10.696269         4.222660        0.5083336         1957     1950
## 1460        15.825355         4.266967        0.4679078         1972     1970
## 1461        14.016969         4.195492        0.4446890         1973     1970
## 1462        16.744346         4.197956        0.4979247         1966     1960
## 1463        11.579765         4.359640        0.4814878         1970     1970
## 1464        13.355532         4.264787        0.4659228         1978     1970
## 1465        14.736873         4.229159        0.4773224         1960     1960
## 1466        19.035053         4.233276        0.4491723         1958     1950
## 1467         7.904576         4.198866        0.4505918         1980     1980
## 1468        11.974493         3.780197        0.4114481         1980     1980
## 1469        10.232129         4.196118        0.4587574         1954     1950
## 1470        19.635530         4.123802        0.4360349         1968     1960
## 1471        14.385538         4.005361        0.3917865         1955     1950
## 1472        15.665651         4.222650        0.4634549         1962     1960
## 1473        13.747922         4.425819        0.5000614         1970     1970
## 1474        13.668264         4.263824        0.4683758         1964     1960
## 1475        13.311611         4.124300        0.4145000         1969     1960
## 1476        13.263724         4.141376        0.4446459         1955     1950
## 1477        16.188518         4.417113        0.4572501         1958     1950
## 1478         7.504055         4.280168        0.4319972         1957     1950
## 1479        12.228789         4.015811        0.4302733         1974     1970
## 1480        13.206410         4.216477        0.4568827         1969     1960
## 1481        10.930216         4.070308        0.4163448         1957     1950
## 1482        13.999941         4.111132        0.4412499         1979     1970
## 1483        16.166574         4.132040        0.4554041         1967     1960
## 1484        13.297712         4.289182        0.4997453         1973     1970
## 1485        13.526867         4.099838        0.4511683         1968     1960
## 1486        14.615157         4.149523        0.4232405         1968     1960
## 1487        15.094555         4.130432        0.4397451         1967     1960
## 1488        13.742251         4.076400        0.3822000         1981     1980
## 1489        11.007674         3.967297        0.4497955         1954     1950
## 1490        10.449825         4.403171        0.4813011         1960     1960
## 1491        12.042821         4.236141        0.4707392         1960     1960
## 1492        13.325743         4.424722        0.4840302         1978     1970
## 1493        21.662591         4.377497        0.4740046         1977     1970
## 1494        17.343130         3.920169        0.4387801         1981     1980
## 1495        38.759034         4.337442        0.4256035         1969     1960
## 1496        18.545464         4.137800        0.4495000         1976     1970
## 1497         7.264926         4.028060        0.4076471         1956     1950
## 1498        14.091696         4.012594        0.4132007         1959     1950
## 1499        15.382845         4.356390        0.4714700         1962     1960
## 1500        10.585578         3.932904        0.4336898         1970     1970
## 1501        16.282826         4.098294        0.4536871         1978     1970
## 1502        13.609008         4.175173        0.4995364         1964     1960
## 1503        16.605269         4.346596        0.4614304         1974     1970
## 1504        13.828757         3.963479        0.4160799         1967     1960
## 1505        10.232642         3.917709        0.4173811         1978     1970
## 1506        11.086862         4.028469        0.4323186         1970     1970
## 1507        20.714003         4.386631        0.4968981         1957     1950
## 1508        11.238236         4.097114        0.4594968         1957     1950
## 1509        13.831410         4.162780        0.4556618         1962     1960
## 1510        10.552681         3.963312        0.4414033         1952     1950
## 1511        10.634374         4.022618        0.4282320         1980     1980
## 1512        15.642649         4.180999        0.4499083         1970     1970
## 1513        16.565543         4.161322        0.4609600         1970     1970
## 1514        14.638325         4.150015        0.4599266         1969     1960
## 1515         8.986382         4.179594        0.4791465         1975     1970
## 1516         7.934018         4.343360        0.4629476         1978     1970
## 1517        11.855326         3.965233        0.4227049         1966     1960
## 1518        10.998526         4.058364        0.4417580         1966     1960
## 1519        12.150468         4.215360        0.4643246         1971     1970
## 1520        13.533275         4.205493        0.4757390         1965     1960
## 1521        14.529521         4.236215        0.4442610         1978     1970
## 1522        13.922965         4.154022        0.4467444         1971     1970
## 1523        10.222025         4.015941        0.4694355         1968     1960
## 1524        11.299212         4.005995        0.4257368         1980     1980
## 1525        10.769162         4.155623        0.4443060         1971     1970
## 1526        12.542463         4.192802        0.4829449         1979     1970
## 1527        12.012594         4.391869        0.4963859         1968     1960
## 1528        10.768115         4.320283        0.4929935         1968     1960
## 1529        12.988446         4.205341        0.4771818         1967     1960
## 1530        13.845828         4.016186        0.4548086         1981     1980
## 1531        14.137221         4.032188        0.4485867         1979     1970
## 1532        10.524323         3.980001        0.4170350         1968     1960
## 1533        16.721025         4.055424        0.4571499         1967     1960
## 1534        17.546165         4.238182        0.4759489         1978     1970
## 1535        16.047707         4.441789        0.5165150         1979     1970
## 1536        14.402728         4.311567        0.4935488         1970     1970
## 1537        12.304801         4.257772        0.4583109         1975     1970
## 1538        10.672400         4.015584        0.3928375         1964     1960
## 1539        12.089229         3.968489        0.4370406         1977     1970
## 1540        10.740743         4.237628        0.4716556         1982     1980
## 1541        16.338642         4.203238        0.4549604         1954     1950
## 1542        18.646950         4.171121        0.4250435         1968     1960
## 1543        13.566839         4.054000        0.4714000         1958     1950
## 1544        17.920227         4.242182        0.4401657         1953     1950
## 1545        22.813738         4.434206        0.5011388         1978     1970
## 1546        11.869811         3.928219        0.4184855         1970     1970
## 1547        13.104316         3.832900        0.3921000         1961     1960
## 1548        15.522861         3.919114        0.3862535         1959     1950
## 1549         8.445717         4.324989        0.4910286         1972     1970
## 1550        10.200252         4.197282        0.4802956         1970     1970
## 1551         9.508322         3.807829        0.4482326         1964     1960
## 1552        17.545988         4.010091        0.4240634         1964     1960
## 1553        16.544839         4.065236        0.4392359         1966     1960
## 1554        13.226849         4.095472        0.4927921         1965     1960
## 1555        16.856697         4.227832        0.4430467         1964     1960
## 1556        21.550870         4.472208        0.4958952         1975     1970
## 1557         9.121431         4.048394        0.4433408         1960     1960
## 1558        15.256297         4.169900        0.4266000         1964     1960
## 1559         7.028456         4.077713        0.4676927         1974     1970
## 1560         8.548651         4.050033        0.4752480         1960     1960
## 1561        29.217103         4.435750        0.4772859         1978     1970
## 1562        26.552019         4.416841        0.4451337         1979     1970
## 1563        12.288673         4.139980        0.4458388         1973     1970
## 1564        20.700745         4.317370        0.4462086         1964     1960
## 1565        14.198507         4.185056        0.4310408         1961     1960
## 1566        12.988512         4.030987        0.3920097         1973     1970
## 1567         9.075972         4.098912        0.4329915         1972     1970
## 1568        17.247411         4.153659        0.4764570         1974     1970
## 1569        15.904399         4.198385        0.4328973         1957     1950
## 1570        15.109631         4.120334        0.4637354         1967     1960
## 1571        13.169626         4.113200        0.4740000         1976     1970
## 1572         9.923075         4.131011        0.4484151         1979     1970
## 1573        13.353446         4.307673        0.4753808         1967     1960
## 1574        11.212818         4.159875        0.4732646         1981     1980
## 1575        18.759514         4.292086        0.3870699         1963     1960
## 1576        17.825718         4.260193        0.4485671         1975     1970
## 1577        13.689079         4.237443        0.4591117         1979     1970
## 1578        14.163689         4.321713        0.4594219         1974     1970
## 1579        19.727051         4.259802        0.4422141         1962     1960
## 1580        17.554658         4.349238        0.4403247         1967     1960
## 1581        13.224790         4.030094        0.4340429         1977     1970
## 1582        19.711427         4.375596        0.4745068         1958     1950
## 1583         7.638678         4.182000        0.4497000         1978     1970
## 1584        16.819765         3.988194        0.4415023         1954     1950
## 1585        16.714603         4.241775        0.4888784         1967     1960
## 1586        14.088558         4.276889        0.4514383         1957     1950
## 1587         8.896756         4.150470        0.4881346         1950     1950
## 1588        14.040303         4.418282        0.4741641         1974     1970
## 1589        16.775933         4.129941        0.3980261         1973     1970
## 1590        15.976878         4.441379        0.5048638         1959     1950
## 1591        11.897692         3.928323        0.3713153         1975     1970
## 1592         9.878575         4.208822        0.4772795         1966     1960
## 1593        12.634450         3.962307        0.4401063         1958     1950
## 1594        14.474278         4.227825        0.4749945         1965     1960
## 1595        18.290345         4.181867        0.4395376         1966     1960
## 1596        19.065399         4.303157        0.4430798         1965     1960
## 1597        11.931451         4.273740        0.4796945         1979     1970
## 1598        14.144242         3.994652        0.4326946         1973     1970
## 1599        14.180428         4.341379        0.4517534         1963     1960
## 1600       144.066667         4.462900        0.4245000         1968     1960
## 1601         9.575308         4.099336        0.4316955         1976     1970
## 1602        17.105945         4.500103        0.4821269         1966     1960
## 1603        18.101574         4.365517        0.4782974         1977     1970
## 1604        12.701426         4.277693        0.4451246         1955     1950
## 1605        15.163033         4.313649        0.4969409         1970     1970
## 1606        12.997742         4.133036        0.4534068         1956     1950
## 1607        16.246537         4.057749        0.4401499         1979     1970
## 1608        16.199669         4.470053        0.4550878         1956     1950
## 1609        21.239675         3.959801        0.4421133         1973     1970
## 1610        15.028353         4.288551        0.5019312         1954     1950
## 1611        16.280756         4.483181        0.4376106         1957     1950
## 1612        11.097166         4.449595        0.4790926         1952     1950
## 1613        16.744591         4.067709        0.4139424         1981     1980
## 1614        13.386431         4.241300        0.4958000         1981     1980
## 1615        13.515012         4.406737        0.4864890         1980     1980
## 1616         8.825180         3.928300        0.4084000         1981     1980
## 1617        14.194020         4.375857        0.4628916         1981     1980
## 1618         7.732514         4.103959        0.4378247         1981     1980
## 1619        11.062286         4.325927        0.4702476         1980     1980
## 1620        18.585362         4.224500        0.4727000         1981     1980
## 1621        11.236190         3.955800        0.4213000         1981     1980
## 1622        16.651080         4.180904        0.4759518         1980     1980
## 1623        10.735615         3.838800        0.3647000         1980     1980
## 1624        11.427645         4.187735        0.4529496         1980     1980
## 1625        10.799482         4.079300        0.4561000         1981     1980
## 1626        15.567278         4.001323        0.4202559         1980     1980
## 1627        12.974475         3.817887        0.3917848         1972     1970
## 1628        11.962308         3.940484        0.4245848         1981     1980
## 1629        14.830927         4.107400        0.4435000         1981     1980
## 1630         9.333949         4.127500        0.4008000         1980     1980
## 1631        18.528093         4.374319        0.4850815         1981     1980
## 1632        14.650041         4.268634        0.4597471         1979     1970
## 1633        11.403013         4.150039        0.4717092         1972     1970
## 1634        15.876442         4.417403        0.4940809         1960     1960
## 1635         7.800460         4.298679        0.4823607         1978     1970
## 1636        12.714229         4.010900        0.4113418         1969     1960
## 1637        14.579604         4.268077        0.4914015         1984     1980
## 1638        13.621559         4.086000        0.4559000         1982     1980
## 1639        22.618040         4.386861        0.4751357         1982     1980
## 1640        10.474984         4.075727        0.4425319         1980     1980
## 1641        15.966700         4.484682        0.4669201         1982     1980
## 1642        13.632707         4.031841        0.4412874         1980     1980
## 1643        12.945435         4.230672        0.4729548         1982     1980
## 1644        32.123591         4.409647        0.4963355         1982     1980
## 1645        22.185740         4.359603        0.4562391         1982     1980
## 1646        13.115241         3.902447        0.4149738         1982     1980
## 1647        11.497886         4.025200        0.4143000         1982     1980
## 1648        16.087905         4.099059        0.4581649         1960     1960
## 1649        15.404640         4.168354        0.4619405         1956     1950
## 1650        21.496897         4.256499        0.4728308         1957     1950
## 1651        19.675260         4.237482        0.4298186         1961     1960
## 1652        16.403653         4.071842        0.4539142         1961     1960
## 1653         9.892419         4.064063        0.4500642         1979     1970
## 1654         8.304373         4.085956        0.3535626         1978     1970
## 1655        19.171799         4.422556        0.4658474         1964     1960
## 1656        14.806769         4.373148        0.4626565         1956     1950
## 1657        15.010435         4.198435        0.4533447         1968     1960
## 1658        10.719456         4.377832        0.4661464         1970     1970
## 1659        14.187411         4.206603        0.4319790         1955     1950
## 1660        10.329040         3.966382        0.4169202         1966     1960
## 1661        14.973035         4.138938        0.4391886         1980     1980
## 1662        13.451964         4.415636        0.4820326         1978     1970
## 1663        19.853525         4.298790        0.4671223         1968     1960
## 1664        13.285880         4.312679        0.4352824         1970     1970
## 1665         9.615090         4.175542        0.4523114         1960     1960
## 1666         9.839588         4.399100        0.4589000         1973     1970
## 1667        15.454220         4.163775        0.4489889         1979     1970
## 1668        24.151279         4.451596        0.4969495         1974     1970
## 1669        13.743450         4.375487        0.4997045         1955     1950
## 1670        10.071259         3.813700        0.3859000         1970     1970
## 1671        11.464630         4.097466        0.4462991         1960     1960
## 1672        17.142984         4.349978        0.4900924         1982     1980
## 1673        16.468788         4.176367        0.4678904         1962     1960
## 1674        31.619837         4.554752        0.4600048         1965     1960
## 1675        14.445068         4.347849        0.4491818         1953     1950
## 1676        25.658732         4.367000        0.4562000         1974     1970
## 1677        10.895780         4.177298        0.4671627         1976     1970
## 1678         9.255876         4.247085        0.5016046         1977     1970
## 1679        20.134684         4.348560        0.4583578         1955     1950
## 1680        17.064217         4.726330        0.3964077         1968     1960
## 1681        14.321851         4.022635        0.4112983         1952     1950
## 1682        12.455226         4.366544        0.4997861         1975     1970
## 1683        17.269047         4.267682        0.4089668         1979     1970
## 1684        10.935371         4.175001        0.4655957         1980     1980
## 1685        17.493724         4.059216        0.4149436         1963     1960
## 1686        21.686723         4.253073        0.4195647         1962     1960
## 1687        14.430641         4.278949        0.4584531         1964     1960
## 1688        23.048142         3.819300        0.4170000         1962     1960
## 1689        34.592783         4.448998        0.4562107         1981     1980
## 1690        33.884954         4.303096        0.4314312         1981     1980
## 1691        11.358179         4.336586        0.4687840         1964     1960
## 1692        11.724945         4.219493        0.4300697         1971     1970
## 1693        13.228867         4.097507        0.4612350         1958     1950
## 1694        10.864275         4.428406        0.5100111         1983     1980
## 1695        20.956747         4.187503        0.4213764         1981     1980
## 1696        10.592032         4.146261        0.4893222         1963     1960
## 1697        16.548082         4.220700        0.4432000         1983     1980
## 1698         9.918938         4.022869        0.4254188         1983     1980
## 1699        14.591960         4.318519        0.4807773         1983     1980
## 1700        10.778959         3.883570        0.4168149         1983     1980
## 1701        17.901144         4.554513        0.4998324         1983     1980
## 1702        14.881704         4.241644        0.4752461         1983     1980
## 1703         9.842612         4.530759        0.5253220         1983     1980
## 1704        12.236303         4.290267        0.4736933         1983     1980
## 1705        17.259047         4.115606        0.4367867         1981     1980
## 1706        12.391657         4.156600        0.4630000         1983     1980
## 1707        19.664393         4.200230        0.4753410         1983     1980
## 1708        13.490819         4.130014        0.4497897         1983     1980
## 1709        16.073055         4.402669        0.4627279         1983     1980
## 1710        11.165794         4.327273        0.4877696         1972     1970
## 1711         9.606240         4.208161        0.4550296         1972     1970
## 1712         9.660109         4.231957        0.5039953         1974     1970
## 1713         8.954722         4.120500        0.4640000         1974     1970
## 1714        11.223303         4.331381        0.4575928         1979     1970
## 1715        12.175657         4.254533        0.4695687         1978     1970
## 1716        12.862637         4.032003        0.4265425         1961     1960
## 1717        18.076746         4.307674        0.4225681         1950     1950
## 1718        18.458785         4.533900        0.4132221         1965     1960
## 1719        13.927883         4.279310        0.4349810         1962     1960
## 1720        17.744188         4.594230        0.5012624         1979     1970
## 1721        16.700840         4.280191        0.4635120         1982     1980
## 1722        20.402224         4.231296        0.4623954         1958     1950
## 1723        18.180767         3.899166        0.4107171         1963     1960
## 1724        16.490958         4.302336        0.4722826         1978     1970
## 1725        12.507171         3.931947        0.4397034         1975     1970
## 1726        37.715728         4.336871        0.4326384         1975     1970
## 1727        15.127594         4.299603        0.4917345         1980     1980
## 1728        12.313554         3.824545        0.4133837         1963     1960
## 1729        11.248793         4.101745        0.4419418         1967     1960
## 1730        12.550116         3.793158        0.4718952         1980     1980
## 1731        11.414360         3.922106        0.4031402         1973     1970
## 1732        16.771465         4.156247        0.4444329         1960     1960
## 1733        12.461969         4.135365        0.4844450         1964     1960
## 1734        11.597072         4.266206        0.5113272         1960     1960
## 1735        11.233087         4.177719        0.4634532         1976     1970
## 1736        20.753984         4.519236        0.4690445         1958     1950
## 1737        11.185074         4.103016        0.4708595         1953     1950
## 1738        16.309068         3.991661        0.3674582         1969     1960
## 1739        20.301700         4.320832        0.4718519         1961     1960
## 1740        15.556742         4.244028        0.4548345         1958     1950
## 1741        11.715495         4.071273        0.4198230         1972     1970
## 1742        23.571750         4.286155        0.4583737         1961     1960
## 1743        12.521352         4.276200        0.4454000         1962     1960
## 1744        23.059953         4.356854        0.4734000         1979     1970
## 1745        14.398351         4.470828        0.4892867         1969     1960
## 1746        13.236708         4.022600        0.4239000         1951     1950
## 1747         9.177621         3.973693        0.4507797         1952     1950
## 1748        12.429965         4.154795        0.4692593         1961     1960
## 1749        15.045379         4.081074        0.4092664         1968     1960
## 1750        15.072726         4.175377        0.4014304         1970     1970
## 1751        11.867880         4.482502        0.5526418         1972     1970
## 1752        11.633385         4.318655        0.5498095         1979     1970
## 1753        15.432973         4.253280        0.4533959         1972     1970
## 1754         9.989284         4.194867        0.4841037         1979     1970
## 1755        13.460065         4.279000        0.4581000         1966     1960
## 1756        19.244084         4.365259        0.4686004         1959     1950
## 1757        15.692384         4.259127        0.4505708         1967     1960
## 1758        12.484299         4.376942        0.5073459         1973     1970
## 1759        12.013224         4.211088        0.4616562         1973     1970
## 1760        18.618795         4.346467        0.4853436         1980     1980
## 1761        13.716796         4.339916        0.4608083         1981     1980
## 1762        20.935106         4.436678        0.4559875         1974     1970
## 1763        17.373758         4.095814        0.4165702         1960     1960
## 1764        21.903430         4.402417        0.4643446         1974     1970
## 1765        16.257186         4.346255        0.4648440         1968     1960
## 1766        15.746714         4.328873        0.4510887         1963     1960
## 1767        18.211137         4.353197        0.4513391         1971     1970
## 1768         8.924583         4.104455        0.4349531         1955     1950
## 1769        13.434548         3.989521        0.4208618         1952     1950
## 1770        11.496402         3.872645        0.4298250         1954     1950
## 1771        11.824186         4.158340        0.4489155         1960     1960
## 1772        25.894165         4.470493        0.5021022         1960     1960
## 1773        26.294039         4.199367        0.3853550         1971     1970
## 1774        13.234843         4.024196        0.4382508         1975     1970
## 1775        12.265654         4.202466        0.4326333         1968     1960
## 1776        13.725472         4.060488        0.4399674         1965     1960
## 1777        23.890729         4.277068        0.4610882         1961     1960
## 1778        10.043468         4.204811        0.4686424         1965     1960
## 1779        11.938134         4.138145        0.4600684         1975     1970
## 1780        10.538430         3.985204        0.4039055         1950     1950
## 1781        13.191782         4.320107        0.4882957         1976     1970
## 1782        15.448511         4.289761        0.4562760         1976     1970
## 1783        12.983715         4.000839        0.4565839         1973     1970
## 1784        20.465714         4.095860        0.4195783         1963     1960
## 1785        17.490963         4.212044        0.4298680         1955     1950
## 1786        12.527027         4.140438        0.4618310         1955     1950
## 1787        10.605140         4.519079        0.4923487         1960     1960
## 1788        11.476511         4.300497        0.4924029         1981     1980
## 1789        12.451081         4.526396        0.5050335         1950     1950
## 1790        13.240551         4.156236        0.4249598         1974     1970
## 1791        14.797605         4.041006        0.4094275         1950     1950
## 1792        15.325162         4.076062        0.4552823         1962     1960
## 1793        15.481987         4.140653        0.4342910         1982     1980
## 1794        11.563285         4.215649        0.4586795         1972     1970
## 1795        16.830665         4.179187        0.4914920         1968     1960
## 1796         9.406227         4.028323        0.4502466         1965     1960
## 1797        18.475876         4.494533        0.5111015         1968     1960
## 1798         8.229851         3.852552        0.3536091         1970     1970
## 1799        10.788056         4.248371        0.4632135         1979     1970
## 1800        10.652998         4.141659        0.4645381         1975     1970
## 1801        16.850702         4.314228        0.4976284         1960     1960
## 1802        12.988025         4.154669        0.4375082         1979     1970
## 1803        15.462741         4.408118        0.4533705         1954     1950
## 1804        27.717897         4.184761        0.4393778         1962     1960
## 1805        17.873245         4.203922        0.4407326         1951     1950
## 1806        13.432597         4.065567        0.4317380         1951     1950
## 1807        11.259756         4.031190        0.3996865         1963     1960
## 1808        13.918238         4.151843        0.4669688         1968     1960
## 1809        21.968107         4.106680        0.4412197         1966     1960
## 1810        16.582921         4.096499        0.4169634         1956     1950
## 1811        22.157668         4.356274        0.4633228         1968     1960
## 1812        16.032756         4.146100        0.4214000         1976     1970
## 1813        11.939932         4.162715        0.4852513         1981     1980
## 1814        14.203561         4.297788        0.4506850         1966     1960
## 1815        13.949322         3.992000        0.4144319         1980     1980
## 1816        13.391184         4.337206        0.4755076         1960     1960
## 1817        12.551944         4.007941        0.4303441         1956     1950
## 1818        16.214468         4.211667        0.4426175         1972     1970
## 1819        21.374219         4.242400        0.4384000         1961     1960
## 1820        10.756050         4.012867        0.4438874         1966     1960
## 1821        11.884499         3.822267        0.4321850         1974     1970
## 1822        10.452862         4.067912        0.4441434         1965     1960
## 1823        15.962360         4.240049        0.4595609         1960     1960
## 1824        24.053724         4.280911        0.4614353         1952     1950
## 1825        37.210341         4.082049        0.3488728         1958     1950
## 1826        15.916405         4.320164        0.5055039         1977     1970
## 1827        12.540872         4.217422        0.4960791         1958     1950
## 1828        15.520981         4.324068        0.4652016         1965     1960
## 1829        12.488412         4.122215        0.4320854         1961     1960
## 1830        23.418554         4.285375        0.4680973         1970     1970
## 1831        12.832839         4.153764        0.4727180         1960     1960
## 1832        26.915127         4.183000        0.4023682         1963     1960
## 1833        12.524450         4.322466        0.4630817         1970     1970
## 1834        18.468449         4.551900        0.4798000         1979     1970
## 1835        12.420646         4.370539        0.4677785         1968     1960
## 1836        22.263401         3.919378        0.4615419         1964     1960
## 1837        23.185366         4.384300        0.4553000         1973     1970
## 1838        13.910534         4.098992        0.4648861         1972     1970
## 1839        13.701971         4.125830        0.4584073         1973     1970
## 1840        14.274600         4.264330        0.5152127         1970     1970
## 1841        23.887361         4.524704        0.4990157         1962     1960
## 1842        28.133588         4.388261        0.4528058         1962     1960
## 1843        19.788407         4.286989        0.4667450         1958     1950
## 1844        22.434153         4.087928        0.4227194         1972     1970
## 1845        16.511604         3.968902        0.4431421         1973     1970
## 1846        12.049540         4.365113        0.5164610         1971     1970
## 1847        25.249114         4.119776        0.4047673         1969     1960
## 1848        18.605944         4.207147        0.4698202         1976     1970
## 1849        10.571526         4.386535        0.4424430         1975     1970
## 1850        11.526037         4.176069        0.4819265         1957     1950
## 1851        10.064503         4.122136        0.4957486         1973     1970
## 1852        11.182919         4.069130        0.4806716         1958     1950
## 1853        16.144663         4.181780        0.4308704         1958     1950
## 1854        15.037568         4.215980        0.4370376         1965     1960
## 1855        18.980651         4.328978        0.4594005         1972     1970
## 1856        10.734935         4.114746        0.4361899         1982     1980
## 1857        12.239298         4.144632        0.4557134         1972     1970
## 1858        15.642994         4.381727        0.4786602         1962     1960
## 1859        12.247626         4.001374        0.4091239         1959     1950
## 1860        15.354856         4.196356        0.4566538         1951     1950
## 1861        13.048936         4.092343        0.4388128         1962     1960
## 1862        12.058824         4.142199        0.4702656         1974     1970
## 1863        15.256392         4.193031        0.4436447         1966     1960
## 1864        14.822544         4.506423        0.4614201         1967     1960
## 1865        14.892182         4.390563        0.4986564         1971     1970
## 1866        30.261578         4.114700        0.4211000         1955     1950
## 1867        11.244950         4.055444        0.4475901         1956     1950
## 1868        16.970046         3.921946        0.4224503         1953     1950
## 1869        11.610163         4.038434        0.4542271         1961     1960
## 1870        15.314681         4.162972        0.4368231         1971     1970
## 1871        13.843320         4.103980        0.4557833         1980     1980
## 1872        13.762688         4.287823        0.4279051         1971     1970
## 1873        11.769628         3.955400        0.4247000         1973     1970
## 1874        18.022210         4.143500        0.3928000         1978     1970
## 1875        13.114067         4.560260        0.4989676         1961     1960
## 1876        11.080180         3.840344        0.3944203         1965     1960
## 1877        11.975816         3.805530        0.3852255         1969     1960
## 1878        12.438313         4.122348        0.4597342         1963     1960
## 1879        12.549104         4.018680        0.4325908         1967     1960
## 1880        17.857097         4.498972        0.5155503         1974     1970
## 1881         9.610920         4.058223        0.4182141         1975     1970
## 1882        19.600844         4.060588        0.4313421         1963     1960
## 1883        18.160711         4.111393        0.4325123         1975     1970
## 1884         9.546776         4.191206        0.4813219         1971     1970
## 1885        14.219595         4.525396        0.4786366         1975     1970
## 1886        16.837726         4.444267        0.5301655         1981     1980
## 1887        11.361813         4.212344        0.4239436         1956     1950
## 1888        18.260743         4.253596        0.4954882         1966     1960
## 1889        13.038886         3.953019        0.4401093         1974     1970
## 1890        15.236489         4.258507        0.4800602         1974     1970
## 1891        10.280169         4.296674        0.4532902         1980     1980
## 1892        13.788611         4.192184        0.4721573         1960     1960
## 1893        11.414932         4.191111        0.4355814         1976     1970
## 1894        16.880549         3.994735        0.4349100         1956     1950
## 1895        15.918135         4.100858        0.4433853         1975     1970
## 1896         6.641834         4.049134        0.4505332         1981     1980
## 1897        13.144819         4.073316        0.4347263         1951     1950
## 1898        13.481617         4.141898        0.4541902         1964     1960
## 1899        10.818825         4.161330        0.4810537         1965     1960
## 1900        17.486501         4.233713        0.4660485         1962     1960
## 1901        14.589214         4.340359        0.5079073         1952     1950
## 1902        10.861121         4.120676        0.4606740         1977     1970
## 1903        15.166467         4.158975        0.4826033         1979     1970
## 1904        11.661358         4.339350        0.5062752         1964     1960
## 1905        12.969919         4.369438        0.4791839         1968     1960
## 1906        15.099395         4.316871        0.4469192         1966     1960
## 1907        13.695326         4.382006        0.4671416         1967     1960
## 1908        12.544168         4.366863        0.4916960         1978     1970
## 1909        17.859691         4.193663        0.4525984         1964     1960
## 1910        15.099723         4.579700        0.5575000         1981     1980
## 1911        17.251009         4.135034        0.4499511         1966     1960
## 1912        23.924393         4.305582        0.4509061         1952     1950
## 1913        19.125932         4.275513        0.4743444         1961     1960
## 1914        10.625247         4.048213        0.4343451         1953     1950
## 1915        11.905939         4.140688        0.4395327         1962     1960
## 1916        10.852524         4.027755        0.4445766         1963     1960
## 1917        10.590610         4.203290        0.4668700         1957     1950
## 1918        15.650008         4.206500        0.4590000         1950     1950
## 1919        15.361076         4.040759        0.4369556         1956     1950
## 1920        15.121300         4.154200        0.4614800         1959     1950
## 1921        13.424479         4.026782        0.4222542         1963     1960
## 1922        14.247882         4.157700        0.4401000         1959     1950
## 1923         9.654995         4.088850        0.4798893         1975     1970
## 1924        10.360513         4.337457        0.5110212         1969     1960
## 1925        35.060231         4.157135        0.4263243         1954     1950
## 1926        13.790075         4.047634        0.4793941         1953     1950
## 1927        25.229069         4.602478        0.4573506         1968     1960
## 1928        10.880413         4.151053        0.4561081         1981     1980
## 1929        17.268036         4.035925        0.4051335         1972     1970
## 1930        14.929002         4.128717        0.4302068         1981     1980
## 1931        13.375191         4.381115        0.4702352         1978     1970
## 1932        13.742735         4.136081        0.4651348         1956     1950
## 1933        10.681551         4.043300        0.4238000         1956     1950
## 1934         8.927533         4.037551        0.4547620         1966     1960
## 1935        11.412972         4.066273        0.4480921         1953     1950
## 1936        15.007923         4.171100        0.4558000         1976     1970
## 1937         9.904729         3.940172        0.4320361         1967     1960
## 1938         8.227394         4.014256        0.4522806         1975     1970
## 1939         9.993116         3.888786        0.4167748         1969     1960
## 1940        12.849860         3.799275        0.3977842         1960     1960
## 1941        15.889141         4.154711        0.4720290         1969     1960
## 1942        14.774754         4.186803        0.4310559         1958     1950
## 1943        14.800034         4.020701        0.4338552         1961     1960
## 1944        14.011734         4.330340        0.4788139         1968     1960
## 1945        11.329254         4.171665        0.4578616         1971     1970
## 1946         8.790665         4.148571        0.4609327         1980     1980
## 1947        11.600199         4.203964        0.4722835         1957     1950
## 1948        12.741502         4.277971        0.4710239         1976     1970
## 1949        13.301287         4.079823        0.4345978         1975     1970
## 1950        24.984351         4.085525        0.4331896         1973     1970
## 1951        12.126972         4.069708        0.4271459         1974     1970
## 1952        15.230439         4.342589        0.4714743         1958     1950
## 1953        11.345122         4.079208        0.4685888         1968     1960
## 1954        21.575459         3.967200        0.3649000         1978     1970
## 1955        11.301216         4.101349        0.4647670         1972     1970
## 1956        13.208149         3.856574        0.4045314         1969     1960
## 1957        15.794815         4.205748        0.4697114         1973     1970
## 1958        11.544167         4.094300        0.4686000         1959     1950
## 1959        12.900301         4.326283        0.4505918         1971     1970
## 1960         9.646674         4.026874        0.4528793         1961     1960
## 1961        12.433595         4.113723        0.4676471         1965     1960
## 1962        15.176432         4.229170        0.4364747         1978     1970
## 1963        13.590451         4.015864        0.4389106         1955     1950
## 1964        17.289221         4.266537        0.4736861         1950     1950
## 1965        15.083025         4.181273        0.4846470         1969     1960
## 1966         9.491008         4.082264        0.4573293         1979     1970
## 1967        12.870930         4.226748        0.4564179         1971     1970
## 1968        23.042420         4.093489        0.4486166         1957     1950
## 1969        11.605746         4.337795        0.5130139         1965     1960
## 1970        15.885141         4.457994        0.4726881         1950     1950
## 1971        10.126568         4.370032        0.4696258         1960     1960
## 1972        11.581438         4.164300        0.4415000         1969     1960
## 1973        13.672767         4.143096        0.4492386         1955     1950
## 1974         7.483256         4.143317        0.5055175         1966     1960
## 1975        11.207988         4.081857        0.4609526         1959     1950
## 1976        15.381706         4.171667        0.4495341         1982     1980
## 1977        10.493951         3.768718        0.3617220         1953     1950
## 1978        18.567899         4.368986        0.4961930         1969     1960
## 1979        20.306444         4.331830        0.4872957         1960     1960
## 1980        21.562244         4.144486        0.4653879         1968     1960
## 1981        12.237538         4.203145        0.4373616         1971     1970
## 1982        28.872678         4.153793        0.4218045         1950     1950
## 1983        14.985995         4.268456        0.4520841         1979     1970
## 1984        20.630785         4.112563        0.4121663         1971     1970
## 1985         8.684178         4.018171        0.4597617         1966     1960
## 1986        10.475787         4.168681        0.4916549         1969     1960
## 1987        18.503462         4.233947        0.4397644         1966     1960
## 1988        12.917686         4.359874        0.4662694         1970     1970
## 1989        18.273949         4.144929        0.4476799         1978     1970
## 1990        14.902337         4.205801        0.4347668         1969     1960
## 1991        12.534779         3.978232        0.4189357         1964     1960
## 1992        12.181386         4.189807        0.4518216         1967     1960
## 1993        13.350463         4.313888        0.4673951         1978     1970
## 1994        20.845774         4.299167        0.4568401         1954     1950
## 1995         9.111847         4.032156        0.4123817         1959     1950
## 1996        15.569394         4.182932        0.4446761         1972     1970
## 1997        14.642417         4.202376        0.4547480         1964     1960
## 1998        20.378556         4.211867        0.4352833         1957     1950
## 1999         9.926987         4.111708        0.4528474         1977     1970
## 2000        10.087605         4.169722        0.4590412         1981     1980
## 2001         7.667397         4.135364        0.4504322         1969     1960
## 2002        13.376735         4.095051        0.4551147         1965     1960
## 2003        12.473111         4.050421        0.4537384         1963     1960
## 2004        15.117884         4.214757        0.4660381         1982     1980
## 2005        13.611655         4.256100        0.4797000         1973     1970
## 2006        12.272160         4.296293        0.4919367         1974     1970
## 2007        12.512092         4.231992        0.4501448         1964     1960
## 2008        19.691602         4.092462        0.4053061         1959     1950
## 2009        17.813153         4.492831        0.5121172         1954     1950
## 2010        22.636642         4.278128        0.4508819         1968     1960
## 2011        14.477162         3.913164        0.4057996         1956     1950
## 2012        16.059285         4.328704        0.4641909         1973     1970
## 2013        10.094683         4.036115        0.4363954         1981     1980
## 2014        14.601883         3.812765        0.3497740         1958     1950
## 2015         9.725063         4.014061        0.4333953         1957     1950
## 2016        11.978462         4.052431        0.4619914         1975     1970
## 2017        19.941655         4.269224        0.4389871         1952     1950
## 2018        10.206069         3.944129        0.4154346         1950     1950
## 2019        14.772775         4.181819        0.4503237         1968     1960
## 2020        13.303392         4.221799        0.4468686         1971     1970
## 2021        13.278110         4.311984        0.4996484         1967     1960
## 2022        10.092108         4.067600        0.4494000         1980     1980
## 2023        13.138523         4.116975        0.4905418         1968     1960
## 2024        16.723055         4.251320        0.4822211         1966     1960
## 2025         9.912520         4.321273        0.4495791         1961     1960
## 2026        13.696245         4.205475        0.4386423         1965     1960
## 2027        10.453752         3.951222        0.4400337         1976     1970
## 2028        15.422005         4.214878        0.4277872         1957     1950
## 2029        22.586162         3.750027        0.3376084         1953     1950
## 2030        20.605986         3.991858        0.4273693         1974     1970
## 2031        17.446257         4.278084        0.4296075         1970     1970
## 2032         9.563648         4.298136        0.4600488         1960     1960
## 2033        12.184591         3.968371        0.4511998         1959     1950
## 2034        12.758345         4.245285        0.4509286         1963     1960
## 2035        17.281997         4.214416        0.4589778         1966     1960
## 2036        10.876566         4.228823        0.4347774         1955     1950
## 2037         7.512745         4.104933        0.4531532         1970     1970
## 2038        10.576432         4.024690        0.4263886         1965     1960
## 2039        15.520388         4.390949        0.4531062         1961     1960
## 2040        16.846386         4.311924        0.3996048         1970     1970
## 2041        20.074728         3.783247        0.4180423         1967     1960
## 2042        20.483909         4.081215        0.4362585         1952     1950
## 2043        10.660015         4.004376        0.4131794         1970     1970
## 2044        11.894469         4.101300        0.4818000         1963     1960
## 2045        20.434144         4.208811        0.4619421         1968     1960
## 2046        15.144650         4.051993        0.4577914         1974     1970
## 2047        13.856925         3.907800        0.4344000         1958     1950
## 2048        14.282237         4.064573        0.4141820         1963     1960
## 2049        15.721365         4.402416        0.4439734         1967     1960
## 2050        21.797446         4.183350        0.4536099         1979     1970
## 2051        12.716361         4.230029        0.4927857         1950     1950
## 2052        16.298906         4.230359        0.4758298         1955     1950
## 2053        11.386876         4.058138        0.4466396         1956     1950
## 2054        16.071580         4.327508        0.4529609         1950     1950
## 2055        16.512776         4.236815        0.4652459         1950     1950
## 2056        17.693469         4.174090        0.4473988         1954     1950
## 2057        26.299031         4.103627        0.4267279         1956     1950
## 2058        13.542044         4.260145        0.4883703         1965     1960
## 2059        14.745971         4.344353        0.4675217         1962     1960
## 2060        15.463097         4.126600        0.4342000         1951     1950
## 2061        21.560008         4.136205        0.4577137         1958     1950
## 2062        19.055467         4.265364        0.4644975         1957     1950
## 2063        17.400808         4.182149        0.4706707         1973     1970
## 2064        23.212263         3.873063        0.3866204         1958     1950
## 2065        18.935365         4.234700        0.4424000         1971     1970
## 2066        11.473063         3.971416        0.4270580         1958     1950
## 2067        12.849356         4.173251        0.4186774         1965     1960
## 2068        10.868567         4.195800        0.4264000         1968     1960
## 2069        16.765328         4.452291        0.4740279         1972     1970
## 2070        19.897122         4.130847        0.3611353         1979     1970
## 2071        13.402996         4.348285        0.5000024         1981     1980
## 2072        13.038318         4.229805        0.4558195         1953     1950
## 2073        11.415614         4.208797        0.4484851         1971     1970
## 2074        12.067900         4.203753        0.4558746         1963     1960
## 2075        13.311010         4.035054        0.4733796         1970     1970
## 2076        12.743013         4.254721        0.4873867         1976     1970
## 2077        13.644011         4.368462        0.4535840         1981     1980
## 2078        16.850589         4.072346        0.4160055         1963     1960
## 2079        15.359921         4.229422        0.4498250         1962     1960
## 2080         8.641555         4.190865        0.4739065         1980     1980
## 2081        13.302887         4.031523        0.3994678         1967     1960
## 2082        14.503414         4.387294        0.4873050         1951     1950
## 2083        16.381181         4.169235        0.4626654         1951     1950
## 2084        15.346813         4.199585        0.4157813         1978     1970
## 2085        19.220255         4.126003        0.4271715         1977     1970
## 2086        10.758234         4.084271        0.4327139         1980     1980
## 2087        18.201627         4.037517        0.4453068         1960     1960
## 2088        16.145171         4.275041        0.4608282         1963     1960
## 2089        21.581499         4.155002        0.4455571         1963     1960
## 2090        20.712340         4.115252        0.4485327         1979     1970
## 2091        17.930211         4.395794        0.4673625         1971     1970
## 2092        14.272324         4.277267        0.4812888         1977     1970
## 2093        12.614547         4.285723        0.4628234         1963     1960
## 2094        12.186824         4.133183        0.4734480         1972     1970
## 2095        11.499905         3.874543        0.4102994         1962     1960
## 2096        12.935376         4.496378        0.4740468         1973     1970
## 2097        14.184244         4.206168        0.4405640         1981     1980
## 2098        16.415729         4.218176        0.4544681         1972     1970
## 2099        10.418287         4.405857        0.4861528         1979     1970
## 2100        12.063331         4.112726        0.4629298         1970     1970
## 2101        13.999674         4.165502        0.4665810         1968     1960
## 2102        12.365835         4.119176        0.4639077         1982     1980
## 2103        11.902652         4.241410        0.4579199         1952     1950
## 2104         8.274559         3.950117        0.4222540         1970     1970
## 2105         8.276801         4.039758        0.4627614         1964     1960
## 2106         9.863622         4.093334        0.4691493         1961     1960
## 2107        10.312719         4.355800        0.4964000         1976     1970
## 2108         8.812971         3.842951        0.4050408         1981     1980
## 2109        18.875562         4.202497        0.4733298         1969     1960
## 2110        10.627039         4.205652        0.4815859         1964     1960
## 2111        15.821720         4.036344        0.4314177         1964     1960
## 2112        11.495388         4.152140        0.4758402         1966     1960
## 2113        17.982045         4.216616        0.4102030         1956     1950
## 2114        13.559967         4.135590        0.4654338         1965     1960
## 2115        12.328695         4.353400        0.4466000         1980     1980
## 2116        12.909418         3.956453        0.4226213         1963     1960
## 2117        10.148670         4.230552        0.5083689         1975     1970
## 2118        15.490901         4.155900        0.4536000         1960     1960
## 2119        16.818026         4.198938        0.4656052         1965     1960
## 2120        15.567719         4.157687        0.4447526         1952     1950
## 2121        11.940209         4.128453        0.4677550         1957     1950
## 2122        10.624715         4.109900        0.4473000         1953     1950
## 2123        10.463219         4.229798        0.4701489         1951     1950
## 2124        14.742385         4.246119        0.4445139         1966     1960
## 2125        13.591215         4.141806        0.4664688         1959     1950
## 2126        19.820579         4.609647        0.5040968         1972     1970
## 2127        17.140727         4.390797        0.4836998         1973     1970
## 2128        14.902977         4.158507        0.4428515         1959     1950
## 2129        11.991956         4.243669        0.4526303         1975     1970
## 2130        14.120963         4.051728        0.4415228         1968     1960
## 2131        14.807067         4.170590        0.4530402         1962     1960
## 2132        16.279606         4.196579        0.4432050         1969     1960
## 2133        15.923554         4.367191        0.4701392         1968     1960
## 2134        17.478008         4.306122        0.4880419         1969     1960
## 2135         9.233422         4.130244        0.4383976         1980     1980
## 2136        11.921410         4.000795        0.3989617         1961     1960
## 2137        15.437623         4.159152        0.4294691         1975     1970
## 2138         9.211011         4.047100        0.4443000         1983     1980
## 2139        10.616525         4.126524        0.4347443         1972     1970
## 2140        14.507157         4.372541        0.4923498         1977     1970
## 2141        13.496778         4.140609        0.4606258         1965     1960
## 2142        21.291936         4.405253        0.4668770         1970     1970
## 2143        10.870353         4.173670        0.4703808         1955     1950
## 2144        17.176128         3.975304        0.3937382         1957     1950
## 2145        16.115002         4.339731        0.4288696         1956     1950
## 2146         9.554758         4.224288        0.4714886         1963     1960
## 2147        20.525839         4.524578        0.5197075         1971     1970
## 2148        17.607844         4.467652        0.4872809         1958     1950
## 2149        12.843673         4.243996        0.4573568         1970     1970
## 2150        16.411890         4.244217        0.4511814         1954     1950
## 2151        17.018570         4.438989        0.5108007         1964     1960
## 2152         9.430113         4.439744        0.4947331         1975     1970
## 2153        14.417838         4.410940        0.4894175         1981     1980
## 2154        18.967021         4.163943        0.4281113         1967     1960
## 2155        11.675683         4.044998        0.4153097         1967     1960
## 2156        10.659511         4.324861        0.4741031         1954     1950
## 2157        11.017466         4.066783        0.4212695         1960     1960
## 2158        13.072323         4.342482        0.4679893         1959     1950
## 2159        14.540039         4.208914        0.4336208         1974     1970
## 2160        13.571316         4.195834        0.4546046         1978     1970
## 2161        18.921762         4.288544        0.4647363         1970     1970
## 2162        12.525954         4.214983        0.5152374         1977     1970
## 2163         9.131811         4.312881        0.4541380         1978     1970
## 2164        15.423031         4.303289        0.5017978         1965     1960
## 2165        12.150074         4.259628        0.4536053         1979     1970
## 2166        17.861516         4.279631        0.4565748         1976     1970
## 2167        15.134718         4.617430        0.4980777         1977     1970
## 2168        13.512281         4.207971        0.4589081         1954     1950
## 2169        14.450304         4.308966        0.4779930         1978     1970
## 2170         9.344026         4.095070        0.4508173         1979     1970
## 2171        17.176880         4.276290        0.4572173         1970     1970
## 2172        12.719263         4.500052        0.4592469         1970     1970
## 2173        16.941589         4.283325        0.4337074         1967     1960
## 2174        12.432679         4.431123        0.5151110         1976     1970
## 2175        12.582893         4.141641        0.4735550         1974     1970
## 2176        11.738700         4.169930        0.4519478         1970     1970
## 2177        14.335051         4.012321        0.4184917         1956     1950
## 2178        11.190723         4.141800        0.4822000         1959     1950
## 2179        16.987145         4.269215        0.4488640         1963     1960
## 2180        12.450168         4.163381        0.4462650         1956     1950
## 2181         8.274633         4.030440        0.4351163         1974     1970
## 2182         8.059625         4.020378        0.4648223         1979     1970
## 2183        11.760073         4.131883        0.4596643         1965     1960
## 2184        11.190456         4.190707        0.4747468         1956     1950
## 2185        15.540010         3.818321        0.3821281         1963     1960
## 2186        12.716315         3.978756        0.4309504         1963     1960
## 2187        15.896592         3.856598        0.4164814         1974     1970
## 2188        13.457838         3.887245        0.4276033         1961     1960
## 2189        12.872449         4.127400        0.4372000         1978     1970
## 2190        16.922260         4.107543        0.4571643         1974     1970
## 2191        10.758544         4.042318        0.4652472         1964     1960
## 2192        16.559034         4.089802        0.4360878         1970     1970
## 2193        26.097832         4.269600        0.4478000         1958     1950
## 2194        11.165844         4.231936        0.4619916         1958     1950
## 2195        20.701316         4.383200        0.4705000         1980     1980
## 2196        21.421047         4.459211        0.4913819         1982     1980
## 2197        15.709493         4.144252        0.4323174         1968     1960
## 2198        18.442150         4.037036        0.4141167         1962     1960
## 2199        11.760664         4.348640        0.5095815         1978     1970
## 2200        10.970494         4.219024        0.5017497         1978     1970
## 2201        10.298158         4.321931        0.5263048         1978     1970
## 2202        30.661049         4.154645        0.4506161         1979     1970
## 2203        13.427032         4.219050        0.4514689         1969     1960
## 2204        17.885516         4.117368        0.4697426         1959     1950
## 2205        10.641241         3.912712        0.4131436         1967     1960
## 2206        12.263707         4.055800        0.4268000         1970     1970
## 2207        20.681259         3.658256        0.3867141         1950     1950
## 2208        12.983515         4.078179        0.4520453         1980     1980
## 2209        23.934603         4.362634        0.4870912         1954     1950
## 2210        21.509974         4.241334        0.4995493         1956     1950
## 2211        21.666238         3.897282        0.4018843         1953     1950
## 2212        16.878503         4.432566        0.4809052         1973     1970
## 2213        14.708632         4.174309        0.4877003         1955     1950
## 2214        18.339203         4.313782        0.4742541         1956     1950
## 2215         9.370299         4.349622        0.4833333         1972     1970
## 2216        12.134823         4.155555        0.4423818         1975     1970
## 2217        20.392052         4.130088        0.4245423         1979     1970
## 2218        16.194626         4.070605        0.4152614         1975     1970
## 2219         9.462932         4.202012        0.4601447         1967     1960
## 2220        13.497244         3.867441        0.3909161         1968     1960
## 2221        14.200177         4.317697        0.4962975         1979     1970
## 2222        16.450762         4.298325        0.4436305         1982     1980
## 2223        14.377602         4.184679        0.4583864         1954     1950
## 2224        12.117174         4.099309        0.4216506         1963     1960
## 2225        11.908539         3.924425        0.4093448         1968     1960
## 2226        13.643579         4.184640        0.4756440         1976     1970
## 2227        16.521276         4.564292        0.4956385         1963     1960
## 2228        11.845720         4.313623        0.4908078         1980     1980
## 2229        13.886177         4.243617        0.4834138         1957     1950
## 2230         9.670284         3.923207        0.4291229         1974     1970
## 2231        12.172770         4.207638        0.4259370         1963     1960
## 2232        16.798994         4.198700        0.4409000         1975     1970
## 2233        11.725842         4.036647        0.4364546         1961     1960
## 2234        29.346362         4.738396        0.5525041         1976     1970
## 2235        18.202822         4.182881        0.4347621         1975     1970
## 2236        16.817257         3.939392        0.4452906         1962     1960
## 2237         9.008929         3.803899        0.3896807         1971     1970
## 2238         8.912655         3.970870        0.4418146         1958     1950
## 2239        10.112340         4.004891        0.4103283         1972     1970
## 2240        10.826002         4.025790        0.4358966         1952     1950
## 2241        14.032056         4.038649        0.4246186         1972     1970
## 2242        14.249337         4.325004        0.5070266         1971     1970
## 2243        17.461635         4.123719        0.4314477         1960     1960
## 2244        10.263264         4.048800        0.4468000         1968     1960
## 2245        14.267859         4.211632        0.4898104         1971     1970
## 2246        14.393007         4.033691        0.4110798         1963     1960
## 2247        14.578364         4.026185        0.4121070         1981     1980
## 2248        16.226100         4.007291        0.4368082         1954     1950
## 2249        13.006327         3.953745        0.3892867         1974     1970
## 2250        10.279136         4.106626        0.4415187         1978     1970
## 2251        16.171646         4.201510        0.4453986         1959     1950
## 2252        26.013924         4.275706        0.4577101         1970     1970
## 2253        12.202882         4.079003        0.4262243         1978     1970
## 2254        27.497073         4.314100        0.4872000         1957     1950
## 2255        13.320169         4.047546        0.4406703         1965     1960
## 2256        17.939111         4.337369        0.4493641         1964     1960
## 2257        16.023584         4.240929        0.4274445         1973     1970
## 2258        14.401779         4.140270        0.4344953         1965     1960
## 2259        13.901188         4.213215        0.4661326         1956     1950
## 2260         9.983087         3.945217        0.4015877         1980     1980
## 2261        10.689447         4.138000        0.4650000         1981     1980
## 2262        10.481735         4.421681        0.4681848         1982     1980
## 2263        30.463637         4.034249        0.4664852         1967     1960
## 2264        14.843409         4.126308        0.4248425         1961     1960
## 2265        16.752212         4.127808        0.4206688         1961     1960
## 2266        13.448168         4.180569        0.4524935         1980     1980
## 2267        13.896951         4.077346        0.4221871         1966     1960
## 2268        12.364091         4.186291        0.4744105         1955     1950
## 2269        19.226700         4.191475        0.4473992         1976     1970
## 2270        21.000612         4.327523        0.4622965         1964     1960
## 2271        17.615680         4.052289        0.4630926         1980     1980
## 2272        18.390227         4.320551        0.4825586         1976     1970
## 2273        22.590233         4.543837        0.5125901         1979     1970
## 2274        21.829416         4.398155        0.4740144         1958     1950
## 2275        16.884871         4.139661        0.4320573         1971     1970
## 2276        24.786848         4.130799        0.4066945         1961     1960
## 2277         8.734269         4.237136        0.4007415         1968     1960
## 2278        10.128630         4.139871        0.4599208         1967     1960
## 2279        16.096717         3.974962        0.3876196         1958     1950
## 2280        13.742978         4.020987        0.4150489         1962     1960
## 2281        16.295098         4.408319        0.4586099         1972     1970
## 2282        12.995123         4.246000        0.4626000         1982     1980
## 2283         9.801904         4.047942        0.4532848         1966     1960
## 2284        18.450132         3.942717        0.4397743         1962     1960
## 2285        14.253815         4.173498        0.4367402         1983     1980
## 2286        14.712533         4.375834        0.4988475         1983     1980
## 2287        14.491088         4.076407        0.3918407         1979     1970
## 2288        13.002896         4.236600        0.4696000         1969     1960
## 2289        13.024461         4.181555        0.4620967         1979     1970
## 2290        10.469129         4.205054        0.4529456         1965     1960
## 2291        20.934894         4.086500        0.4148000         1974     1970
## 2292        20.546820         4.333549        0.4505738         1952     1950
## 2293        14.440757         4.303683        0.4796107         1967     1960
## 2294        15.321081         4.362416        0.4678036         1982     1980
## 2295        14.591796         4.392316        0.4729432         1960     1960
## 2296        15.125186         4.119889        0.4336026         1963     1960
## 2297        16.955051         4.291742        0.4679471         1963     1960
## 2298        17.572486         4.210797        0.4585442         1971     1970
## 2299         9.280696         4.034700        0.4526000         1975     1970
## 2300        18.482882         4.014303        0.4290437         1971     1970
## 2301        13.202271         3.997943        0.4444050         1967     1960
## 2302        11.905917         4.318919        0.4978559         1984     1980
## 2303        18.300990         4.363557        0.4522676         1974     1970
## 2304        11.712379         4.106153        0.4759320         1971     1970
## 2305        14.682891         4.163845        0.4366278         1973     1970
## 2306        11.927903         4.199995        0.4444453         1982     1980
## 2307        13.083321         4.335675        0.4669361         1956     1950
## 2308        13.030559         4.084806        0.4566408         1967     1960
## 2309        20.847714         4.248372        0.4639554         1959     1950
## 2310        19.389146         4.190900        0.4739000         1955     1950
## 2311        11.482896         4.227619        0.4262056         1966     1960
## 2312        17.358036         4.285199        0.4579727         1973     1970
## 2313        21.346681         4.352422        0.4709665         1959     1950
## 2314        12.668911         4.053629        0.4144451         1974     1970
## 2315        10.094917         4.020267        0.4434430         1976     1970
## 2316        14.240008         4.100722        0.4516307         1954     1950
## 2317        20.478144         4.181184        0.4377951         1973     1970
## 2318        18.867013         4.316545        0.4887012         1979     1970
## 2319        19.370284         4.236880        0.4537410         1968     1960
## 2320        11.534466         4.336183        0.5308664         1971     1970
## 2321        14.489035         4.390635        0.4647825         1961     1960
## 2322        16.131029         4.302073        0.4843966         1969     1960
## 2323        13.164681         4.047600        0.4390000         1981     1980
## 2324        15.432126         4.021396        0.4169112         1968     1960
## 2325        14.107857         4.246960        0.4604280         1975     1970
## 2326        13.472378         4.214121        0.4692043         1974     1970
## 2327        14.523328         4.038741        0.4112633         1958     1950
## 2328        16.712129         4.027656        0.4486200         1954     1950
## 2329        10.270507         4.059403        0.3910972         1965     1960
## 2330        10.888500         4.118439        0.4609934         1970     1970
## 2331        19.414014         4.336397        0.4747880         1965     1960
## 2332        40.058816         4.288663        0.4237255         1955     1950
## 2333        25.711516         4.196144        0.4446514         1955     1950
## 2334        13.663452         4.160817        0.4528858         1977     1970
## 2335        10.652572         4.130158        0.4662901         1968     1960
## 2336        13.010911         4.032050        0.4420889         1975     1970
## 2337        16.047206         4.408544        0.4996346         1971     1970
## 2338        12.848946         4.209820        0.5045557         1982     1980
## 2339        19.022658         4.253801        0.4386950         1983     1980
## 2340        13.922849         4.270155        0.4624522         1960     1960
## 2341        13.161902         4.119095        0.4488865         1978     1970
## 2342        13.764787         4.160484        0.4588856         1983     1980
## 2343        14.719267         4.283489        0.4760126         1966     1960
## 2344        15.558398         4.143900        0.4372000         1970     1970
## 2345        22.804101         3.943669        0.3813307         1963     1960
## 2346        14.931930         4.244879        0.4789143         1981     1980
## 2347        14.723044         4.110403        0.4700110         1963     1960
## 2348        17.300274         4.171243        0.4521314         1965     1960
## 2349        20.998921         4.179955        0.4207630         1961     1960
## 2350        20.375750         4.149962        0.4635272         1962     1960
## 2351        20.111965         4.282495        0.4725697         1970     1970
## 2352        17.138955         4.214600        0.4438000         1966     1960
## 2353        18.602941         4.166812        0.4606804         1957     1950
## 2354        12.370590         4.097813        0.4454484         1978     1970
## 2355         8.112973         4.289462        0.5076758         1978     1970
## 2356        11.293351         4.052739        0.4143778         1977     1970
## 2357        22.135723         4.194559        0.4493614         1953     1950
## 2358        16.123073         4.268822        0.4652758         1959     1950
## 2359        15.098052         4.305386        0.4588743         1968     1960
## 2360        13.834983         4.082799        0.4454038         1960     1960
## 2361         9.561626         4.263639        0.5036029         1982     1980
## 2362        10.604540         4.115623        0.4767416         1976     1970
## 2363        14.196836         4.232869        0.4368119         1970     1970
## 2364        20.623901         4.397076        0.4756644         1975     1970
## 2365         9.358270         4.235536        0.4602898         1982     1980
## 2366        12.360422         4.319800        0.4704000         1963     1960
## 2367        18.867099         4.364545        0.4854050         1977     1970
## 2368        17.860232         4.190000        0.4570000         1973     1970
## 2369        23.530153         4.194694        0.4565029         1971     1970
## 2370        13.322514         4.368161        0.4441395         1966     1960
## 2371        22.695338         4.296150        0.4340234         1961     1960
## 2372        13.730936         4.345710        0.4882676         1958     1950
## 2373        13.725265         4.123438        0.4532323         1968     1960
## 2374        20.690413         4.091454        0.4458232         1955     1950
## 2375        10.862924         4.347675        0.4909449         1981     1980
## 2376        12.891638         4.414951        0.4437189         1952     1950
## 2377        12.313797         4.190297        0.4330674         1963     1960
## 2378        15.666423         4.134676        0.4494605         1957     1950
## 2379        11.051376         4.063017        0.4580372         1978     1970
## 2380        11.305791         4.212487        0.4269833         1970     1970
## 2381        14.047546         3.930985        0.4226409         1974     1970
## 2382         9.725870         4.197741        0.4714285         1976     1970
## 2383        11.412831         3.923464        0.3877670         1973     1970
## 2384        11.895267         4.268939        0.4690377         1965     1960
## 2385        17.370757         4.232318        0.3987345         1967     1960
## 2386        15.174922         4.455141        0.4592728         1972     1970
## 2387        20.116494         4.423375        0.4611171         1978     1970
## 2388        13.179414         4.333744        0.4610629         1973     1970
## 2389        14.975334         4.213322        0.4448457         1965     1960
## 2390        12.988301         4.302717        0.4693088         1968     1960
## 2391        10.481826         4.226925        0.4559421         1968     1960
## 2392        12.764803         3.650700        0.3570000         1957     1950
## 2393        11.170500         3.975009        0.4239971         1960     1960
## 2394        16.153782         4.198500        0.4852000         1974     1970
## 2395        12.982210         4.098146        0.4308631         1977     1970
## 2396        11.028484         4.079990        0.4313313         1980     1980
## 2397        17.428006         3.979158        0.4168796         1956     1950
## 2398        25.096418         4.401744        0.4512901         1963     1960
## 2399        25.088493         4.149007        0.4811098         1971     1970
## 2400        15.025752         4.081649        0.4293324         1956     1950
## 2401        18.026266         4.335801        0.4289443         1970     1970
## 2402        11.602111         4.194547        0.4596351         1969     1960
## 2403        14.686758         4.207351        0.4453997         1950     1950
## 2404        14.809116         4.302120        0.4831100         1982     1980
## 2405        13.272555         4.072600        0.4234000         1967     1960
## 2406        14.461217         4.002524        0.3928567         1957     1950
## 2407         8.122632         3.748025        0.3989672         1959     1950
## 2408         9.593324         4.154514        0.3952787         1975     1970
## 2409        11.059231         4.254201        0.4520748         1980     1980
## 2410        11.828955         4.146875        0.4529255         1977     1970
## 2411        11.831949         4.185023        0.4213155         1975     1970
## 2412        17.597091         4.313747        0.4377040         1972     1970
## 2413        12.791854         4.447162        0.5073132         1951     1950
## 2414        10.970064         4.115682        0.4868840         1979     1970
## 2415        14.733159         4.247618        0.4503122         1981     1980
## 2416        17.371945         4.229035        0.4443304         1960     1960
## 2417        11.628708         4.246353        0.4950414         1976     1970
## 2418        11.707193         4.438079        0.4123826         1976     1970
## 2419        14.774956         4.138015        0.4325558         1974     1970
## 2420         7.909268         4.236624        0.4511247         1974     1970
## 2421         7.327544         4.182945        0.4566344         1978     1970
## 2422         8.900795         4.080214        0.4526803         1970     1970
## 2423        11.680707         4.162488        0.4629028         1975     1970
## 2424        15.550779         4.210000        0.4566000         1982     1980
## 2425        20.068705         4.235175        0.4626919         1982     1980
## 2426        12.582881         4.388008        0.4675263         1973     1970
## 2427        12.029159         4.191424        0.4388569         1972     1970
## 2428        13.811012         4.142294        0.4362180         1977     1970
## 2429        19.417443         4.402330        0.4520247         1965     1960
## 2430        20.474220         4.440185        0.4835420         1973     1970
## 2431        23.992644         4.233244        0.4425113         1956     1950
## 2432        16.130465         3.964381        0.3896453         1958     1950
## 2433        17.602457         4.292748        0.4441123         1964     1960
## 2434        12.006069         4.202200        0.4243000         1972     1970
## 2435        21.788235         4.156143        0.4443250         1961     1960
## 2436        29.681251         4.115541        0.4029079         1962     1960
## 2437        19.920809         4.327228        0.4375866         1956     1950
## 2438        16.583783         4.316500        0.5016000         1980     1980
## 2439        11.211461         4.050234        0.4422799         1968     1960
## 2440        12.550122         4.219863        0.4799976         1971     1970
## 2441        16.066866         4.020639        0.4032245         1982     1980
## 2442        13.416015         4.088123        0.4319288         1977     1970
## 2443        13.517855         4.259103        0.4480633         1961     1960
## 2444        13.941421         4.091994        0.4068557         1950     1950
## 2445        29.060493         4.357861        0.4883414         1958     1950
## 2446        23.533469         4.283654        0.4828175         1974     1970
## 2447         9.901664         4.310471        0.4706790         1967     1960
## 2448        13.301569         4.260872        0.4979032         1968     1960
## 2449        16.306648         4.089291        0.4527634         1968     1960
## 2450        15.549093         4.333786        0.4877761         1967     1960
## 2451        11.311374         4.036799        0.3964187         1969     1960
## 2452         8.879982         4.192322        0.4381722         1963     1960
## 2453        28.922533         4.443700        0.4811274         1966     1960
## 2454        14.738369         4.381678        0.4769240         1957     1950
## 2455        19.330623         4.210048        0.4652649         1964     1960
## 2456        19.712110         4.294792        0.4721236         1981     1980
## 2457        14.931830         4.492073        0.4616214         1960     1960
## 2458        15.115943         4.373540        0.4829992         1960     1960
## 2459        12.969654         3.800333        0.4140514         1982     1980
## 2460        27.628013         4.359400        0.4731000         1973     1970
## 2461        11.974008         4.161183        0.4622672         1965     1960
## 2462        12.253729         3.962823        0.4465858         1958     1950
## 2463        16.209014         4.149227        0.4471914         1956     1950
## 2464        21.755418         3.974465        0.4343009         1963     1960
## 2465        10.860375         4.181247        0.4327962         1975     1970
## 2466        20.949081         4.308686        0.4881974         1970     1970
## 2467        19.173404         4.415414        0.4632741         1982     1980
## 2468        12.732141         3.783351        0.4001549         1971     1970
## 2469        15.171813         4.152021        0.4445570         1968     1960
## 2470        22.926310         4.236586        0.4402408         1983     1980
## 2471        16.452377         4.352799        0.4615043         1966     1960
## 2472        12.939060         4.218900        0.4583000         1971     1970
## 2473        13.600082         4.129735        0.4539236         1960     1960
## 2474        14.705614         4.202111        0.4553142         1978     1970
## 2475        16.535613         4.338311        0.4591499         1951     1950
## 2476        12.707604         4.114302        0.4466210         1964     1960
## 2477         8.511350         4.213924        0.4672469         1965     1960
## 2478        16.379104         4.210332        0.4260955         1982     1980
## 2479        17.641332         4.103509        0.4378990         1959     1950
## 2480        13.442563         4.217605        0.4520346         1959     1950
## 2481        17.582356         4.167100        0.4469000         1960     1960
## 2482        19.461951         4.345449        0.4518286         1954     1950
## 2483        13.095741         4.007620        0.4235504         1974     1970
## 2484        15.981478         4.195618        0.4544108         1972     1970
## 2485        13.394358         4.508031        0.4797341         1975     1970
## 2486        14.700276         4.094838        0.4230255         1956     1950
## 2487        20.862285         4.233510        0.4766794         1951     1950
## 2488        12.020108         4.155597        0.4713844         1953     1950
## 2489        15.799695         3.945404        0.3796842         1967     1960
## 2490         9.030827         3.965722        0.4336030         1958     1950
## 2491         9.033106         4.054615        0.4413658         1960     1960
## 2492        10.626734         4.493399        0.4931521         1971     1970
## 2493        10.097812         3.939184        0.4520211         1978     1970
## 2494        18.533634         4.199441        0.4488662         1968     1960
## 2495         9.766405         4.185774        0.4834974         1975     1970
## 2496        26.139534         4.130265        0.4259151         1955     1950
## 2497        12.803852         4.438347        0.4924315         1955     1950
## 2498        12.227099         4.080325        0.4681659         1969     1960
## 2499        16.092673         4.041323        0.4323244         1954     1950
## 2500        16.757869         4.524067        0.5128115         1967     1960
## 2501         9.540733         4.320839        0.4645134         1972     1970
## 2502        10.848805         4.074195        0.4302416         1969     1960
## 2503        10.570169         4.084530        0.4496933         1963     1960
## 2504        16.975687         4.264339        0.4508270         1972     1970
## 2505        13.233597         3.924901        0.3913923         1960     1960
## 2506        12.644952         4.430629        0.4798112         1977     1970
## 2507        20.386942         4.194997        0.4382160         1970     1970
## 2508        11.526124         4.246902        0.4676741         1980     1980
## 2509        17.178278         4.302818        0.4647274         1982     1980
## 2510        10.989098         4.030284        0.4406027         1980     1980
## 2511        11.321340         4.043478        0.4601905         1982     1980
## 2512        16.459727         4.098554        0.4530175         1955     1950
## 2513        14.963267         4.121089        0.4401854         1967     1960
## 2514        16.083725         4.265005        0.4671437         1983     1980
## 2515        16.729481         4.169535        0.4465163         1971     1970
## 2516        17.068471         4.333289        0.4991123         1950     1950
## 2517         9.769091         4.140978        0.4043079         1950     1950
## 2518        13.440851         4.252614        0.4970446         1974     1970
## 2519        19.316415         3.991900        0.3506000         1974     1970
## 2520        12.624837         4.221242        0.4386143         1960     1960
## 2521        16.682924         4.510003        0.4789688         1951     1950
## 2522        22.437681         3.872232        0.3619758         1968     1960
## 2523        13.872531         4.196753        0.4353663         1982     1980
## 2524        12.086581         3.828102        0.3881049         1981     1980
## 2525        12.476843         3.897900        0.3567000         1959     1950
## 2526        18.275898         4.108100        0.4307000         1982     1980
## 2527        10.880075         4.335316        0.4467610         1979     1970
## 2528        13.289157         4.085219        0.4362879         1958     1950
## 2529        10.040939         3.993146        0.4357724         1972     1970
## 2530        13.263390         4.156591        0.4673884         1968     1960
## 2531        14.036086         4.240612        0.4668088         1964     1960
## 2532        12.987938         4.143635        0.4538551         1964     1960
## 2533        13.960373         4.122280        0.4573985         1975     1970
## 2534        14.642939         4.413942        0.4824509         1952     1950
## 2535        16.067290         4.252313        0.4488024         1976     1970
## 2536        17.855706         4.418028        0.4941351         1961     1960
## 2537        11.890087         4.246731        0.4728908         1979     1970
## 2538        10.181848         4.060929        0.4224112         1975     1970
## 2539        11.304019         4.214923        0.4605665         1976     1970
## 2540        26.023473         4.511152        0.4675913         1953     1950
## 2541        20.220366         4.259100        0.4525000         1956     1950
## 2542        11.375181         4.140870        0.4141239         1963     1960
## 2543        12.418148         4.278190        0.4540779         1969     1960
## 2544        17.035034         4.180500        0.4317000         1978     1970
## 2545         8.040748         4.046100        0.4239000         1962     1960
## 2546        18.973813         4.351400        0.4637000         1969     1960
## 2547        24.147847         4.252603        0.4339763         1954     1950
## 2548        12.091105         4.057359        0.4342515         1964     1960
## 2549        12.000562         4.029100        0.4944000         1978     1970
## 2550        15.497818         3.995782        0.4144721         1970     1970
## 2551        12.846521         4.118043        0.4472392         1954     1950
## 2552        13.133432         4.275811        0.4491015         1951     1950
## 2553        20.723985         4.427868        0.4907834         1967     1960
## 2554        17.355238         4.344904        0.4687883         1979     1970
## 2555        11.473907         4.115065        0.4557963         1952     1950
## 2556        13.713268         4.116552        0.4461672         1961     1960
## 2557        13.678254         4.427484        0.4779244         1957     1950
## 2558        12.277544         4.290056        0.4702870         1983     1980
## 2559        14.368228         4.255830        0.4813127         1976     1970
## 2560        12.654651         4.086448        0.4254170         1974     1970
## 2561        19.740319         4.081817        0.4400846         1954     1950
## 2562        17.198340         4.434154        0.4555760         1973     1970
## 2563        12.732503         4.280897        0.4811432         1968     1960
## 2564        17.827180         4.261275        0.4493446         1958     1950
## 2565        17.990452         4.131366        0.4462258         1975     1970
## 2566        18.985661         4.329116        0.4648872         1959     1950
## 2567        19.568296         4.648123        0.5090766         1977     1970
## 2568        15.616014         4.221499        0.4613246         1954     1950
## 2569        14.755245         4.180054        0.4398844         1983     1980
## 2570        11.048168         4.041033        0.4042764         1965     1960
## 2571        11.082301         4.102430        0.4440572         1975     1970
## 2572        10.746529         4.048620        0.4304325         1961     1960
## 2573        14.717618         4.234077        0.4688982         1964     1960
## 2574        23.040601         4.393007        0.4738141         1980     1980
## 2575        18.453737         4.313997        0.4623745         1979     1970
## 2576        13.404537         3.985904        0.4243131         1954     1950
## 2577        11.747427         4.146871        0.4391812         1979     1970
## 2578        17.724330         4.305705        0.4726699         1952     1950
## 2579         6.887763         4.308785        0.4919989         1983     1980
## 2580        11.366366         4.039868        0.4446100         1954     1950
## 2581        17.357265         4.334955        0.4579055         1981     1980
## 2582        18.358067         4.511006        0.4850461         1961     1960
## 2583        21.815087         3.857667        0.3453340         1950     1950
## 2584        18.129802         4.168213        0.4220508         1983     1980
## 2585        19.771629         4.436983        0.4643164         1962     1960
## 2586         9.502711         4.010863        0.4208428         1972     1970
## 2587        23.297892         4.048155        0.4242326         1958     1950
## 2588        13.409568         4.221345        0.4796749         1964     1960
## 2589        13.910047         4.255744        0.4219950         1966     1960
## 2590        15.280195         4.294064        0.4899097         1965     1960
## 2591        13.989094         4.351318        0.4936140         1965     1960
## 2592         8.179443         4.161478        0.4865846         1975     1970
## 2593        10.942582         4.117449        0.4188580         1962     1960
## 2594         9.179560         4.069401        0.4738762         1981     1980
## 2595        15.575563         4.225553        0.4665953         1982     1980
## 2596        19.254027         4.125124        0.4493530         1965     1960
## 2597        17.346785         4.364632        0.4662910         1959     1950
## 2598        10.142976         4.086840        0.4438289         1975     1970
## 2599         8.219309         4.258496        0.4030606         1962     1960
## 2600        17.014773         4.231407        0.4599083         1974     1970
## 2601         9.713173         4.152534        0.4834499         1956     1950
## 2602        22.009941         4.359690        0.4816894         1958     1950
## 2603        15.459472         4.293456        0.4870843         1983     1980
## 2604        14.546779         4.400287        0.4548496         1960     1960
## 2605         8.357988         4.209500        0.4557000         1965     1960
## 2606        10.210418         4.244009        0.4491368         1983     1980
## 2607        12.164685         4.233263        0.4682517         1974     1970
## 2608        23.346162         4.382343        0.4430963         1967     1960
## 2609        12.042775         4.435052        0.4808515         1971     1970
## 2610        10.084239         4.096280        0.4264045         1971     1970
## 2611        12.146424         4.291144        0.4895450         1967     1960
## 2612        19.277225         4.361008        0.4734717         1971     1970
## 2613        10.929182         4.269811        0.4431820         1971     1970
## 2614        14.986020         4.591087        0.4957277         1982     1980
## 2615        12.896663         3.898685        0.4356413         1971     1970
## 2616        13.903406         3.930405        0.3271346         1973     1970
## 2617        17.788489         4.422802        0.5143746         1977     1970
## 2618        11.885724         4.045710        0.4350999         1969     1960
## 2619        14.118186         4.011769        0.4873363         1953     1950
## 2620         8.170638         4.020066        0.4405174         1973     1970
## 2621        20.024808         4.219241        0.4366876         1978     1970
## 2622        17.114659         3.986266        0.4023232         1971     1970
## 2623        13.050620         4.280610        0.4930343         1976     1970
## 2624        12.782048         4.239531        0.4728870         1975     1970
## 2625         9.391733         4.334120        0.4542453         1982     1980
## 2626         8.271716         4.238490        0.4599778         1978     1970
## 2627         9.839353         4.165488        0.4864562         1978     1970
## 2628        15.456365         4.280038        0.4167577         1973     1970
## 2629        10.739905         4.035512        0.4297449         1963     1960
## 2630        13.924516         4.084852        0.4149733         1965     1960
## 2631        17.573228         4.323404        0.4566587         1983     1980
## 2632        13.949269         4.114295        0.4256620         1979     1970
## 2633        10.062113         4.146020        0.4572722         1966     1960
## 2634        11.171042         3.947866        0.4438337         1971     1970
## 2635        16.489100         4.399405        0.4923353         1979     1970
## 2636         9.502774         4.235389        0.4601757         1969     1960
## 2637        15.888597         4.048009        0.3902932         1951     1950
## 2638         9.864265         3.957154        0.3663257         1972     1970
## 2639        15.704589         4.162132        0.4385710         1957     1950
## 2640        18.567348         4.103216        0.4437464         1959     1950
## 2641        13.070839         4.329532        0.4802920         1982     1980
## 2642        17.358393         4.146544        0.4280225         1983     1980
## 2643        11.851922         4.105028        0.4468421         1963     1960
## 2644        15.757965         4.296034        0.4631095         1978     1970
## 2645        20.111085         4.290679        0.4543752         1973     1970
## 2646        12.907615         4.270398        0.4465748         1983     1980
## 2647        11.370074         4.141839        0.4655429         1983     1980
## 2648        12.401564         3.880268        0.4207750         1984     1980
## 2649        11.454073         4.140158        0.4518699         1963     1960
## 2650        15.746170         4.641729        0.5468788         1980     1980
## 2651        19.375090         4.368551        0.4841519         1965     1960
## 2652        16.902767         4.196667        0.4025575         1972     1970
## 2653        17.219470         4.081891        0.4359825         1989     1980
## 2654        10.679528         4.278613        0.4711576         1951     1950
## 2655        11.975290         4.287224        0.4857437         1972     1970
## 2656        11.269779         4.371583        0.5081900         1974     1970
## 2657         9.928685         4.208489        0.4946978         1974     1970
## 2658        17.001373         4.134708        0.4392019         1985     1980
## 2659        28.561997         4.152424        0.4084348         1963     1960
## 2660        12.011846         4.183480        0.4601614         1964     1960
## 2661        15.931169         4.193990        0.4658141         1989     1980
## 2662        12.342995         4.106510        0.4118776         1973     1970
## 2663        13.601438         4.209680        0.4742049         1987     1980
## 2664        21.055566         4.288456        0.4665010         1988     1980
## 2665         9.437314         4.099296        0.4581497         1973     1970
## 2666        14.841427         4.223433        0.4579474         1968     1960
## 2667        29.318031         4.209268        0.4414870         1958     1950
## 2668        10.130595         4.173776        0.4735892         1979     1970
## 2669        19.736687         4.169418        0.4474077         1965     1960
## 2670        11.648852         4.211505        0.4628110         1960     1960
## 2671         8.259398         3.975171        0.4379328         1979     1970
## 2672        16.128003         4.191925        0.4571155         1956     1950
## 2673        19.319021         4.435636        0.4723644         1953     1950
## 2674        19.981076         4.159650        0.4745433         1972     1970
## 2675        17.366336         4.212796        0.4759331         1973     1970
## 2676        17.302441         4.239086        0.4579248         1957     1950
## 2677        12.309702         4.139000        0.4310000         1973     1970
## 2678        17.437239         3.846255        0.4119359         1969     1960
## 2679         8.436911         4.044700        0.4614538         1964     1960
## 2680        14.741849         4.093640        0.4598621         1983     1980
## 2681        14.849705         4.404622        0.4845972         1951     1950
## 2682        13.937868         4.130724        0.4976828         1970     1970
## 2683        11.267549         4.319133        0.4770270         1980     1980
## 2684        14.380969         4.208114        0.4719819         1978     1970
## 2685        22.085801         4.497864        0.5137449         1982     1980
## 2686        17.754033         4.545249        0.4775528         1968     1960
## 2687        15.102510         4.029534        0.4007781         1962     1960
## 2688        14.460999         4.361642        0.4979158         1964     1960
## 2689        13.730833         4.043650        0.4170182         1957     1950
## 2690         9.837445         4.008798        0.4349545         1975     1970
## 2691         9.166985         3.897560        0.4302304         1984     1980
## 2692        12.869814         4.453381        0.4671217         1974     1970
## 2693        13.941287         4.454857        0.5002617         1979     1970
## 2694        11.350637         4.434505        0.4976423         1977     1970
## 2695        13.999184         4.012448        0.4238876         1973     1970
## 2696        13.409133         4.232267        0.4784172         1956     1950
## 2697        15.412998         4.174929        0.4119447         1969     1960
## 2698        11.690040         4.284451        0.4804998         1983     1980
## 2699        11.283313         3.955029        0.4310129         1976     1970
## 2700        10.088745         3.982400        0.4409000         1981     1980
## 2701        16.173787         4.229440        0.4398487         1981     1980
## 2702        14.429761         4.216804        0.4521138         1978     1970
## 2703         9.434987         4.221248        0.3700732         1972     1970
## 2704        11.676819         4.031339        0.4198975         1973     1970
## 2705        12.127643         3.989930        0.4353897         1979     1970
## 2706        10.916830         3.982529        0.4367322         1978     1970
## 2707        11.308903         3.969100        0.3952000         1964     1960
## 2708        15.940228         4.142556        0.4810766         1954     1950
## 2709         9.565275         4.142221        0.4686487         1967     1960
## 2710        12.377727         4.058075        0.4557163         1975     1970
## 2711        14.581589         4.066700        0.4460365         1975     1970
## 2712        11.426960         4.066382        0.4428860         1975     1970
## 2713        12.643532         4.057962        0.4461254         1983     1980
## 2714        18.213711         4.298175        0.4585153         1955     1950
## 2715        14.520470         4.186800        0.4489000         1978     1970
## 2716        11.881710         4.302685        0.4926041         1957     1950
## 2717        11.372199         4.296043        0.4801505         1970     1970
## 2718        17.279273         4.217652        0.4634240         1952     1950
## 2719        12.272884         4.456810        0.4381033         1982     1980
## 2720        88.962458         4.286800        0.3648000         1979     1970
## 2721        13.899772         4.175400        0.4270000         1974     1970
## 2722        13.086108         4.080522        0.4549099         1956     1950
## 2723        20.485723         4.423338        0.5063795         1972     1970
## 2724        11.644360         4.051112        0.4141879         1950     1950
## 2725        22.841526         4.117000        0.4305587         1971     1970
## 2726        19.956295         4.182742        0.4395464         1954     1950
## 2727        19.895213         4.186517        0.4397320         1957     1950
## 2728        14.754284         4.379688        0.4975988         1956     1950
## 2729        12.641845         4.314168        0.4575584         1970     1970
## 2730        12.966419         4.053356        0.4480797         1956     1950
## 2731        11.097042         4.141316        0.4447759         1983     1980
## 2732        19.129043         4.147177        0.4239335         1950     1950
## 2733        15.098952         3.812440        0.4282051         1975     1970
## 2734        11.352498         4.002264        0.4210286         1962     1960
## 2735        16.788139         4.316270        0.4761722         1952     1950
## 2736        12.259321         4.125819        0.4697201         1981     1980
## 2737         9.310028         4.102495        0.4597393         1973     1970
## 2738         9.181163         4.137500        0.4371000         1983     1980
## 2739        12.304744         4.090768        0.4336397         1980     1980
## 2740         9.914673         3.929260        0.4470320         1980     1980
## 2741         9.179870         4.631548        0.4725553         1983     1980
## 2742        15.101929         4.106406        0.4265482         1983     1980
## 2743        12.729696         4.310453        0.4929949         1984     1980
## 2744        13.322031         4.194476        0.4834332         1983     1980
## 2745        13.023181         3.983715        0.4207473         1983     1980
## 2746        43.625554         4.349711        0.4647214         1950     1950
## 2747        12.877649         3.868863        0.3962740         1963     1960
## 2748         9.887733         4.158995        0.4635161         1982     1980
## 2749         9.893946         4.299877        0.4564894         1964     1960
## 2750        13.295657         4.201500        0.4381000         1974     1970
## 2751        11.444357         4.097232        0.4654618         1977     1970
## 2752         9.979401         3.969900        0.4305000         1978     1970
## 2753         8.565032         4.192309        0.4340118         1960     1960
## 2754        11.550228         4.082236        0.4656854         1984     1980
## 2755         9.882386         4.199366        0.4830058         1962     1960
## 2756        17.148497         3.768323        0.3308470         1979     1970
## 2757        11.138951         4.278593        0.4631779         1983     1980
## 2758        13.618901         4.228476        0.4774267         1982     1980
## 2759        13.579554         4.089554        0.4384754         1951     1950
## 2760        21.505338         4.352231        0.4792484         1984     1980
## 2761        10.196933         4.338697        0.4733503         1960     1960
## 2762        17.403931         4.291983        0.4921323         1983     1980
## 2763        21.136211         4.110475        0.4182259         1967     1960
## 2764        23.992403         4.030624        0.4119573         1979     1970
## 2765        15.458111         4.202184        0.4760343         1966     1960
## 2766         8.349729         4.150868        0.4381002         1967     1960
## 2767        13.938834         4.365966        0.4518491         1984     1980
## 2768        10.025644         4.071789        0.4560025         1984     1980
## 2769        14.024684         4.277276        0.4471767         1974     1970
## 2770        11.406090         4.132600        0.4510000         1964     1960
## 2771        10.493742         4.346427        0.4460446         1984     1980
## 2772        10.340489         4.003997        0.4723205         1983     1980
## 2773        18.172097         3.953570        0.4165387         1956     1950
## 2774        23.373145         4.289317        0.4579260         1957     1950
## 2775        23.291896         3.988978        0.4352942         1979     1970
## 2776        13.286602         4.199665        0.4369336         1984     1980
## 2777        17.427866         4.112126        0.4313993         1970     1970
## 2778        11.236227         4.172432        0.4584499         1958     1950
## 2779        14.435153         4.115399        0.4453439         1956     1950
## 2780        14.151710         4.195313        0.4485689         1966     1960
## 2781        22.230915         4.132128        0.4311031         1954     1950
## 2782        12.294019         4.054109        0.4310883         1959     1950
## 2783         9.492564         4.218100        0.4705087         1957     1950
## 2784         8.472356         4.055953        0.4431211         1979     1970
## 2785        10.311479         4.082283        0.4303591         1970     1970
## 2786        14.214369         4.273290        0.4759366         1985     1980
## 2787        12.277281         4.168601        0.4672358         1984     1980
## 2788        15.755158         3.878889        0.3948417         1985     1980
## 2789         9.537261         4.067086        0.4865251         1975     1970
## 2790        11.142839         4.113200        0.4873000         1986     1980
## 2791        11.101450         4.055270        0.4291908         1987     1980
## 2792        16.978101         4.555177        0.5373558         1984     1980
## 2793        10.696448         4.112400        0.5063000         1987     1980
## 2794        28.517551         4.428216        0.4932273         1988     1980
## 2795        15.977398         4.017177        0.4482352         1982     1980
## 2796        16.895666         3.891175        0.4050151         1983     1980
## 2797        14.978101         4.340227        0.4592004         1974     1970
## 2798        13.152716         4.258379        0.4604576         1954     1950
## 2799        11.008381         4.175200        0.4537000         1979     1970
## 2800        18.584615         4.232966        0.4407302         1962     1960
## 2801        17.709274         4.089700        0.4380500         1956     1950
## 2802        21.718993         4.249395        0.4342195         1967     1960
## 2803        13.324955         4.341725        0.4834987         1971     1970
## 2804        15.867704         4.539029        0.5173112         1984     1980
## 2805        11.224969         4.319623        0.4861281         1984     1980
## 2806        18.782099         4.395278        0.4747988         1972     1970
## 2807        14.381437         4.595182        0.5390366         1954     1950
## 2808        13.353508         4.268101        0.4841527         1956     1950
## 2809        13.562850         4.201139        0.4525301         1984     1980
## 2810        25.290020         4.104890        0.4316502         1964     1960
## 2811        16.438275         4.180089        0.4546496         1978     1970
## 2812        24.309828         4.330744        0.4528367         1965     1960
## 2813        13.619085         4.376597        0.4886188         1966     1960
## 2814         8.460954         3.987906        0.4235341         1953     1950
## 2815        10.441499         4.064488        0.4368966         1952     1950
## 2816        13.282506         4.135525        0.4443869         1963     1960
## 2817        11.117796         4.263856        0.4811192         1985     1980
## 2818        13.045693         4.181047        0.4342456         1976     1970
## 2819        14.440186         4.390350        0.5033101         1981     1980
## 2820        13.424212         4.065609        0.4508890         1956     1950
## 2821        12.289964         4.159356        0.4602663         1985     1980
## 2822        11.431041         4.144400        0.4590690         1984     1980
## 2823         8.457780         4.106291        0.4919019         1983     1980
## 2824        13.147066         4.355380        0.5117043         1979     1970
## 2825        20.874990         4.511492        0.5055594         1963     1960
## 2826        14.700106         4.326979        0.4699914         1971     1970
## 2827        16.127070         4.219600        0.4565430         1957     1950
## 2828        18.103986         4.273134        0.4326515         1985     1980
## 2829        11.649701         4.322358        0.4975224         1960     1960
## 2830        18.578580         4.725556        0.5151284         1972     1970
## 2831        14.638359         4.132334        0.4285012         1985     1980
## 2832        11.592479         4.176640        0.4851318         1986     1980
## 2833        51.574305         4.367381        0.4412871         1985     1980
## 2834        14.501990         4.118946        0.4388989         1985     1980
## 2835        17.852282         4.523038        0.4898660         1951     1950
## 2836         9.792047         3.659700        0.3211000         1983     1980
## 2837        21.320332         4.114300        0.4362000         1982     1980
## 2838        16.440682         4.053997        0.4402419         1961     1960
## 2839        16.329911         4.038712        0.4481479         1971     1970
## 2840        14.513798         4.595016        0.5390980         1975     1970
## 2841        15.074830         4.159291        0.4576910         1970     1970
## 2842        15.429740         4.617854        0.4727017         1959     1950
## 2843        14.066015         4.329125        0.4726514         1983     1980
## 2844         8.731739         3.991387        0.4039187         1969     1960
## 2845        12.690957         4.304084        0.4700063         1973     1970
## 2846        17.327232         3.970204        0.4606344         1960     1960
## 2847         9.388063         4.140750        0.4302849         1968     1960
## 2848        11.361728         4.234418        0.4238401         1983     1980
## 2849         8.496392         4.024826        0.4273208         1978     1970
## 2850        14.027800         4.307502        0.4384237         1956     1950
## 2851        38.135908         4.317337        0.4423929         1961     1960
## 2852        18.515798         4.482976        0.4884890         1958     1950
## 2853        16.523530         4.192013        0.4506716         1970     1970
## 2854        12.326715         4.265824        0.4834287         1975     1970
## 2855        13.012101         4.265890        0.5221553         1971     1970
## 2856        12.805787         4.035060        0.4228503         1957     1950
## 2857        18.095855         4.202513        0.4503265         1982     1980
## 2858        23.180892         4.164799        0.4551432         1954     1950
## 2859        14.011215         3.989359        0.4271515         1955     1950
## 2860        18.468557         4.113894        0.4232416         1983     1980
## 2861        25.540900         4.502589        0.4664315         1983     1980
## 2862        13.590150         4.198856        0.4508011         1962     1960
## 2863        10.504080         4.050987        0.4437366         1976     1970
## 2864        17.951827         4.250621        0.4655435         1978     1970
## 2865        17.065447         4.224643        0.4228848         1962     1960
## 2866        18.599437         4.251443        0.4584770         1977     1970
## 2867        18.204833         4.160222        0.4236581         1974     1970
## 2868        12.272551         4.053895        0.4561595         1974     1970
## 2869        14.439955         4.377255        0.4945088         1983     1980
## 2870         9.242803         4.181763        0.4314193         1980     1980
## 2871        24.082584         4.534138        0.4664144         1958     1950
## 2872        42.345572         4.157377        0.4533757         1982     1980
## 2873        12.617435         4.174260        0.4485670         1955     1950
## 2874        10.727750         4.309529        0.5196048         1958     1950
## 2875         7.414843         3.995300        0.4449000         1976     1970
## 2876        10.132392         4.198068        0.4724391         1970     1970
## 2877        16.642440         4.145303        0.4340594         1965     1960
## 2878        12.977437         4.275571        0.4966463         1972     1970
## 2879        14.894026         4.100921        0.4759771         1974     1970
## 2880        13.022966         4.542095        0.4802374         1982     1980
## 2881        14.942203         3.861654        0.4040732         1983     1980
## 2882        11.161273         4.175449        0.4535885         1974     1970
## 2883         7.735673         4.055703        0.4533412         1981     1980
## 2884        15.159538         4.086491        0.4097227         1969     1960
## 2885        11.799285         4.058166        0.4394529         1951     1950
## 2886        14.604059         4.163006        0.4638357         1972     1970
## 2887        12.146162         4.140013        0.4521443         1968     1960
## 2888        15.872104         4.078840        0.4203064         1961     1960
## 2889        10.206612         4.557818        0.5556342         1969     1960
## 2890       112.418333         4.297199        0.4162199         1978     1970
## 2891        20.447554         4.000481        0.3973750         1958     1950
## 2892        18.140986         4.160700        0.4294000         1967     1960
## 2893         9.900784         4.101100        0.4676000         1969     1960
## 2894        15.578067         4.460970        0.4552669         1958     1950
## 2895        16.688497         4.401769        0.4963971         1983     1980
## 2896        13.795653         3.927786        0.4314423         1974     1970
## 2897        26.296012         4.655652        0.4629399         1982     1980
## 2898        11.052375         4.155116        0.4578268         1955     1950
## 2899        12.403432         4.127706        0.4558006         1976     1970
## 2900        39.686885         4.209079        0.3575291         1973     1970
## 2901        23.700807         4.267692        0.4655933         1965     1960
## 2902        14.256599         4.363905        0.4710193         1963     1960
## 2903        10.934320         4.001819        0.4606398         1971     1970
## 2904        12.798208         4.004021        0.4186967         1951     1950
## 2905        20.863712         4.080317        0.4800801         1960     1960
## 2906        16.386122         4.067725        0.4521766         1962     1960
## 2907        16.440273         4.391954        0.4681208         1963     1960
## 2908        12.895772         4.341297        0.4705771         1960     1960
## 2909        27.855019         3.975551        0.3696701         1962     1960
## 2910        13.914986         4.305455        0.4749094         1964     1960
## 2911        10.938499         4.214500        0.4418106         1960     1960
## 2912        12.069305         4.119659        0.4452430         1965     1960
## 2913        14.778570         4.543266        0.4735593         1956     1950
## 2914        12.330206         4.112378        0.4593977         1966     1960
## 2915        10.244051         4.234764        0.4566693         1962     1960
## 2916        10.680736         4.494159        0.4735209         1983     1980
## 2917         8.117401         3.882471        0.4153701         1955     1950
## 2918        13.023652         4.421341        0.4772995         1968     1960
## 2919        16.120492         4.293375        0.4601646         1969     1960
## 2920        12.437720         4.206765        0.4963082         1977     1970
## 2921        11.428945         4.167898        0.4396038         1972     1970
## 2922        13.543647         4.171005        0.4372856         1977     1970
## 2923        16.820693         4.550125        0.4810360         1978     1970
## 2924        10.636092         4.211359        0.4642548         1953     1950
## 2925        12.774946         4.277399        0.4701966         1960     1960
## 2926        15.125313         3.975182        0.4330809         1976     1970
## 2927        16.209280         4.274436        0.4444291         1984     1980
## 2928        17.677365         4.061382        0.4192158         1976     1970
## 2929        15.478627         4.139095        0.4321113         1955     1950
## 2930        14.886313         4.074787        0.4152670         1970     1970
## 2931        18.505834         3.968017        0.3677988         1966     1960
## 2932        14.301101         4.143266        0.4746512         1965     1960
## 2933         6.091111         3.766540        0.3831168         1980     1980
## 2934        14.793698         4.261823        0.4158141         1983     1980
## 2935        15.116311         4.185100        0.4871000         1956     1950
## 2936        12.649513         4.079638        0.4360724         1950     1950
## 2937        13.686101         4.262825        0.4633010         1982     1980
## 2938        17.341517         4.251144        0.4700813         1967     1960
## 2939        14.802738         4.449682        0.4820949         1979     1970
## 2940        15.471581         4.100429        0.4416288         1971     1970
## 2941        12.607156         4.106402        0.4470426         1982     1980
## 2942        18.932026         4.201162        0.4513428         1980     1980
## 2943        14.558449         4.222100        0.4725000         1980     1980
## 2944        15.526139         4.327511        0.4681327         1964     1960
## 2945        15.067858         4.245773        0.4438313         1982     1980
## 2946        13.422317         4.560798        0.5064617         1982     1980
## 2947         9.736811         3.996218        0.4247723         1970     1970
## 2948        12.323727         4.191978        0.4484738         1977     1970
## 2949        14.910071         4.127118        0.4436819         1971     1970
## 2950         9.727952         3.916611        0.4351227         1983     1980
## 2951        27.855048         4.479518        0.4696826         1966     1960
## 2952        16.363275         4.316235        0.4439293         1973     1970
## 2953        15.435397         4.248023        0.4536545         1984     1980
## 2954        20.514693         4.361825        0.4511833         1975     1970
## 2955        16.494440         3.949594        0.4245883         1975     1970
## 2956        17.181400         4.404617        0.4951678         1982     1980
## 2957        10.135724         4.117703        0.4427229         1967     1960
## 2958        10.048116         4.238699        0.4738194         1980     1980
## 2959        15.286423         4.100538        0.4428104         1982     1980
## 2960        17.638405         4.235546        0.4734658         1953     1950
## 2961        18.290371         4.562837        0.5109702         1950     1950
## 2962        13.536439         4.258976        0.4831116         1968     1960
## 2963        14.867367         4.379857        0.5341130         1973     1970
## 2964        12.265792         4.125427        0.4255630         1977     1970
## 2965        16.151732         4.039127        0.4335900         1962     1960
## 2966        13.255594         4.296257        0.5203781         1975     1970
## 2967        17.491147         4.262317        0.4589927         1971     1970
## 2968        12.605823         4.262424        0.4638585         1964     1960
## 2969        15.702139         4.389546        0.4463060         1965     1960
## 2970         8.422095         4.018835        0.4457373         1967     1960
## 2971        18.513348         4.453363        0.4697409         1951     1950
## 2972        11.912335         4.256349        0.4579199         1983     1980
## 2973        13.428314         4.204761        0.4480378         1983     1980
## 2974        12.634594         4.285031        0.4728782         1971     1970
## 2975         8.845754         4.404713        0.4577209         1978     1970
## 2976        11.100803         4.374783        0.4747653         1977     1970
## 2977        14.437243         4.283500        0.4913000         1982     1980
## 2978        16.908384         4.277045        0.4820521         1969     1960
## 2979        14.168844         4.067710        0.4533113         1984     1980
## 2980        12.849448         4.529918        0.5065991         1971     1970
## 2981        15.651678         4.253367        0.5063599         1979     1970
## 2982        31.915506         4.059426        0.3224132         1970     1970
## 2983        16.865318         4.370666        0.4245732         1950     1950
## 2984        12.592726         4.045795        0.4463430         1981     1980
## 2985        13.698596         4.353720        0.4644883         1956     1950
## 2986        14.979708         4.290613        0.4750135         1963     1960
## 2987        16.568487         4.289204        0.4754893         1960     1960
## 2988        17.757020         4.352108        0.4871299         1963     1960
## 2989        11.892153         4.122150        0.4456545         1980     1980
## 2990        20.615889         4.206977        0.4164511         1958     1950
## 2991         9.415929         4.587201        0.4916918         1979     1970
## 2992        16.456623         4.418802        0.4954846         1977     1970
## 2993        23.866834         4.247182        0.4578545         1970     1970
## 2994        15.177728         4.290225        0.4560880         1983     1980
## 2995        12.295164         4.015285        0.4475581         1963     1960
## 2996        15.234423         4.053916        0.4598485         1977     1970
## 2997        12.499512         4.370219        0.4664642         1981     1980
## 2998        14.331735         4.177067        0.4712968         1972     1970
## 2999        12.848696         4.346664        0.4658663         1963     1960
## 3000        14.837667         4.142407        0.4186948         1971     1970
## 3001        23.210647         4.207520        0.4884805         1974     1970
## 3002        15.710056         4.444033        0.4757321         1978     1970
## 3003        14.483854         4.277426        0.4832074         1951     1950
## 3004        11.195680         4.060460        0.4477525         1967     1960
## 3005        14.726697         4.533462        0.5244988         1955     1950
## 3006        13.187524         4.454468        0.5112457         1963     1960
## 3007        10.591055         4.163175        0.4443035         1980     1980
## 3008         9.337374         3.909794        0.4505092         1984     1980
## 3009        10.908683         4.012734        0.4398846         1966     1960
## 3010        13.245852         4.330713        0.4708170         1978     1970
## 3011        10.615392         4.306870        0.4757241         1958     1950
## 3012        12.582163         4.347976        0.4755411         1966     1960
## 3013        12.906825         4.435781        0.4984041         1960     1960
## 3014        12.258920         4.130200        0.4392000         1964     1960
## 3015        15.336342         4.072926        0.4591822         1955     1950
## 3016        15.880467         4.397595        0.4622381         1963     1960
## 3017        41.619056         4.282404        0.4621445         1959     1950
## 3018         8.432117         4.354423        0.4711256         1974     1970
## 3019        29.702671         4.156030        0.4454797         1963     1960
## 3020        23.464714         4.290227        0.4395826         1976     1970
## 3021        25.356116         4.505960        0.5174378         1979     1970
## 3022        15.781116         4.083617        0.4412292         1982     1980
## 3023        11.374548         4.156574        0.4410011         1982     1980
## 3024        14.236608         4.251202        0.4370095         1956     1950
## 3025        10.142599         4.016314        0.4329175         1955     1950
## 3026        13.191868         4.085356        0.4390959         1955     1950
## 3027        12.521484         4.480425        0.5142050         1972     1970
## 3028        15.505648         4.125478        0.4193040         1969     1960
## 3029        19.833687         4.083472        0.4462279         1963     1960
## 3030        16.390449         4.328776        0.4625257         1963     1960
## 3031        15.958433         4.451803        0.4809783         1961     1960
## 3032        11.477708         4.312500        0.4509000         1963     1960
## 3033        10.235709         4.236313        0.4943283         1984     1980
## 3034        14.093590         4.236807        0.4339379         1959     1950
## 3035        10.611584         4.023428        0.4515694         1979     1970
## 3036         9.465586         4.184401        0.4573984         1958     1950
## 3037        10.751913         4.110753        0.4546414         1971     1970
## 3038         9.420955         4.097755        0.4554688         1978     1970
## 3039        16.736488         4.126271        0.4597838         1976     1970
## 3040        11.819096         4.069090        0.4684332         1960     1960
## 3041        10.436438         4.297055        0.4710470         1983     1980
## 3042        26.409120         4.201353        0.4248879         1969     1960
## 3043        10.695479         4.167063        0.4710723         1966     1960
## 3044        11.824756         4.074384        0.4493000         1968     1960
## 3045         9.197769         4.169323        0.4272850         1975     1970
## 3046        21.127388         4.122334        0.4630777         1976     1970
## 3047        20.774717         4.332474        0.4599044         1967     1960
## 3048         8.556365         4.130304        0.4583637         1970     1970
## 3049        14.934255         3.991612        0.4326822         1963     1960
## 3050        13.989746         4.122249        0.4352210         1974     1970
## 3051        11.199943         3.995900        0.4631408         1957     1950
## 3052        15.599205         4.127669        0.4301281         1980     1980
## 3053        12.837550         4.461134        0.4967990         1955     1950
## 3054        26.267729         4.146150        0.4331370         1964     1960
## 3055        12.001988         4.212021        0.4446915         1954     1950
## 3056        16.870909         4.355313        0.5085167         1971     1970
## 3057        15.426117         4.325969        0.5013540         1953     1950
## 3058         8.647859         4.283900        0.5085000         1984     1980
## 3059        17.417907         4.044696        0.4199817         1954     1950
## 3060        21.494295         4.215858        0.4502223         1973     1970
## 3061        13.142755         4.173269        0.4498008         1955     1950
## 3062        17.646429         4.353250        0.4974865         1956     1950
## 3063        16.734537         4.261535        0.4614678         1953     1950
## 3064        29.750351         4.186411        0.4243447         1972     1970
## 3065        15.538186         4.223000        0.4395000         1972     1970
## 3066        11.279016         4.220508        0.4519020         1976     1970
## 3067         9.476423         4.350469        0.5314954         1976     1970
## 3068        20.286412         4.397322        0.4831835         1977     1970
## 3069        13.072639         4.427138        0.4995796         1967     1960
## 3070        10.866960         4.174800        0.4787000         1971     1970
## 3071         9.079013         4.191040        0.4693853         1977     1970
## 3072        12.153253         4.110873        0.4287939         1971     1970
## 3073        13.370581         3.956238        0.4286566         1973     1970
## 3074        22.069640         4.316900        0.4875000         1972     1970
## 3075        16.582649         4.114500        0.4110000         1965     1960
## 3076        13.547751         3.988501        0.4275123         1969     1960
## 3077        14.282165         4.247640        0.4379271         1984     1980
## 3078        12.491208         4.344434        0.4848517         1971     1970
## 3079        17.137985         4.322800        0.4862000         1978     1970
## 3080        13.340340         4.148557        0.4633252         1957     1950
## 3081         8.292673         3.976810        0.3982095         1984     1980
## 3082        14.952228         4.421208        0.4785875         1984     1980
## 3083        20.932551         4.148803        0.4454897         1978     1970
## 3084        20.048169         4.493174        0.4668262         1964     1960
## 3085        11.796127         4.152182        0.4530121         1954     1950
## 3086        20.794622         4.351172        0.4721369         1973     1970
## 3087        12.594598         4.045697        0.4370916         1962     1960
## 3088        15.656919         4.293399        0.4437484         1984     1980
## 3089        15.440025         4.206800        0.4662000         1978     1970
## 3090         8.738365         3.886139        0.4411841         1961     1960
## 3091        12.274432         4.267983        0.4472923         1981     1980
## 3092        20.254904         4.191100        0.4370000         1966     1960
## 3093        10.144263         3.948195        0.3876391         1951     1950
## 3094        14.505817         4.204826        0.4742756         1959     1950
## 3095        13.632955         4.145000        0.4363000         1964     1960
## 3096        18.465704         4.021183        0.4323139         1967     1960
## 3097        17.891762         4.088013        0.4042399         1955     1950
## 3098         9.263393         3.865887        0.4401028         1962     1960
## 3099        15.038609         4.417757        0.5193590         1981     1980
## 3100        14.811063         4.463000        0.4725000         1972     1970
## 3101        11.264612         4.080619        0.4303703         1950     1950
## 3102        17.530455         3.946333        0.4148709         1971     1970
## 3103        10.790467         4.081450        0.4450240         1972     1970
## 3104        13.308257         4.131384        0.4573210         1979     1970
## 3105        13.539529         4.294473        0.4775712         1984     1980
## 3106        11.752307         4.197751        0.4599266         1968     1960
## 3107        10.669725         4.013857        0.4134193         1974     1970
## 3108        11.195356         4.028562        0.4517633         1964     1960
## 3109        14.428510         3.908031        0.4240909         1971     1970
## 3110        21.482066         4.275900        0.4507000         1957     1950
## 3111        10.844539         4.001287        0.4397775         1972     1970
## 3112        10.727181         4.096100        0.4141000         1976     1970
## 3113        25.420094         4.268937        0.4585775         1984     1980
## 3114        17.410761         4.504960        0.4977213         1984     1980
## 3115        11.980328         4.315486        0.4667182         1959     1950
## 3116        13.617212         4.373156        0.4966551         1982     1980
## 3117        13.413648         4.208346        0.4290245         1964     1960
## 3118        16.074697         4.213539        0.4406699         1965     1960
## 3119        18.401751         4.075105        0.4326352         1950     1950
## 3120        13.662466         4.101953        0.4482743         1981     1980
## 3121        11.868095         4.183579        0.4336634         1983     1980
## 3122        13.234481         4.025749        0.4228226         1961     1960
## 3123        12.683293         4.279626        0.4777761         1971     1970
## 3124        16.297926         4.187910        0.4493435         1970     1970
## 3125        15.228603         4.284597        0.4524063         1964     1960
## 3126        17.983993         4.016361        0.4163322         1962     1960
## 3127        14.636186         4.062906        0.4438868         1984     1980
## 3128        13.397085         4.367133        0.5018389         1982     1980
## 3129        13.693577         3.859968        0.4146042         1984     1980
## 3130        18.948948         4.314307        0.4473143         1971     1970
## 3131        19.393089         4.303573        0.4734143         1952     1950
## 3132        11.378521         4.044055        0.4522092         1964     1960
## 3133        14.128092         4.211397        0.4639379         1977     1970
## 3134        10.799226         4.606251        0.5103589         1976     1970
## 3135        17.365964         4.197965        0.3982467         1973     1970
## 3136         8.088358         4.058054        0.4595002         1983     1980
## 3137        13.777503         4.170500        0.4350000         1954     1950
## 3138        19.655396         4.332103        0.4311379         1953     1950
## 3139        13.804156         3.898800        0.3548000         1969     1960
## 3140        16.328516         4.291401        0.4512842         1962     1960
## 3141        12.684535         4.253226        0.4626586         1984     1980
## 3142        16.047064         3.988590        0.3816947         1965     1960
## 3143        19.477351         4.331883        0.4891455         1971     1970
## 3144        10.726818         4.230766        0.5027523         1975     1970
## 3145        17.273414         4.170413        0.4613947         1973     1970
## 3146        16.025455         4.088216        0.3978408         1981     1980
## 3147         9.879842         4.001089        0.4672409         1950     1950
## 3148        11.173444         4.191307        0.4430663         1971     1970
## 3149        11.825333         4.178107        0.4666498         1972     1970
## 3150        11.427334         4.237221        0.4718818         1965     1960
## 3151        14.563194         4.329800        0.4786000         1963     1960
## 3152        14.739446         3.995256        0.4137717         1970     1970
## 3153        15.013961         4.313181        0.4613925         1962     1960
## 3154         9.214876         4.065118        0.4412469         1968     1960
## 3155        19.002803         4.433312        0.4473941         1966     1960
## 3156        20.179891         4.224365        0.4936957         1979     1970
## 3157        14.924344         4.178823        0.4287240         1982     1980
## 3158        11.218139         4.190450        0.4842081         1950     1950
## 3159        12.543977         4.179390        0.4742236         1955     1950
## 3160        13.551609         4.092405        0.4406291         1984     1980
## 3161         9.961140         3.769289        0.3681163         1966     1960
## 3162         8.723135         4.215907        0.3956597         1962     1960
## 3163        12.693006         4.322285        0.4765455         1971     1970
## 3164        10.132504         4.037202        0.4220189         1960     1960
## 3165        14.752554         4.533404        0.4606802         1960     1960
## 3166         6.489594         4.216200        0.4488000         1978     1970
## 3167        10.432886         4.113292        0.4296207         1962     1960
## 3168         9.176159         4.602589        0.4808187         1976     1970
## 3169        11.324989         4.298138        0.4514110         1971     1970
## 3170        16.220259         4.194666        0.4255852         1955     1950
## 3171        14.863857         4.284000        0.4648000         1952     1950
## 3172        17.257786         4.139300        0.4495000         1974     1970
## 3173        10.386536         3.972573        0.4176388         1958     1950
## 3174        16.166396         4.223250        0.4694774         1960     1960
## 3175        15.556357         4.060504        0.4151847         1981     1980
## 3176        21.991270         4.383136        0.4777730         1985     1980
## 3177        15.627043         4.500571        0.5379617         1979     1970
## 3178        12.928698         4.266605        0.4591454         1972     1970
## 3179        12.588949         4.199045        0.4498703         1962     1960
## 3180        16.355977         4.065674        0.4164589         1967     1960
## 3181        20.772419         4.374635        0.4159307         1985     1980
## 3182        10.961706         4.117743        0.4894472         1984     1980
## 3183        15.039650         4.370797        0.4888067         1975     1970
## 3184        12.871674         4.129901        0.4317403         1981     1980
## 3185        21.929056         4.272457        0.4651521         1983     1980
## 3186        12.216788         4.211333        0.4425569         1978     1970
## 3187        30.473098         4.573382        0.5064093         1975     1970
## 3188        20.146012         4.159909        0.4077229         1966     1960
## 3189        15.112318         4.097200        0.4494000         1979     1970
## 3190        15.088860         4.046195        0.4474115         1984     1980
## 3191        12.142617         4.055700        0.4434000         1960     1960
## 3192        13.131099         3.977880        0.4498268         1956     1950
## 3193        12.986443         4.205625        0.4747229         1978     1970
## 3194        20.335751         4.678436        0.5304914         1963     1960
## 3195        19.673300         4.138289        0.4426612         1952     1950
## 3196        12.442780         4.151005        0.4345576         1979     1970
## 3197        22.045115         4.285006        0.4528953         1951     1950
## 3198        16.081163         4.367371        0.4870396         1967     1960
## 3199        11.680166         4.130204        0.4790939         1958     1950
## 3200        12.224508         4.305198        0.4737762         1965     1960
## 3201        13.521210         3.950656        0.4342401         1958     1950
## 3202        14.071427         4.257487        0.4871338         1966     1960
## 3203        16.096911         4.314155        0.4735402         1973     1970
## 3204        10.566406         4.265385        0.5243624         1975     1970
## 3205        13.705840         4.168392        0.4407619         1984     1980
## 3206        11.139379         4.197574        0.4627633         1952     1950
## 3207        11.971906         4.203980        0.4379769         1958     1950
## 3208        16.846666         4.136602        0.4574439         1977     1970
## 3209        12.793194         4.450084        0.4709612         1952     1950
## 3210        13.755110         4.391418        0.4715301         1981     1980
## 3211        24.301177         4.473628        0.5161265         1975     1970
## 3212        24.308717         4.368400        0.4666000         1970     1970
## 3213        15.776464         4.079596        0.4508962         1966     1960
## 3214        10.526589         4.112333        0.4426052         1954     1950
## 3215        12.496796         4.086917        0.4664187         1984     1980
## 3216        11.452498         4.153004        0.4478373         1967     1960
## 3217        17.861166         4.065248        0.4022199         1961     1960
## 3218        32.044350         4.175073        0.4601980         1983     1980
## 3219        15.073612         4.389987        0.4727755         1983     1980
## 3220        18.063888         4.355690        0.4755560         1960     1960
## 3221        10.650392         4.206534        0.4677217         1984     1980
## 3222        20.308230         4.167720        0.4514478         1969     1960
## 3223        17.123410         4.195471        0.4275669         1953     1950
## 3224        32.558042         4.192100        0.4690000         1971     1970
## 3225        14.337864         4.197534        0.4657492         1974     1970
## 3226        12.715620         3.929144        0.4759219         1970     1970
## 3227        12.988986         4.320673        0.4798278         1984     1980
## 3228         9.179697         4.064203        0.4444219         1964     1960
## 3229         9.118619         4.328246        0.4405439         1979     1970
## 3230         8.662847         4.245634        0.4358893         1980     1980
## 3231        19.343705         4.127521        0.4377732         1971     1970
## 3232        12.048424         4.209050        0.4509814         1992     1990
## 3233        13.235506         4.122603        0.4379603         1994     1990
## 3234        10.837792         4.056000        0.4758000         1993     1990
## 3235        17.107498         4.478229        0.4952739         1994     1990
## 3236        26.478793         4.335200        0.4520000         1994     1990
## 3237        18.275113         4.121413        0.4922893         1993     1990
## 3238        18.921935         4.323958        0.4572815         1993     1990
## 3239        11.188943         4.074157        0.4678183         1985     1980
## 3240         9.378339         4.210590        0.4517479         1980     1980
## 3241        14.401587         4.072482        0.4434030         1961     1960
## 3242        12.213320         3.952353        0.4345115         1981     1980
## 3243        17.185044         4.230483        0.4621466         1973     1970
## 3244        21.132039         4.375438        0.4689427         1960     1960
## 3245        12.228631         4.332976        0.4653157         1957     1950
## 3246        15.561005         4.214789        0.4594847         1958     1950
## 3247        11.216337         4.071646        0.4554940         1979     1970
## 3248        21.181088         4.214974        0.4598263         1961     1960
## 3249        24.044684         4.520018        0.5049596         1959     1950
## 3250        23.397751         4.401483        0.4140028         1979     1970
## 3251        14.927773         4.344474        0.5176938         1965     1960
## 3252        12.508886         4.236170        0.4458884         1973     1970
## 3253        13.630855         4.601537        0.5079214         1979     1970
## 3254        14.143944         4.335400        0.4826000         1966     1960
## 3255        17.018063         4.033926        0.4218601         1983     1980
## 3256        11.212292         4.103391        0.4467320         1974     1970
## 3257        11.560778         4.187700        0.4551870         1974     1970
## 3258        15.223997         4.042265        0.4283730         1959     1950
## 3259         8.587654         3.835242        0.4190728         1982     1980
## 3260         9.239762         4.058211        0.4543474         1962     1960
## 3261        12.660001         4.337092        0.4804087         1984     1980
## 3262        15.127113         4.408745        0.4658658         1958     1950
## 3263        17.561802         4.068563        0.3956785         1951     1950
## 3264        14.946066         4.154579        0.4558871         1967     1960
## 3265        17.659459         4.354049        0.4751028         1972     1970
## 3266        13.781234         4.225831        0.4530911         1980     1980
## 3267        16.073791         4.057939        0.4428637         1970     1970
## 3268        13.286484         3.971192        0.4139979         1985     1980
## 3269        18.040713         4.012383        0.4028780         1963     1960
## 3270        18.117605         4.284900        0.4530000         1984     1980
## 3271        56.434755         4.420378        0.4497416         1962     1960
## 3272        21.126847         4.414684        0.4992973         1967     1960
## 3273        15.132904         4.099291        0.4302600         1972     1970
## 3274        12.947563         4.262936        0.4372897         1971     1970
## 3275        10.857462         4.267900        0.5032000         1976     1970
## 3276        14.953361         4.207464        0.4657558         1952     1950
## 3277        14.617837         3.875010        0.3534365         1985     1980
## 3278        16.136146         3.906069        0.4206679         1982     1980
## 3279        11.735224         3.946844        0.4199515         1969     1960
## 3280        15.064294         4.132639        0.4577582         1966     1960
## 3281        16.306731         4.139300        0.4167000         1965     1960
## 3282        12.302432         4.232319        0.4441789         1978     1970
## 3283        12.621888         4.225070        0.4184791         1974     1970
## 3284         9.867757         4.033993        0.4413820         1981     1980
## 3285        14.307275         3.965209        0.4266848         1967     1960
## 3286        14.262283         4.201210        0.4102772         1968     1960
## 3287        11.090072         4.219222        0.4308559         1984     1980
## 3288        14.915145         4.356991        0.4800636         1969     1960
## 3289        13.468284         4.375931        0.4826474         1964     1960
## 3290        12.982143         4.266163        0.5055374         1983     1980
## 3291         9.605383         4.216554        0.4525604         1963     1960
## 3292        15.613288         4.336697        0.4751982         1978     1970
## 3293        12.405558         4.540063        0.5106445         1985     1980
## 3294        10.304262         4.000377        0.4321300         1971     1970
## 3295        10.938545         3.911127        0.4345595         1968     1960
## 3296        11.845338         4.187239        0.4807203         1958     1950
## 3297        12.374886         4.145700        0.4514000         1967     1960
## 3298        11.734510         4.258911        0.4720556         1975     1970
## 3299         8.834658         3.839593        0.3951832         1964     1960
## 3300        11.224159         4.061500        0.4255000         1960     1960
## 3301        14.045921         4.233570        0.4330479         1978     1970
## 3302        22.773458         4.349821        0.4687094         1974     1970
## 3303        19.753324         4.400828        0.4757486         1962     1960
## 3304        17.013000         4.129539        0.4709987         1976     1970
## 3305        19.845895         4.201532        0.4703510         1961     1960
## 3306        18.094462         4.282164        0.4741788         1965     1960
## 3307         9.910455         4.335470        0.4859877         1964     1960
## 3308         8.559138         3.973274        0.4434377         1982     1980
## 3309        17.689952         4.345408        0.4803476         1976     1970
## 3310         7.897566         3.714249        0.4035232         1971     1970
## 3311        13.533266         3.938975        0.4351447         1970     1970
## 3312        20.496824         4.040659        0.4417635         1979     1970
## 3313        17.142622         4.122245        0.4395396         1968     1960
## 3314        13.607750         4.134308        0.4600432         1966     1960
## 3315        18.238479         4.157474        0.4047056         1963     1960
## 3316        15.727202         4.456987        0.4762797         1981     1980
## 3317        12.863956         4.304800        0.4633000         1980     1980
## 3318        15.627681         4.242256        0.4889819         1960     1960
## 3319        17.561640         4.283670        0.4844641         1962     1960
## 3320        10.939182         4.282538        0.4803023         1981     1980
## 3321        15.612535         4.110398        0.4432799         1966     1960
## 3322        16.884660         4.179290        0.4359667         1954     1950
## 3323        16.153788         4.118912        0.4472446         1973     1970
## 3324        13.856137         4.197249        0.4568582         1976     1970
## 3325        13.724233         4.285870        0.4753807         1983     1980
## 3326        13.418998         3.940387        0.3714290         1953     1950
## 3327        10.949182         4.104718        0.4648366         1976     1970
## 3328        18.850818         4.198200        0.4205000         1978     1970
## 3329         9.669954         3.969174        0.4643714         1978     1970
## 3330        18.271913         4.180300        0.4560000         1980     1980
## 3331        11.153205         4.157204        0.4143243         1972     1970
## 3332        11.849363         4.114613        0.4180683         1982     1980
## 3333        12.225348         4.143938        0.4627161         1981     1980
##      Movement        category
## 1          NA           Other
## 2          NA           Other
## 3          NA           Other
## 4          NA           Other
## 5          NA           Other
## 6          NA           Other
## 7          NA           Other
## 8          NA           Other
## 9          NA           Other
## 10         NA           Other
## 11         NA           Other
## 12         NA           Other
## 13         NA           Other
## 14         NA           Other
## 15         NA           Other
## 16         NA           Other
## 17         NA           Other
## 18         NA           Other
## 19         NA           Other
## 20         NA           Other
## 21         NA           Other
## 22         NA           Other
## 23         NA           Other
## 24         NA           Other
## 25         NA           Other
## 26         NA           Other
## 27         NA           Other
## 28         NA           Other
## 29         NA           Other
## 30         NA           Other
## 31         NA           Other
## 32         NA           Other
## 33         NA           Other
## 34         NA           Other
## 35         NA           Other
## 36         NA           Other
## 37         NA           Other
## 38         NA           Other
## 39         NA           Other
## 40         NA           Other
## 41         NA           Other
## 42         NA           Other
## 43         NA           Other
## 44         NA           Other
## 45         NA           Other
## 46         NA           Other
## 47         NA           Other
## 48         NA           Other
## 49         NA           Other
## 50         NA           Other
## 51         NA           Other
## 52         NA           Other
## 53         NA           Other
## 54         NA           Other
## 55         NA           Other
## 56         NA           Other
## 57         NA           Other
## 58         NA           Other
## 59         NA           Other
## 60         NA           Other
## 61         NA           Other
## 62         NA           Other
## 63         NA           Other
## 64         NA           Other
## 65         NA           Other
## 66         NA           Other
## 67         NA           Other
## 68         NA           Other
## 69         NA           Other
## 70         NA           Other
## 71         NA           Other
## 72         NA           Other
## 73         NA           Other
## 74         NA           Other
## 75         NA           Other
## 76         NA           Other
## 77         NA           Other
## 78         NA           Other
## 79         NA           Other
## 80         NA           Other
## 81         NA           Other
## 82         NA           Other
## 83         NA           Other
## 84         NA           Other
## 85         NA           Other
## 86         NA           Other
## 87         NA           Other
## 88         NA           Other
## 89         NA           Other
## 90         NA           Other
## 91         NA           Other
## 92         NA           Other
## 93         NA           Other
## 94         NA           Other
## 95         NA           Other
## 96         NA           Other
## 97         NA           Other
## 98         NA           Other
## 99         NA           Other
## 100        NA           Other
## 101        NA           Other
## 102        NA           Other
## 103        NA           Other
## 104        NA           Other
## 105        NA           Other
## 106        NA           Other
## 107        NA           Other
## 108        NA           Other
## 109        NA           Other
## 110        NA           Other
## 111        NA           Other
## 112        NA           Other
## 113        NA           Other
## 114        NA           Other
## 115        NA           Other
## 116        NA           Other
## 117        NA           Other
## 118        NA           Other
## 119        NA           Other
## 120        NA           Other
## 121        NA           Other
## 122        NA           Other
## 123        NA           Other
## 124        NA           Other
## 125        NA           Other
## 126        NA           Other
## 127        NA           Other
## 128        NA           Other
## 129        NA           Other
## 130        NA           Other
## 131        NA           Other
## 132        NA           Other
## 133        NA           Other
## 134        NA           Other
## 135        NA           Other
## 136        NA           Other
## 137        NA           Other
## 138        NA           Other
## 139        NA           Other
## 140        NA           Other
## 141        NA           Other
## 142        NA           Other
## 143        NA           Other
## 144        NA           Other
## 145        NA           Other
## 146        NA           Other
## 147        NA           Other
## 148        NA           Other
## 149        NA           Other
## 150        NA           Other
## 151        NA           Other
## 152        NA           Other
## 153        NA           Other
## 154        NA           Other
## 155        NA           Other
## 156        NA           Other
## 157        NA           Other
## 158        NA           Other
## 159        NA           Other
## 160        NA           Other
## 161        NA           Other
## 162        NA           Other
## 163        NA           Other
## 164        NA           Other
## 165        NA           Other
## 166        NA           Other
## 167        NA           Other
## 168        NA           Other
## 169        NA           Other
## 170        NA           Other
## 171        NA           Other
## 172        NA           Other
## 173        NA           Other
## 174        NA           Other
## 175        NA           Other
## 176        NA           Other
## 177        NA           Other
## 178        NA           Other
## 179        NA           Other
## 180        NA           Other
## 181        NA           Other
## 182        NA           Other
## 183        NA           Other
## 184        NA           Other
## 185        NA           Other
## 186        NA           Other
## 187        NA           Other
## 188        NA           Other
## 189        NA           Other
## 190        NA           Other
## 191        NA           Other
## 192        NA           Other
## 193        NA           Other
## 194        NA           Other
## 195        NA           Other
## 196        NA           Other
## 197        NA           Other
## 198        NA           Other
## 199        NA           Other
## 200        NA           Other
## 201        NA           Other
## 202        NA           Other
## 203        NA           Other
## 204        NA           Other
## 205        NA           Other
## 206        NA           Other
## 207        NA           Other
## 208        NA           Other
## 209        NA           Other
## 210        NA           Other
## 211        NA           Other
## 212        NA           Other
## 213        NA           Other
## 214        NA           Other
## 215        NA           Other
## 216        NA           Other
## 217        NA           Other
## 218        NA           Other
## 219        NA           Other
## 220        NA           Other
## 221        NA           Other
## 222        NA           Other
## 223        NA           Other
## 224        NA           Other
## 225        NA           Other
## 226        NA           Other
## 227        NA           Other
## 228        NA           Other
## 229        NA           Other
## 230        NA           Other
## 231        NA           Other
## 232        NA           Other
## 233        NA           Other
## 234        NA           Other
## 235        NA           Other
## 236        NA           Other
## 237        NA           Other
## 238        NA           Other
## 239        NA           Other
## 240        NA           Other
## 241        NA           Other
## 242        NA           Other
## 243        NA           Other
## 244        NA           Other
## 245        NA           Other
## 246        NA           Other
## 247        NA           Other
## 248        NA           Other
## 249        NA           Other
## 250        NA           Other
## 251        NA           Other
## 252        NA           Other
## 253        NA           Other
## 254        NA           Other
## 255        NA           Other
## 256        NA           Other
## 257        NA           Other
## 258        NA           Other
## 259        NA           Other
## 260        NA           Other
## 261        NA           Other
## 262        NA           Other
## 263        NA           Other
## 264        NA           Other
## 265        NA           Other
## 266        NA           Other
## 267        NA           Other
## 268        NA           Other
## 269        NA           Other
## 270        NA           Other
## 271        NA           Other
## 272        NA           Other
## 273        NA           Other
## 274        NA           Other
## 275        NA           Other
## 276        NA           Other
## 277        NA           Other
## 278        NA           Other
## 279        NA           Other
## 280        NA           Other
## 281        NA           Other
## 282        NA           Other
## 283        NA           Other
## 284        NA           Other
## 285        NA           Other
## 286        NA           Other
## 287        NA           Other
## 288        NA           Other
## 289        NA           Other
## 290        NA           Other
## 291        NA           Other
## 292        NA           Other
## 293        NA           Other
## 294        NA           Other
## 295        NA           Other
## 296        NA           Other
## 297        NA           Other
## 298        NA           Other
## 299        NA           Other
## 300        NA           Other
## 301        NA           Other
## 302        NA           Other
## 303        NA           Other
## 304        NA           Other
## 305        NA           Other
## 306        NA           Other
## 307        NA           Other
## 308        NA           Other
## 309        NA           Other
## 310        NA           Other
## 311        NA           Other
## 312        NA           Other
## 313        NA           Other
## 314        NA           Other
## 315        NA           Other
## 316        NA           Other
## 317        NA           Other
## 318        NA           Other
## 319        NA           Other
## 320        NA           Other
## 321        NA           Other
## 322        NA           Other
## 323        NA           Other
## 324        NA           Other
## 325        NA           Other
## 326        NA           Other
## 327        NA           Other
## 328        NA           Other
## 329        NA           Other
## 330        NA           Other
## 331        NA           Other
## 332        NA           Other
## 333        NA           Other
## 334        NA           Other
## 335        NA           Other
## 336        NA           Other
## 337        NA           Other
## 338        NA           Other
## 339        NA           Other
## 340        NA           Other
## 341        NA           Other
## 342        NA           Other
## 343        NA           Other
## 344        NA           Other
## 345        NA           Other
## 346        NA           Other
## 347        NA           Other
## 348        NA           Other
## 349        NA           Other
## 350        NA           Other
## 351        NA           Other
## 352        NA           Other
## 353        NA           Other
## 354        NA           Other
## 355        NA           Other
## 356        NA           Other
## 357        NA           Other
## 358        NA           Other
## 359        NA           Other
## 360        NA           Other
## 361        NA           Other
## 362        NA           Other
## 363        NA           Other
## 364        NA           Other
## 365        NA           Other
## 366        NA           Other
## 367        NA           Other
## 368        NA           Other
## 369        NA           Other
## 370        NA           Other
## 371        NA           Other
## 372        NA           Other
## 373        NA           Other
## 374        NA           Other
## 375        NA           Other
## 376        NA           Other
## 377        NA           Other
## 378        NA           Other
## 379        NA           Other
## 380        NA           Other
## 381        NA           Other
## 382        NA           Other
## 383        NA           Other
## 384        NA           Other
## 385        NA           Other
## 386        NA           Other
## 387        NA           Other
## 388        NA           Other
## 389        NA           Other
## 390        NA           Other
## 391        NA           Other
## 392        NA           Other
## 393        NA           Other
## 394        NA           Other
## 395        NA           Other
## 396        NA           Other
## 397        NA           Other
## 398        NA           Other
## 399        NA           Other
## 400        NA           Other
## 401        NA           Other
## 402        NA           Other
## 403        NA           Other
## 404        NA           Other
## 405        NA           Other
## 406        NA           Other
## 407        NA           Other
## 408        NA           Other
## 409        NA           Other
## 410        NA           Other
## 411        NA           Other
## 412        NA           Other
## 413        NA           Other
## 414        NA           Other
## 415        NA           Other
## 416        NA           Other
## 417        NA           Other
## 418        NA           Other
## 419        NA           Other
## 420        NA           Other
## 421        NA           Other
## 422        NA           Other
## 423        NA           Other
## 424        NA           Other
## 425        NA           Other
## 426        NA           Other
## 427        NA           Other
## 428        NA           Other
## 429        NA           Other
## 430        NA           Other
## 431        NA           Other
## 432        NA           Other
## 433        NA           Other
## 434        NA           Other
## 435        NA           Other
## 436        NA           Other
## 437        NA           Other
## 438        NA           Other
## 439        NA           Other
## 440        NA           Other
## 441        NA           Other
## 442        NA           Other
## 443        NA           Other
## 444        NA           Other
## 445        NA           Other
## 446        NA           Other
## 447        NA           Other
## 448        NA           Other
## 449        NA           Other
## 450        NA           Other
## 451        NA           Other
## 452        NA           Other
## 453        NA           Other
## 454        NA           Other
## 455        NA           Other
## 456        NA           Other
## 457        NA           Other
## 458        NA           Other
## 459        NA           Other
## 460        NA           Other
## 461        NA           Other
## 462        NA           Other
## 463        NA           Other
## 464        NA           Other
## 465        NA           Other
## 466        NA           Other
## 467        NA           Other
## 468        NA           Other
## 469        NA           Other
## 470        NA           Other
## 471        NA           Other
## 472        NA           Other
## 473        NA           Other
## 474        NA           Other
## 475        NA           Other
## 476        NA           Other
## 477        NA           Other
## 478        NA           Other
## 479        NA           Other
## 480        NA           Other
## 481        NA           Other
## 482        NA           Other
## 483        NA           Other
## 484        NA           Other
## 485        NA           Other
## 486        NA           Other
## 487        NA           Other
## 488        NA           Other
## 489        NA           Other
## 490        NA           Other
## 491        NA           Other
## 492        NA           Other
## 493        NA           Other
## 494        NA           Other
## 495        NA           Other
## 496        NA           Other
## 497        NA           Other
## 498        NA           Other
## 499        NA           Other
## 500        NA           Other
## 501        NA           Other
## 502        NA           Other
## 503        NA           Other
## 504        NA           Other
## 505        NA           Other
## 506        NA           Other
## 507        NA           Other
## 508        NA           Other
## 509        NA           Other
## 510        NA           Other
## 511        NA           Other
## 512        NA           Other
## 513        NA           Other
## 514        NA           Other
## 515        NA           Other
## 516        NA           Other
## 517        NA           Other
## 518        NA           Other
## 519        NA           Other
## 520        NA           Other
## 521        NA           Other
## 522        NA           Other
## 523        NA           Other
## 524        NA           Other
## 525        NA           Other
## 526        NA           Other
## 527        NA           Other
## 528        NA           Other
## 529        NA           Other
## 530        NA           Other
## 531        NA           Other
## 532        NA           Other
## 533        NA           Other
## 534        NA           Other
## 535        NA           Other
## 536        NA           Other
## 537        NA           Other
## 538        NA           Other
## 539        NA           Other
## 540        NA           Other
## 541        NA           Other
## 542        NA           Other
## 543        NA           Other
## 544        NA           Other
## 545        NA           Other
## 546        NA           Other
## 547        NA           Other
## 548        NA           Other
## 549        NA           Other
## 550        NA           Other
## 551        NA           Other
## 552        NA           Other
## 553        NA           Other
## 554        NA           Other
## 555        NA           Other
## 556        NA           Other
## 557        NA           Other
## 558        NA           Other
## 559        NA           Other
## 560        NA           Other
## 561        NA           Other
## 562        NA           Other
## 563        NA           Other
## 564        NA           Other
## 565        NA           Other
## 566        NA           Other
## 567        NA           Other
## 568        NA           Other
## 569        NA           Other
## 570        NA           Other
## 571        NA           Other
## 572        NA           Other
## 573        NA           Other
## 574        NA           Other
## 575        NA           Other
## 576        NA           Other
## 577        NA           Other
## 578        NA           Other
## 579        NA           Other
## 580        NA           Other
## 581        NA           Other
## 582        NA           Other
## 583        NA           Other
## 584        NA           Other
## 585        NA           Other
## 586        NA           Other
## 587        NA           Other
## 588        NA           Other
## 589        NA           Other
## 590        NA           Other
## 591        NA           Other
## 592        NA           Other
## 593        NA           Other
## 594        NA           Other
## 595        NA           Other
## 596        NA           Other
## 597        NA           Other
## 598        NA           Other
## 599        NA           Other
## 600        NA           Other
## 601        NA           Other
## 602        NA           Other
## 603        NA           Other
## 604        NA           Other
## 605        NA           Other
## 606        NA           Other
## 607        NA           Other
## 608        NA           Other
## 609        NA           Other
## 610        NA           Other
## 611        NA           Other
## 612        NA           Other
## 613        NA           Other
## 614        NA           Other
## 615        NA           Other
## 616        NA           Other
## 617        NA           Other
## 618        NA           Other
## 619        NA           Other
## 620        NA           Other
## 621        NA           Other
## 622        NA           Other
## 623        NA           Other
## 624        NA           Other
## 625        NA           Other
## 626        NA           Other
## 627        NA           Other
## 628        NA           Other
## 629        NA           Other
## 630        NA           Other
## 631        NA           Other
## 632        NA           Other
## 633        NA           Other
## 634        NA           Other
## 635        NA           Other
## 636        NA           Other
## 637        NA           Other
## 638        NA           Other
## 639        NA           Other
## 640        NA           Other
## 641        NA           Other
## 642        NA           Other
## 643        NA           Other
## 644        NA           Other
## 645        NA           Other
## 646        NA           Other
## 647        NA           Other
## 648        NA           Other
## 649        NA           Other
## 650        NA           Other
## 651        NA           Other
## 652        NA           Other
## 653        NA           Other
## 654        NA           Other
## 655        NA           Other
## 656        NA           Other
## 657        NA           Other
## 658        NA           Other
## 659        NA           Other
## 660        NA           Other
## 661        NA           Other
## 662        NA           Other
## 663        NA           Other
## 664        NA           Other
## 665        NA           Other
## 666        NA           Other
## 667        NA           Other
## 668        NA           Other
## 669        NA           Other
## 670        NA           Other
## 671        NA           Other
## 672        NA           Other
## 673        NA           Other
## 674        NA           Other
## 675        NA           Other
## 676        NA           Other
## 677        NA           Other
## 678        NA           Other
## 679        NA           Other
## 680        NA           Other
## 681        NA           Other
## 682        NA           Other
## 683        NA           Other
## 684        NA           Other
## 685        NA           Other
## 686        NA           Other
## 687        NA           Other
## 688        NA           Other
## 689        NA           Other
## 690        NA           Other
## 691        NA           Other
## 692        NA           Other
## 693        NA           Other
## 694        NA           Other
## 695        NA           Other
## 696        NA           Other
## 697        NA           Other
## 698        NA           Other
## 699        NA           Other
## 700        NA           Other
## 701        NA           Other
## 702        NA           Other
## 703        NA           Other
## 704        NA           Other
## 705        NA           Other
## 706        NA           Other
## 707        NA           Other
## 708        NA           Other
## 709        NA           Other
## 710        NA           Other
## 711        NA           Other
## 712        NA           Other
## 713        NA           Other
## 714        NA           Other
## 715        NA           Other
## 716        NA           Other
## 717        NA           Other
## 718        NA           Other
## 719        NA           Other
## 720        NA           Other
## 721        NA           Other
## 722        NA           Other
## 723        NA           Other
## 724        NA           Other
## 725        NA           Other
## 726        NA           Other
## 727        NA           Other
## 728        NA           Other
## 729        NA           Other
## 730        NA           Other
## 731        NA           Other
## 732        NA           Other
## 733        NA           Other
## 734        NA           Other
## 735        NA           Other
## 736        NA           Other
## 737        NA           Other
## 738        NA           Other
## 739        NA           Other
## 740        NA           Other
## 741        NA           Other
## 742        NA           Other
## 743        NA           Other
## 744        NA           Other
## 745        NA           Other
## 746        NA           Other
## 747        NA           Other
## 748        NA           Other
## 749        NA           Other
## 750        NA           Other
## 751        NA           Other
## 752        NA           Other
## 753        NA           Other
## 754        NA           Other
## 755        NA           Other
## 756        NA           Other
## 757        NA           Other
## 758        NA           Other
## 759        NA           Other
## 760        NA           Other
## 761        NA           Other
## 762        NA           Other
## 763        NA           Other
## 764        NA           Other
## 765        NA           Other
## 766        NA           Other
## 767        NA           Other
## 768        NA           Other
## 769        NA           Other
## 770        NA           Other
## 771        NA           Other
## 772        NA           Other
## 773        NA           Other
## 774        NA           Other
## 775        NA           Other
## 776        NA           Other
## 777        NA           Other
## 778        NA           Other
## 779        NA           Other
## 780        NA           Other
## 781        NA           Other
## 782        NA           Other
## 783        NA           Other
## 784        NA           Other
## 785        NA           Other
## 786        NA           Other
## 787        NA           Other
## 788        NA           Other
## 789        NA           Other
## 790        NA           Other
## 791        NA           Other
## 792        NA        Decadent
## 793        NA           Other
## 794        NA           Other
## 795        NA           Other
## 796        NA           Other
## 797        NA           Other
## 798        NA           Other
## 799        NA           Other
## 800        NA           Other
## 801        NA           Other
## 802        NA           Other
## 803        NA           Other
## 804        NA           Other
## 805        NA           Other
## 806        NA           Other
## 807        NA           Other
## 808        NA           Other
## 809        NA           Other
## 810        NA           Other
## 811        NA           Other
## 812        NA           Other
## 813        NA           Other
## 814        NA           Other
## 815        NA           Other
## 816        NA           Other
## 817        NA           Other
## 818        NA           Other
## 819        NA           Other
## 820        NA           Other
## 821        NA           Other
## 822        NA           Other
## 823        NA           Other
## 824        NA           Other
## 825        NA           Other
## 826        NA           Other
## 827        NA           Other
## 828        NA           Other
## 829        NA           Other
## 830        NA           Other
## 831        NA           Other
## 832        NA           Other
## 833        NA           Other
## 834        NA           Other
## 835        NA           Other
## 836        NA           Other
## 837        NA           Other
## 838        NA           Other
## 839        NA           Other
## 840        NA           Other
## 841        NA           Other
## 842        NA           Other
## 843        NA           Other
## 844        NA           Other
## 845        NA           Other
## 846        NA           Other
## 847        NA           Other
## 848        NA           Other
## 849        NA           Other
## 850        NA           Other
## 851        NA           Other
## 852        NA           Other
## 853        NA           Other
## 854        NA           Other
## 855        NA           Other
## 856        NA           Other
## 857        NA           Other
## 858        NA           Other
## 859        NA           Other
## 860        NA           Other
## 861        NA           Other
## 862        NA           Other
## 863        NA           Other
## 864        NA           Other
## 865        NA           Other
## 866        NA           Other
## 867        NA           Other
## 868        NA           Other
## 869        NA           Other
## 870        NA           Other
## 871        NA           Other
## 872        NA           Other
## 873        NA           Other
## 874        NA           Other
## 875        NA           Other
## 876        NA           Other
## 877        NA           Other
## 878        NA           Other
## 879        NA           Other
## 880        NA           Other
## 881        NA           Other
## 882        NA           Other
## 883        NA           Other
## 884        NA           Other
## 885        NA           Other
## 886        NA           Other
## 887        NA           Other
## 888        NA           Other
## 889        NA           Other
## 890        NA           Other
## 891        NA           Other
## 892        NA           Other
## 893        NA           Other
## 894        NA           Other
## 895        NA           Other
## 896        NA           Other
## 897        NA           Other
## 898        NA           Other
## 899        NA           Other
## 900        NA           Other
## 901        NA           Other
## 902        NA           Other
## 903        NA           Other
## 904        NA           Other
## 905        NA           Other
## 906        NA           Other
## 907        NA           Other
## 908        NA           Other
## 909        NA           Other
## 910        NA           Other
## 911        NA           Other
## 912        NA           Other
## 913        NA           Other
## 914        NA           Other
## 915        NA           Other
## 916        NA           Other
## 917        NA           Other
## 918        NA           Other
## 919        NA           Other
## 920        NA           Other
## 921        NA           Other
## 922        NA           Other
## 923        NA           Other
## 924        NA           Other
## 925        NA           Other
## 926        NA           Other
## 927        NA           Other
## 928        NA           Other
## 929        NA           Other
## 930        NA           Other
## 931        NA           Other
## 932        NA           Other
## 933        NA           Other
## 934        NA           Other
## 935        NA           Other
## 936        NA           Other
## 937        NA           Other
## 938        NA           Other
## 939        NA           Other
## 940        NA           Other
## 941        NA           Other
## 942        NA           Other
## 943        NA           Other
## 944        NA           Other
## 945        NA           Other
## 946        NA           Other
## 947        NA           Other
## 948        NA           Other
## 949        NA           Other
## 950        NA           Other
## 951        NA           Other
## 952        NA           Other
## 953        NA           Other
## 954        NA           Other
## 955        NA           Other
## 956        NA           Other
## 957        NA           Other
## 958        NA           Other
## 959        NA           Other
## 960        NA           Other
## 961        NA           Other
## 962        NA           Other
## 963        NA           Other
## 964        NA           Other
## 965        NA           Other
## 966        NA           Other
## 967        NA           Other
## 968        NA           Other
## 969        NA           Other
## 970        NA           Other
## 971        NA           Other
## 972        NA           Other
## 973        NA           Other
## 974        NA           Other
## 975        NA           Other
## 976        NA           Other
## 977        NA           Other
## 978        NA           Other
## 979        NA           Other
## 980        NA           Other
## 981        NA           Other
## 982        NA           Other
## 983        NA           Other
## 984        NA           Other
## 985        NA           Other
## 986        NA           Other
## 987        NA           Other
## 988        NA           Other
## 989        NA           Other
## 990        NA           Other
## 991        NA           Other
## 992        NA           Other
## 993        NA           Other
## 994        NA           Other
## 995        NA           Other
## 996        NA           Other
## 997        NA           Other
## 998        NA           Other
## 999        NA           Other
## 1000       NA           Other
## 1001       NA           Other
## 1002       NA           Other
## 1003       NA           Other
## 1004       NA           Other
## 1005       NA           Other
## 1006       NA           Other
## 1007       NA           Other
## 1008       NA           Other
## 1009       NA           Other
## 1010       NA           Other
## 1011       NA           Other
## 1012       NA           Other
## 1013       NA           Other
## 1014       NA           Other
## 1015       NA           Other
## 1016       NA           Other
## 1017       NA           Other
## 1018       NA           Other
## 1019       NA           Other
## 1020       NA           Other
## 1021       NA           Other
## 1022       NA           Other
## 1023       NA           Other
## 1024       NA           Other
## 1025       NA           Other
## 1026       NA           Other
## 1027       NA           Other
## 1028       NA           Other
## 1029       NA           Other
## 1030       NA           Other
## 1031       NA           Other
## 1032       NA           Other
## 1033       NA           Other
## 1034       NA           Other
## 1035       NA           Other
## 1036       NA           Other
## 1037       NA           Other
## 1038       NA           Other
## 1039       NA           Other
## 1040       NA           Other
## 1041       NA           Other
## 1042       NA           Other
## 1043       NA           Other
## 1044       NA           Other
## 1045       NA           Other
## 1046       NA           Other
## 1047       NA           Other
## 1048       NA           Other
## 1049       NA           Other
## 1050       NA           Other
## 1051       NA           Other
## 1052       NA           Other
## 1053       NA           Other
## 1054       NA           Other
## 1055       NA           Other
## 1056       NA           Other
## 1057       NA           Other
## 1058       NA           Other
## 1059       NA           Other
## 1060       NA           Other
## 1061       NA           Other
## 1062       NA           Other
## 1063       NA           Other
## 1064       NA           Other
## 1065       NA           Other
## 1066       NA           Other
## 1067       NA           Other
## 1068       NA           Other
## 1069       NA           Other
## 1070       NA           Other
## 1071       NA           Other
## 1072       NA           Other
## 1073       NA           Other
## 1074       NA           Other
## 1075       NA           Other
## 1076       NA           Other
## 1077       NA           Other
## 1078       NA           Other
## 1079       NA           Other
## 1080       NA           Other
## 1081       NA           Other
## 1082       NA           Other
## 1083       NA           Other
## 1084       NA           Other
## 1085       NA           Other
## 1086       NA           Other
## 1087       NA           Other
## 1088       NA           Other
## 1089       NA           Other
## 1090       NA           Other
## 1091       NA           Other
## 1092       NA           Other
## 1093       NA           Other
## 1094       NA           Other
## 1095       NA           Other
## 1096       NA           Other
## 1097       NA           Other
## 1098       NA           Other
## 1099       NA           Other
## 1100       NA           Other
## 1101       NA           Other
## 1102       NA           Other
## 1103       NA           Other
## 1104       NA           Other
## 1105       NA           Other
## 1106       NA           Other
## 1107       NA           Other
## 1108       NA           Other
## 1109       NA           Other
## 1110       NA           Other
## 1111       NA           Other
## 1112       NA           Other
## 1113       NA           Other
## 1114       NA           Other
## 1115       NA           Other
## 1116       NA           Other
## 1117       NA           Other
## 1118       NA           Other
## 1119       NA           Other
## 1120       NA           Other
## 1121       NA           Other
## 1122       NA           Other
## 1123       NA           Other
## 1124       NA           Other
## 1125       NA           Other
## 1126       NA           Other
## 1127       NA           Other
## 1128       NA           Other
## 1129       NA           Other
## 1130       NA           Other
## 1131       NA           Other
## 1132       NA           Other
## 1133       NA           Other
## 1134       NA           Other
## 1135       NA           Other
## 1136       NA           Other
## 1137       NA           Other
## 1138       NA           Other
## 1139       NA           Other
## 1140       NA           Other
## 1141       NA           Other
## 1142       NA           Other
## 1143       NA           Other
## 1144       NA           Other
## 1145       NA           Other
## 1146       NA           Other
## 1147       NA           Other
## 1148       NA           Other
## 1149       NA           Other
## 1150       NA           Other
## 1151       NA           Other
## 1152       NA           Other
## 1153       NA           Other
## 1154       NA           Other
## 1155       NA           Other
## 1156       NA           Other
## 1157       NA           Other
## 1158       NA           Other
## 1159       NA           Other
## 1160       NA           Other
## 1161       NA           Other
## 1162       NA           Other
## 1163       NA           Other
## 1164       NA           Other
## 1165       NA           Other
## 1166       NA           Other
## 1167       NA           Other
## 1168       NA           Other
## 1169       NA           Other
## 1170       NA           Other
## 1171       NA           Other
## 1172       NA           Other
## 1173       NA           Other
## 1174       NA           Other
## 1175       NA           Other
## 1176       NA           Other
## 1177       NA           Other
## 1178       NA           Other
## 1179       NA           Other
## 1180       NA           Other
## 1181       NA           Other
## 1182       NA           Other
## 1183       NA           Other
## 1184       NA           Other
## 1185       NA           Other
## 1186       NA           Other
## 1187       NA           Other
## 1188       NA           Other
## 1189       NA           Other
## 1190       NA           Other
## 1191       NA           Other
## 1192       NA           Other
## 1193       NA           Other
## 1194       NA           Other
## 1195       NA           Other
## 1196       NA           Other
## 1197       NA           Other
## 1198       NA           Other
## 1199       NA           Other
## 1200       NA           Other
## 1201       NA           Other
## 1202       NA           Other
## 1203       NA           Other
## 1204       NA           Other
## 1205       NA           Other
## 1206       NA           Other
## 1207       NA           Other
## 1208       NA           Other
## 1209       NA           Other
## 1210       NA           Other
## 1211       NA           Other
## 1212       NA           Other
## 1213       NA           Other
## 1214       NA           Other
## 1215       NA           Other
## 1216       NA           Other
## 1217       NA           Other
## 1218       NA           Other
## 1219       NA           Other
## 1220       NA           Other
## 1221       NA           Other
## 1222       NA           Other
## 1223       NA           Other
## 1224       NA           Other
## 1225       NA           Other
## 1226       NA           Other
## 1227       NA           Other
## 1228       NA           Other
## 1229       NA           Other
## 1230       NA           Other
## 1231       NA           Other
## 1232       NA           Other
## 1233       NA           Other
## 1234       NA           Other
## 1235       NA           Other
## 1236       NA           Other
## 1237       NA           Other
## 1238       NA           Other
## 1239       NA           Other
## 1240       NA           Other
## 1241       NA           Other
## 1242       NA           Other
## 1243       NA           Other
## 1244       NA           Other
## 1245       NA           Other
## 1246       NA           Other
## 1247       NA           Other
## 1248       NA           Other
## 1249       NA           Other
## 1250       NA           Other
## 1251       NA           Other
## 1252       NA           Other
## 1253       NA           Other
## 1254       NA           Other
## 1255       NA           Other
## 1256       NA           Other
## 1257       NA           Other
## 1258       NA           Other
## 1259       NA           Other
## 1260       NA           Other
## 1261       NA           Other
## 1262       NA           Other
## 1263       NA           Other
## 1264       NA           Other
## 1265       NA           Other
## 1266       NA           Other
## 1267       NA           Other
## 1268       NA           Other
## 1269       NA           Other
## 1270       NA           Other
## 1271       NA           Other
## 1272       NA           Other
## 1273       NA           Other
## 1274       NA           Other
## 1275       NA           Other
## 1276       NA           Other
## 1277       NA           Other
## 1278       NA           Other
## 1279       NA           Other
## 1280       NA           Other
## 1281       NA           Other
## 1282       NA           Other
## 1283       NA           Other
## 1284       NA           Other
## 1285       NA           Other
## 1286       NA           Other
## 1287       NA           Other
## 1288       NA           Other
## 1289       NA           Other
## 1290       NA           Other
## 1291       NA           Other
## 1292       NA           Other
## 1293       NA           Other
## 1294       NA           Other
## 1295       NA           Other
## 1296       NA           Other
## 1297       NA           Other
## 1298       NA           Other
## 1299       NA           Other
## 1300       NA           Other
## 1301       NA           Other
## 1302       NA           Other
## 1303       NA           Other
## 1304       NA           Other
## 1305       NA           Other
## 1306       NA           Other
## 1307       NA           Other
## 1308       NA           Other
## 1309       NA           Other
## 1310       NA           Other
## 1311       NA           Other
## 1312       NA           Other
## 1313       NA           Other
## 1314       NA           Other
## 1315       NA           Other
## 1316       NA           Other
## 1317       NA           Other
## 1318       NA           Other
## 1319       NA           Other
## 1320       NA           Other
## 1321       NA           Other
## 1322       NA           Other
## 1323       NA           Other
## 1324       NA           Other
## 1325       NA           Other
## 1326       NA           Other
## 1327       NA           Other
## 1328       NA           Other
## 1329       NA           Other
## 1330       NA           Other
## 1331       NA           Other
## 1332       NA           Other
## 1333       NA           Other
## 1334       NA           Other
## 1335       NA           Other
## 1336       NA           Other
## 1337       NA           Other
## 1338       NA           Other
## 1339       NA           Other
## 1340       NA           Other
## 1341       NA           Other
## 1342       NA           Other
## 1343       NA           Other
## 1344       NA           Other
## 1345       NA           Other
## 1346       NA           Other
## 1347       NA           Other
## 1348       NA           Other
## 1349       NA           Other
## 1350       NA           Other
## 1351       NA           Other
## 1352       NA           Other
## 1353       NA           Other
## 1354       NA           Other
## 1355       NA           Other
## 1356       NA           Other
## 1357       NA           Other
## 1358       NA           Other
## 1359       NA           Other
## 1360       NA           Other
## 1361       NA           Other
## 1362       NA           Other
## 1363       NA           Other
## 1364       NA           Other
## 1365       NA           Other
## 1366       NA           Other
## 1367       NA           Other
## 1368       NA           Other
## 1369       NA           Other
## 1370       NA           Other
## 1371       NA           Other
## 1372       NA           Other
## 1373       NA           Other
## 1374       NA           Other
## 1375       NA           Other
## 1376       NA           Other
## 1377       NA           Other
## 1378       NA           Other
## 1379       NA           Other
## 1380       NA           Other
## 1381       NA           Other
## 1382       NA           Other
## 1383       NA           Other
## 1384       NA           Other
## 1385       NA           Other
## 1386       NA           Other
## 1387       NA           Other
## 1388       NA           Other
## 1389       NA           Other
## 1390       NA           Other
## 1391       NA           Other
## 1392       NA           Other
## 1393       NA           Other
## 1394       NA           Other
## 1395       NA           Other
## 1396       NA           Other
## 1397       NA           Other
## 1398       NA           Other
## 1399       NA           Other
## 1400       NA           Other
## 1401       NA           Other
## 1402       NA           Other
## 1403       NA           Other
## 1404       NA           Other
## 1405       NA           Other
## 1406       NA           Other
## 1407       NA           Other
## 1408       NA           Other
## 1409       NA           Other
## 1410       NA           Other
## 1411       NA           Other
## 1412       NA           Other
## 1413       NA           Other
## 1414       NA           Other
## 1415       NA           Other
## 1416       NA           Other
## 1417       NA           Other
## 1418       NA           Other
## 1419       NA           Other
## 1420       NA           Other
## 1421       NA           Other
## 1422       NA           Other
## 1423       NA           Other
## 1424       NA           Other
## 1425       NA           Other
## 1426       NA           Other
## 1427       NA           Other
## 1428       NA           Other
## 1429       NA           Other
## 1430       NA           Other
## 1431       NA           Other
## 1432       NA           Other
## 1433       NA           Other
## 1434       NA           Other
## 1435       NA           Other
## 1436       NA           Other
## 1437       NA           Other
## 1438       NA           Other
## 1439       NA           Other
## 1440       NA           Other
## 1441       NA           Other
## 1442       NA           Other
## 1443       NA           Other
## 1444       NA           Other
## 1445       NA           Other
## 1446       NA           Other
## 1447       NA           Other
## 1448       NA           Other
## 1449       NA           Other
## 1450       NA           Other
## 1451       NA           Other
## 1452       NA           Other
## 1453       NA           Other
## 1454       NA           Other
## 1455       NA           Other
## 1456       NA           Other
## 1457       NA           Other
## 1458       NA           Other
## 1459       NA           Other
## 1460       NA           Other
## 1461       NA           Other
## 1462       NA           Other
## 1463       NA           Other
## 1464       NA           Other
## 1465       NA           Other
## 1466       NA           Other
## 1467       NA           Other
## 1468       NA           Other
## 1469       NA           Other
## 1470       NA           Other
## 1471       NA           Other
## 1472       NA           Other
## 1473       NA           Other
## 1474       NA           Other
## 1475       NA           Other
## 1476       NA           Other
## 1477       NA           Other
## 1478       NA           Other
## 1479       NA           Other
## 1480       NA           Other
## 1481       NA           Other
## 1482       NA           Other
## 1483       NA           Other
## 1484       NA           Other
## 1485       NA           Other
## 1486       NA           Other
## 1487       NA           Other
## 1488       NA           Other
## 1489       NA           Other
## 1490       NA           Other
## 1491       NA           Other
## 1492       NA           Other
## 1493       NA           Other
## 1494       NA           Other
## 1495       NA           Other
## 1496       NA           Other
## 1497       NA           Other
## 1498       NA           Other
## 1499       NA           Other
## 1500       NA           Other
## 1501       NA           Other
## 1502       NA           Other
## 1503       NA           Other
## 1504       NA           Other
## 1505       NA           Other
## 1506       NA           Other
## 1507       NA           Other
## 1508       NA           Other
## 1509       NA           Other
## 1510       NA           Other
## 1511       NA           Other
## 1512       NA           Other
## 1513       NA           Other
## 1514       NA           Other
## 1515       NA           Other
## 1516       NA           Other
## 1517       NA           Other
## 1518       NA           Other
## 1519       NA           Other
## 1520       NA           Other
## 1521       NA           Other
## 1522       NA           Other
## 1523       NA           Other
## 1524       NA           Other
## 1525       NA           Other
## 1526       NA           Other
## 1527       NA           Other
## 1528       NA           Other
## 1529       NA           Other
## 1530       NA           Other
## 1531       NA           Other
## 1532       NA           Other
## 1533       NA           Other
## 1534       NA           Other
## 1535       NA           Other
## 1536       NA           Other
## 1537       NA           Other
## 1538       NA           Other
## 1539       NA           Other
## 1540       NA           Other
## 1541       NA           Other
## 1542       NA           Other
## 1543       NA           Other
## 1544       NA           Other
## 1545       NA           Other
## 1546       NA           Other
## 1547       NA           Other
## 1548       NA           Other
## 1549       NA           Other
## 1550       NA           Other
## 1551       NA           Other
## 1552       NA           Other
## 1553       NA           Other
## 1554       NA           Other
## 1555       NA           Other
## 1556       NA           Other
## 1557       NA           Other
## 1558       NA           Other
## 1559       NA           Other
## 1560       NA           Other
## 1561       NA           Other
## 1562       NA           Other
## 1563       NA           Other
## 1564       NA           Other
## 1565       NA           Other
## 1566       NA           Other
## 1567       NA           Other
## 1568       NA           Other
## 1569       NA           Other
## 1570       NA           Other
## 1571       NA           Other
## 1572       NA           Other
## 1573       NA           Other
## 1574       NA           Other
## 1575       NA           Other
## 1576       NA           Other
## 1577       NA           Other
## 1578       NA           Other
## 1579       NA           Other
## 1580       NA           Other
## 1581       NA           Other
## 1582       NA           Other
## 1583       NA           Other
## 1584       NA           Other
## 1585       NA           Other
## 1586       NA           Other
## 1587       NA           Other
## 1588       NA           Other
## 1589       NA           Other
## 1590       NA           Other
## 1591       NA           Other
## 1592       NA           Other
## 1593       NA           Other
## 1594       NA           Other
## 1595       NA           Other
## 1596       NA           Other
## 1597       NA           Other
## 1598       NA           Other
## 1599       NA           Other
## 1600       NA           Other
## 1601       NA           Other
## 1602       NA           Other
## 1603       NA           Other
## 1604       NA           Other
## 1605       NA           Other
## 1606       NA           Other
## 1607       NA           Other
## 1608       NA           Other
## 1609       NA           Other
## 1610       NA           Other
## 1611       NA           Other
## 1612       NA           Other
## 1613       NA           Other
## 1614       NA           Other
## 1615       NA           Other
## 1616       NA           Other
## 1617       NA           Other
## 1618       NA           Other
## 1619       NA           Other
## 1620       NA           Other
## 1621       NA           Other
## 1622       NA           Other
## 1623       NA           Other
## 1624       NA           Other
## 1625       NA           Other
## 1626       NA           Other
## 1627       NA           Other
## 1628       NA           Other
## 1629       NA           Other
## 1630       NA           Other
## 1631       NA           Other
## 1632       NA           Other
## 1633       NA           Other
## 1634       NA           Other
## 1635       NA           Other
## 1636       NA           Other
## 1637       NA           Other
## 1638       NA           Other
## 1639       NA           Other
## 1640       NA           Other
## 1641       NA           Other
## 1642       NA           Other
## 1643       NA           Other
## 1644       NA           Other
## 1645       NA           Other
## 1646       NA           Other
## 1647       NA           Other
## 1648       NA           Other
## 1649       NA           Other
## 1650       NA           Other
## 1651       NA           Other
## 1652       NA           Other
## 1653       NA           Other
## 1654       NA           Other
## 1655       NA           Other
## 1656       NA           Other
## 1657       NA           Other
## 1658       NA           Other
## 1659       NA           Other
## 1660       NA           Other
## 1661       NA           Other
## 1662       NA           Other
## 1663       NA           Other
## 1664       NA           Other
## 1665       NA           Other
## 1666       NA           Other
## 1667       NA           Other
## 1668       NA           Other
## 1669       NA           Other
## 1670       NA           Other
## 1671       NA           Other
## 1672       NA           Other
## 1673       NA           Other
## 1674       NA           Other
## 1675       NA           Other
## 1676       NA           Other
## 1677       NA           Other
## 1678       NA           Other
## 1679       NA           Other
## 1680       NA           Other
## 1681       NA           Other
## 1682       NA           Other
## 1683       NA           Other
## 1684       NA           Other
## 1685       NA           Other
## 1686       NA           Other
## 1687       NA           Other
## 1688       NA           Other
## 1689       NA           Other
## 1690       NA           Other
## 1691       NA           Other
## 1692       NA           Other
## 1693       NA           Other
## 1694       NA           Other
## 1695       NA           Other
## 1696       NA           Other
## 1697       NA           Other
## 1698       NA           Other
## 1699       NA           Other
## 1700       NA           Other
## 1701       NA           Other
## 1702       NA           Other
## 1703       NA           Other
## 1704       NA           Other
## 1705       NA           Other
## 1706       NA           Other
## 1707       NA           Other
## 1708       NA           Other
## 1709       NA           Other
## 1710       NA           Other
## 1711       NA           Other
## 1712       NA           Other
## 1713       NA           Other
## 1714       NA           Other
## 1715       NA           Other
## 1716       NA           Other
## 1717       NA           Other
## 1718       NA           Other
## 1719       NA           Other
## 1720       NA           Other
## 1721       NA           Other
## 1722       NA           Other
## 1723       NA           Other
## 1724       NA           Other
## 1725       NA           Other
## 1726       NA           Other
## 1727       NA           Other
## 1728       NA           Other
## 1729       NA           Other
## 1730       NA           Other
## 1731       NA           Other
## 1732       NA           Other
## 1733       NA           Other
## 1734       NA           Other
## 1735       NA           Other
## 1736       NA           Other
## 1737       NA           Other
## 1738       NA           Other
## 1739       NA           Other
## 1740       NA           Other
## 1741       NA           Other
## 1742       NA           Other
## 1743       NA           Other
## 1744       NA           Other
## 1745       NA           Other
## 1746       NA           Other
## 1747       NA           Other
## 1748       NA           Other
## 1749       NA           Other
## 1750       NA           Other
## 1751       NA           Other
## 1752       NA           Other
## 1753       NA           Other
## 1754       NA           Other
## 1755       NA           Other
## 1756       NA           Other
## 1757       NA           Other
## 1758       NA           Other
## 1759       NA           Other
## 1760       NA           Other
## 1761       NA           Other
## 1762       NA           Other
## 1763       NA           Other
## 1764       NA Magical Realism
## 1765       NA           Other
## 1766       NA           Other
## 1767       NA           Other
## 1768       NA           Other
## 1769       NA           Other
## 1770       NA           Other
## 1771       NA           Other
## 1772       NA           Other
## 1773       NA           Other
## 1774       NA           Other
## 1775       NA           Other
## 1776       NA           Other
## 1777       NA           Other
## 1778       NA           Other
## 1779       NA           Other
## 1780       NA           Other
## 1781       NA           Other
## 1782       NA           Other
## 1783       NA           Other
## 1784       NA           Other
## 1785       NA           Other
## 1786       NA           Other
## 1787       NA           Other
## 1788       NA           Other
## 1789       NA           Other
## 1790       NA           Other
## 1791       NA           Other
## 1792       NA           Other
## 1793       NA           Other
## 1794       NA           Other
## 1795       NA           Other
## 1796       NA           Other
## 1797       NA           Other
## 1798       NA           Other
## 1799       NA           Other
## 1800       NA           Other
## 1801       NA           Other
## 1802       NA           Other
## 1803       NA           Other
## 1804       NA           Other
## 1805       NA           Other
## 1806       NA           Other
## 1807       NA           Other
## 1808       NA           Other
## 1809       NA           Other
## 1810       NA           Other
## 1811       NA           Other
## 1812       NA           Other
## 1813       NA           Other
## 1814       NA           Other
## 1815       NA           Other
## 1816       NA           Other
## 1817       NA           Other
## 1818       NA           Other
## 1819       NA           Other
## 1820       NA           Other
## 1821       NA           Other
## 1822       NA           Other
## 1823       NA           Other
## 1824       NA           Other
## 1825       NA           Other
## 1826       NA           Other
## 1827       NA           Other
## 1828       NA           Other
## 1829       NA           Other
## 1830       NA           Other
## 1831       NA           Other
## 1832       NA           Other
## 1833       NA           Other
## 1834       NA           Other
## 1835       NA           Other
## 1836       NA           Other
## 1837       NA           Other
## 1838       NA           Other
## 1839       NA           Other
## 1840       NA           Other
## 1841       NA           Other
## 1842       NA           Other
## 1843       NA           Other
## 1844       NA           Other
## 1845       NA           Other
## 1846       NA           Other
## 1847       NA           Other
## 1848       NA           Other
## 1849       NA           Other
## 1850       NA           Other
## 1851       NA           Other
## 1852       NA           Other
## 1853       NA           Other
## 1854       NA           Other
## 1855       NA           Other
## 1856       NA           Other
## 1857       NA           Other
## 1858       NA           Other
## 1859       NA           Other
## 1860       NA           Other
## 1861       NA           Other
## 1862       NA           Other
## 1863       NA           Other
## 1864       NA           Other
## 1865       NA           Other
## 1866       NA           Other
## 1867       NA           Other
## 1868       NA           Other
## 1869       NA           Other
## 1870       NA           Other
## 1871       NA           Other
## 1872       NA           Other
## 1873       NA           Other
## 1874       NA           Other
## 1875       NA           Other
## 1876       NA           Other
## 1877       NA           Other
## 1878       NA           Other
## 1879       NA           Other
## 1880       NA           Other
## 1881       NA           Other
## 1882       NA           Other
## 1883       NA           Other
## 1884       NA           Other
## 1885       NA           Other
## 1886       NA           Other
## 1887       NA           Other
## 1888       NA           Other
## 1889       NA           Other
## 1890       NA           Other
## 1891       NA           Other
## 1892       NA           Other
## 1893       NA           Other
## 1894       NA           Other
## 1895       NA           Other
## 1896       NA           Other
## 1897       NA           Other
## 1898       NA           Other
## 1899       NA           Other
## 1900       NA           Other
## 1901       NA           Other
## 1902       NA           Other
## 1903       NA           Other
## 1904       NA           Other
## 1905       NA           Other
## 1906       NA           Other
## 1907       NA           Other
## 1908       NA           Other
## 1909       NA           Other
## 1910       NA           Other
## 1911       NA           Other
## 1912       NA           Other
## 1913       NA           Other
## 1914       NA           Other
## 1915       NA           Other
## 1916       NA           Other
## 1917       NA           Other
## 1918       NA           Other
## 1919       NA           Other
## 1920       NA           Other
## 1921       NA           Other
## 1922       NA           Other
## 1923       NA           Other
## 1924       NA           Other
## 1925       NA           Other
## 1926       NA           Other
## 1927       NA           Other
## 1928       NA           Other
## 1929       NA           Other
## 1930       NA           Other
## 1931       NA           Other
## 1932       NA           Other
## 1933       NA           Other
## 1934       NA           Other
## 1935       NA           Other
## 1936       NA           Other
## 1937       NA           Other
## 1938       NA           Other
## 1939       NA           Other
## 1940       NA           Other
## 1941       NA           Other
## 1942       NA           Other
## 1943       NA           Other
## 1944       NA           Other
## 1945       NA           Other
## 1946       NA           Other
## 1947       NA           Other
## 1948       NA           Other
## 1949       NA           Other
## 1950       NA           Other
## 1951       NA           Other
## 1952       NA           Other
## 1953       NA           Other
## 1954       NA           Other
## 1955       NA           Other
## 1956       NA           Other
## 1957       NA           Other
## 1958       NA           Other
## 1959       NA           Other
## 1960       NA           Other
## 1961       NA           Other
## 1962       NA           Other
## 1963       NA           Other
## 1964       NA           Other
## 1965       NA           Other
## 1966       NA           Other
## 1967       NA           Other
## 1968       NA           Other
## 1969       NA           Other
## 1970       NA           Other
## 1971       NA           Other
## 1972       NA           Other
## 1973       NA           Other
## 1974       NA           Other
## 1975       NA           Other
## 1976       NA           Other
## 1977       NA           Other
## 1978       NA           Other
## 1979       NA           Other
## 1980       NA           Other
## 1981       NA           Other
## 1982       NA           Other
## 1983       NA           Other
## 1984       NA           Other
## 1985       NA           Other
## 1986       NA           Other
## 1987       NA           Other
## 1988       NA           Other
## 1989       NA           Other
## 1990       NA           Other
## 1991       NA           Other
## 1992       NA           Other
## 1993       NA           Other
## 1994       NA           Other
## 1995       NA           Other
## 1996       NA           Other
## 1997       NA           Other
## 1998       NA           Other
## 1999       NA           Other
## 2000       NA           Other
## 2001       NA           Other
## 2002       NA           Other
## 2003       NA           Other
## 2004       NA           Other
## 2005       NA           Other
## 2006       NA           Other
## 2007       NA           Other
## 2008       NA           Other
## 2009       NA           Other
## 2010       NA           Other
## 2011       NA           Other
## 2012       NA           Other
## 2013       NA           Other
## 2014       NA           Other
## 2015       NA           Other
## 2016       NA           Other
## 2017       NA           Other
## 2018       NA           Other
## 2019       NA           Other
## 2020       NA           Other
## 2021       NA           Other
## 2022       NA           Other
## 2023       NA           Other
## 2024       NA           Other
## 2025       NA           Other
## 2026       NA           Other
## 2027       NA           Other
## 2028       NA           Other
## 2029       NA           Other
## 2030       NA           Other
## 2031       NA           Other
## 2032       NA           Other
## 2033       NA           Other
## 2034       NA           Other
## 2035       NA           Other
## 2036       NA           Other
## 2037       NA           Other
## 2038       NA           Other
## 2039       NA           Other
## 2040       NA           Other
## 2041       NA           Other
## 2042       NA           Other
## 2043       NA           Other
## 2044       NA           Other
## 2045       NA           Other
## 2046       NA           Other
## 2047       NA           Other
## 2048       NA           Other
## 2049       NA           Other
## 2050       NA           Other
## 2051       NA           Other
## 2052       NA           Other
## 2053       NA           Other
## 2054       NA           Other
## 2055       NA           Other
## 2056       NA           Other
## 2057       NA           Other
## 2058       NA           Other
## 2059       NA           Other
## 2060       NA           Other
## 2061       NA           Other
## 2062       NA           Other
## 2063       NA           Other
## 2064       NA           Other
## 2065       NA           Other
## 2066       NA           Other
## 2067       NA           Other
## 2068       NA           Other
## 2069       NA           Other
## 2070       NA           Other
## 2071       NA           Other
## 2072       NA           Other
## 2073       NA           Other
## 2074       NA           Other
## 2075       NA           Other
## 2076       NA           Other
## 2077       NA           Other
## 2078       NA           Other
## 2079       NA           Other
## 2080       NA           Other
## 2081       NA           Other
## 2082       NA           Other
## 2083       NA           Other
## 2084       NA           Other
## 2085       NA           Other
## 2086       NA           Other
## 2087       NA           Other
## 2088       NA           Other
## 2089       NA           Other
## 2090       NA           Other
## 2091       NA           Other
## 2092       NA           Other
## 2093       NA           Other
## 2094       NA           Other
## 2095       NA           Other
## 2096       NA           Other
## 2097       NA           Other
## 2098       NA           Other
## 2099       NA           Other
## 2100       NA           Other
## 2101       NA           Other
## 2102       NA           Other
## 2103       NA           Other
## 2104       NA           Other
## 2105       NA           Other
## 2106       NA           Other
## 2107       NA           Other
## 2108       NA           Other
## 2109       NA           Other
## 2110       NA           Other
## 2111       NA           Other
## 2112       NA           Other
## 2113       NA           Other
## 2114       NA           Other
## 2115       NA           Other
## 2116       NA           Other
## 2117       NA           Other
## 2118       NA           Other
## 2119       NA           Other
## 2120       NA           Other
## 2121       NA           Other
## 2122       NA           Other
## 2123       NA           Other
## 2124       NA           Other
## 2125       NA           Other
## 2126       NA           Other
## 2127       NA           Other
## 2128       NA           Other
## 2129       NA           Other
## 2130       NA           Other
## 2131       NA           Other
## 2132       NA           Other
## 2133       NA           Other
## 2134       NA           Other
## 2135       NA           Other
## 2136       NA           Other
## 2137       NA           Other
## 2138       NA           Other
## 2139       NA           Other
## 2140       NA           Other
## 2141       NA           Other
## 2142       NA           Other
## 2143       NA           Other
## 2144       NA           Other
## 2145       NA           Other
## 2146       NA           Other
## 2147       NA           Other
## 2148       NA           Other
## 2149       NA           Other
## 2150       NA           Other
## 2151       NA           Other
## 2152       NA           Other
## 2153       NA           Other
## 2154       NA           Other
## 2155       NA           Other
## 2156       NA           Other
## 2157       NA           Other
## 2158       NA           Other
## 2159       NA           Other
## 2160       NA           Other
## 2161       NA           Other
## 2162       NA           Other
## 2163       NA           Other
## 2164       NA           Other
## 2165       NA           Other
## 2166       NA           Other
## 2167       NA           Other
## 2168       NA           Other
## 2169       NA           Other
## 2170       NA           Other
## 2171       NA           Other
## 2172       NA           Other
## 2173       NA           Other
## 2174       NA           Other
## 2175       NA           Other
## 2176       NA           Other
## 2177       NA           Other
## 2178       NA           Other
## 2179       NA           Other
## 2180       NA           Other
## 2181       NA           Other
## 2182       NA           Other
## 2183       NA           Other
## 2184       NA           Other
## 2185       NA           Other
## 2186       NA           Other
## 2187       NA           Other
## 2188       NA           Other
## 2189       NA           Other
## 2190       NA           Other
## 2191       NA           Other
## 2192       NA           Other
## 2193       NA           Other
## 2194       NA           Other
## 2195       NA           Other
## 2196       NA           Other
## 2197       NA           Other
## 2198       NA           Other
## 2199       NA           Other
## 2200       NA           Other
## 2201       NA           Other
## 2202       NA           Other
## 2203       NA           Other
## 2204       NA           Other
## 2205       NA           Other
## 2206       NA           Other
## 2207       NA           Other
## 2208       NA           Other
## 2209       NA           Other
## 2210       NA           Other
## 2211       NA           Other
## 2212       NA           Other
## 2213       NA           Other
## 2214       NA           Other
## 2215       NA           Other
## 2216       NA           Other
## 2217       NA           Other
## 2218       NA           Other
## 2219       NA           Other
## 2220       NA           Other
## 2221       NA           Other
## 2222       NA           Other
## 2223       NA           Other
## 2224       NA           Other
## 2225       NA           Other
## 2226       NA           Other
## 2227       NA           Other
## 2228       NA           Other
## 2229       NA           Other
## 2230       NA           Other
## 2231       NA           Other
## 2232       NA           Other
## 2233       NA           Other
## 2234       NA           Other
## 2235       NA           Other
## 2236       NA           Other
## 2237       NA           Other
## 2238       NA           Other
## 2239       NA           Other
## 2240       NA           Other
## 2241       NA           Other
## 2242       NA           Other
## 2243       NA           Other
## 2244       NA           Other
## 2245       NA           Other
## 2246       NA           Other
## 2247       NA           Other
## 2248       NA           Other
## 2249       NA           Other
## 2250       NA           Other
## 2251       NA           Other
## 2252       NA           Other
## 2253       NA           Other
## 2254       NA           Other
## 2255       NA           Other
## 2256       NA           Other
## 2257       NA           Other
## 2258       NA           Other
## 2259       NA           Other
## 2260       NA           Other
## 2261       NA           Other
## 2262       NA           Other
## 2263       NA           Other
## 2264       NA           Other
## 2265       NA           Other
## 2266       NA           Other
## 2267       NA           Other
## 2268       NA           Other
## 2269       NA           Other
## 2270       NA           Other
## 2271       NA           Other
## 2272       NA           Other
## 2273       NA           Other
## 2274       NA           Other
## 2275       NA           Other
## 2276       NA           Other
## 2277       NA           Other
## 2278       NA           Other
## 2279       NA           Other
## 2280       NA           Other
## 2281       NA           Other
## 2282       NA           Other
## 2283       NA           Other
## 2284       NA           Other
## 2285       NA           Other
## 2286       NA           Other
## 2287       NA           Other
## 2288       NA           Other
## 2289       NA           Other
## 2290       NA           Other
## 2291       NA           Other
## 2292       NA           Other
## 2293       NA           Other
## 2294       NA           Other
## 2295       NA           Other
## 2296       NA           Other
## 2297       NA           Other
## 2298       NA           Other
## 2299       NA           Other
## 2300       NA           Other
## 2301       NA           Other
## 2302       NA           Other
## 2303       NA           Other
## 2304       NA           Other
## 2305       NA           Other
## 2306       NA           Other
## 2307       NA           Other
## 2308       NA           Other
## 2309       NA           Other
## 2310       NA           Other
## 2311       NA           Other
## 2312       NA           Other
## 2313       NA           Other
## 2314       NA           Other
## 2315       NA           Other
## 2316       NA           Other
## 2317       NA           Other
## 2318       NA           Other
## 2319       NA           Other
## 2320       NA           Other
## 2321       NA           Other
## 2322       NA           Other
## 2323       NA           Other
## 2324       NA           Other
## 2325       NA           Other
## 2326       NA           Other
## 2327       NA           Other
## 2328       NA           Other
## 2329       NA           Other
## 2330       NA           Other
## 2331       NA           Other
## 2332       NA           Other
## 2333       NA           Other
## 2334       NA           Other
## 2335       NA           Other
## 2336       NA           Other
## 2337       NA           Other
## 2338       NA           Other
## 2339       NA           Other
## 2340       NA           Other
## 2341       NA           Other
## 2342       NA           Other
## 2343       NA           Other
## 2344       NA           Other
## 2345       NA           Other
## 2346       NA           Other
## 2347       NA           Other
## 2348       NA           Other
## 2349       NA           Other
## 2350       NA           Other
## 2351       NA           Other
## 2352       NA           Other
## 2353       NA           Other
## 2354       NA           Other
## 2355       NA           Other
## 2356       NA           Other
## 2357       NA           Other
## 2358       NA           Other
## 2359       NA           Other
## 2360       NA           Other
## 2361       NA           Other
## 2362       NA           Other
## 2363       NA           Other
## 2364       NA           Other
## 2365       NA           Other
## 2366       NA           Other
## 2367       NA           Other
## 2368       NA           Other
## 2369       NA           Other
## 2370       NA           Other
## 2371       NA           Other
## 2372       NA           Other
## 2373       NA           Other
## 2374       NA           Other
## 2375       NA           Other
## 2376       NA           Other
## 2377       NA           Other
## 2378       NA           Other
## 2379       NA           Other
## 2380       NA           Other
## 2381       NA           Other
## 2382       NA           Other
## 2383       NA           Other
## 2384       NA           Other
## 2385       NA           Other
## 2386       NA           Other
## 2387       NA           Other
## 2388       NA           Other
## 2389       NA           Other
## 2390       NA           Other
## 2391       NA           Other
## 2392       NA           Other
## 2393       NA           Other
## 2394       NA           Other
## 2395       NA           Other
## 2396       NA           Other
## 2397       NA           Other
## 2398       NA           Other
## 2399       NA           Other
## 2400       NA           Other
## 2401       NA           Other
## 2402       NA           Other
## 2403       NA           Other
## 2404       NA           Other
## 2405       NA           Other
## 2406       NA           Other
## 2407       NA           Other
## 2408       NA           Other
## 2409       NA           Other
## 2410       NA           Other
## 2411       NA           Other
## 2412       NA           Other
## 2413       NA           Other
## 2414       NA           Other
## 2415       NA           Other
## 2416       NA           Other
## 2417       NA           Other
## 2418       NA           Other
## 2419       NA           Other
## 2420       NA           Other
## 2421       NA           Other
## 2422       NA           Other
## 2423       NA           Other
## 2424       NA           Other
## 2425       NA           Other
## 2426       NA           Other
## 2427       NA           Other
## 2428       NA           Other
## 2429       NA           Other
## 2430       NA           Other
## 2431       NA           Other
## 2432       NA           Other
## 2433       NA           Other
## 2434       NA           Other
## 2435       NA           Other
## 2436       NA           Other
## 2437       NA           Other
## 2438       NA           Other
## 2439       NA           Other
## 2440       NA           Other
## 2441       NA           Other
## 2442       NA           Other
## 2443       NA           Other
## 2444       NA           Other
## 2445       NA           Other
## 2446       NA           Other
## 2447       NA           Other
## 2448       NA           Other
## 2449       NA           Other
## 2450       NA           Other
## 2451       NA           Other
## 2452       NA           Other
## 2453       NA           Other
## 2454       NA           Other
## 2455       NA           Other
## 2456       NA           Other
## 2457       NA           Other
## 2458       NA           Other
## 2459       NA           Other
## 2460       NA           Other
## 2461       NA           Other
## 2462       NA           Other
## 2463       NA           Other
## 2464       NA           Other
## 2465       NA           Other
## 2466       NA           Other
## 2467       NA           Other
## 2468       NA           Other
## 2469       NA           Other
## 2470       NA           Other
## 2471       NA           Other
## 2472       NA           Other
## 2473       NA           Other
## 2474       NA           Other
## 2475       NA           Other
## 2476       NA           Other
## 2477       NA           Other
## 2478       NA           Other
## 2479       NA           Other
## 2480       NA           Other
## 2481       NA           Other
## 2482       NA           Other
## 2483       NA           Other
## 2484       NA           Other
## 2485       NA           Other
## 2486       NA           Other
## 2487       NA           Other
## 2488       NA           Other
## 2489       NA           Other
## 2490       NA           Other
## 2491       NA           Other
## 2492       NA           Other
## 2493       NA           Other
## 2494       NA           Other
## 2495       NA           Other
## 2496       NA           Other
## 2497       NA           Other
## 2498       NA           Other
## 2499       NA           Other
## 2500       NA           Other
## 2501       NA           Other
## 2502       NA           Other
## 2503       NA           Other
## 2504       NA           Other
## 2505       NA           Other
## 2506       NA           Other
## 2507       NA           Other
## 2508       NA           Other
## 2509       NA           Other
## 2510       NA           Other
## 2511       NA           Other
## 2512       NA           Other
## 2513       NA           Other
## 2514       NA           Other
## 2515       NA           Other
## 2516       NA           Other
## 2517       NA           Other
## 2518       NA           Other
## 2519       NA           Other
## 2520       NA           Other
## 2521       NA           Other
## 2522       NA           Other
## 2523       NA           Other
## 2524       NA           Other
## 2525       NA           Other
## 2526       NA           Other
## 2527       NA           Other
## 2528       NA           Other
## 2529       NA           Other
## 2530       NA           Other
## 2531       NA           Other
## 2532       NA           Other
## 2533       NA           Other
## 2534       NA           Other
## 2535       NA           Other
## 2536       NA           Other
## 2537       NA           Other
## 2538       NA           Other
## 2539       NA           Other
## 2540       NA           Other
## 2541       NA           Other
## 2542       NA           Other
## 2543       NA           Other
## 2544       NA           Other
## 2545       NA           Other
## 2546       NA           Other
## 2547       NA           Other
## 2548       NA           Other
## 2549       NA           Other
## 2550       NA           Other
## 2551       NA           Other
## 2552       NA           Other
## 2553       NA           Other
## 2554       NA           Other
## 2555       NA           Other
## 2556       NA           Other
## 2557       NA           Other
## 2558       NA           Other
## 2559       NA           Other
## 2560       NA           Other
## 2561       NA           Other
## 2562       NA           Other
## 2563       NA           Other
## 2564       NA           Other
## 2565       NA           Other
## 2566       NA           Other
## 2567       NA           Other
## 2568       NA           Other
## 2569       NA           Other
## 2570       NA           Other
## 2571       NA           Other
## 2572       NA           Other
## 2573       NA           Other
## 2574       NA           Other
## 2575       NA           Other
## 2576       NA           Other
## 2577       NA           Other
## 2578       NA           Other
## 2579       NA           Other
## 2580       NA           Other
## 2581       NA           Other
## 2582       NA           Other
## 2583       NA           Other
## 2584       NA           Other
## 2585       NA           Other
## 2586       NA           Other
## 2587       NA           Other
## 2588       NA           Other
## 2589       NA           Other
## 2590       NA           Other
## 2591       NA           Other
## 2592       NA           Other
## 2593       NA           Other
## 2594       NA           Other
## 2595       NA           Other
## 2596       NA           Other
## 2597       NA           Other
## 2598       NA           Other
## 2599       NA           Other
## 2600       NA           Other
## 2601       NA           Other
## 2602       NA           Other
## 2603       NA           Other
## 2604       NA           Other
## 2605       NA           Other
## 2606       NA           Other
## 2607       NA           Other
## 2608       NA           Other
## 2609       NA           Other
## 2610       NA           Other
## 2611       NA           Other
## 2612       NA           Other
## 2613       NA           Other
## 2614       NA           Other
## 2615       NA           Other
## 2616       NA           Other
## 2617       NA           Other
## 2618       NA           Other
## 2619       NA           Other
## 2620       NA           Other
## 2621       NA           Other
## 2622       NA           Other
## 2623       NA           Other
## 2624       NA           Other
## 2625       NA           Other
## 2626       NA           Other
## 2627       NA           Other
## 2628       NA           Other
## 2629       NA           Other
## 2630       NA           Other
## 2631       NA           Other
## 2632       NA           Other
## 2633       NA           Other
## 2634       NA           Other
## 2635       NA           Other
## 2636       NA           Other
## 2637       NA           Other
## 2638       NA           Other
## 2639       NA           Other
## 2640       NA           Other
## 2641       NA           Other
## 2642       NA           Other
## 2643       NA           Other
## 2644       NA           Other
## 2645       NA           Other
## 2646       NA           Other
## 2647       NA           Other
## 2648       NA           Other
## 2649       NA           Other
## 2650       NA           Other
## 2651       NA           Other
## 2652       NA           Other
## 2653       NA           Other
## 2654       NA           Other
## 2655       NA           Other
## 2656       NA           Other
## 2657       NA           Other
## 2658       NA           Other
## 2659       NA           Other
## 2660       NA           Other
## 2661       NA           Other
## 2662       NA           Other
## 2663       NA           Other
## 2664       NA           Other
## 2665       NA           Other
## 2666       NA           Other
## 2667       NA           Other
## 2668       NA           Other
## 2669       NA           Other
## 2670       NA           Other
## 2671       NA           Other
## 2672       NA           Other
## 2673       NA           Other
## 2674       NA           Other
## 2675       NA           Other
## 2676       NA           Other
## 2677       NA           Other
## 2678       NA           Other
## 2679       NA           Other
## 2680       NA           Other
## 2681       NA           Other
## 2682       NA           Other
## 2683       NA           Other
## 2684       NA           Other
## 2685       NA           Other
## 2686       NA           Other
## 2687       NA           Other
## 2688       NA           Other
## 2689       NA           Other
## 2690       NA           Other
## 2691       NA           Other
## 2692       NA           Other
## 2693       NA           Other
## 2694       NA           Other
## 2695       NA           Other
## 2696       NA           Other
## 2697       NA           Other
## 2698       NA           Other
## 2699       NA           Other
## 2700       NA           Other
## 2701       NA           Other
## 2702       NA           Other
## 2703       NA           Other
## 2704       NA           Other
## 2705       NA           Other
## 2706       NA           Other
## 2707       NA           Other
## 2708       NA           Other
## 2709       NA           Other
## 2710       NA           Other
## 2711       NA           Other
## 2712       NA           Other
## 2713       NA           Other
## 2714       NA           Other
## 2715       NA           Other
## 2716       NA           Other
## 2717       NA           Other
## 2718       NA           Other
## 2719       NA           Other
## 2720       NA           Other
## 2721       NA           Other
## 2722       NA           Other
## 2723       NA           Other
## 2724       NA           Other
## 2725       NA           Other
## 2726       NA           Other
## 2727       NA           Other
## 2728       NA           Other
## 2729       NA           Other
## 2730       NA           Other
## 2731       NA           Other
## 2732       NA           Other
## 2733       NA           Other
## 2734       NA           Other
## 2735       NA           Other
## 2736       NA           Other
## 2737       NA           Other
## 2738       NA           Other
## 2739       NA           Other
## 2740       NA           Other
## 2741       NA           Other
## 2742       NA           Other
## 2743       NA           Other
## 2744       NA           Other
## 2745       NA           Other
## 2746       NA           Other
## 2747       NA           Other
## 2748       NA           Other
## 2749       NA           Other
## 2750       NA           Other
## 2751       NA           Other
## 2752       NA           Other
## 2753       NA           Other
## 2754       NA           Other
## 2755       NA           Other
## 2756       NA           Other
## 2757       NA           Other
## 2758       NA           Other
## 2759       NA           Other
## 2760       NA           Other
## 2761       NA           Other
## 2762       NA           Other
## 2763       NA           Other
## 2764       NA           Other
## 2765       NA           Other
## 2766       NA           Other
## 2767       NA           Other
## 2768       NA           Other
## 2769       NA           Other
## 2770       NA           Other
## 2771       NA           Other
## 2772       NA           Other
## 2773       NA           Other
## 2774       NA           Other
## 2775       NA           Other
## 2776       NA           Other
## 2777       NA           Other
## 2778       NA           Other
## 2779       NA           Other
## 2780       NA           Other
## 2781       NA           Other
## 2782       NA           Other
## 2783       NA           Other
## 2784       NA           Other
## 2785       NA           Other
## 2786       NA           Other
## 2787       NA           Other
## 2788       NA           Other
## 2789       NA           Other
## 2790       NA           Other
## 2791       NA           Other
## 2792       NA           Other
## 2793       NA           Other
## 2794       NA           Other
## 2795       NA           Other
## 2796       NA           Other
## 2797       NA           Other
## 2798       NA           Other
## 2799       NA           Other
## 2800       NA           Other
## 2801       NA           Other
## 2802       NA           Other
## 2803       NA           Other
## 2804       NA           Other
## 2805       NA           Other
## 2806       NA           Other
## 2807       NA           Other
## 2808       NA           Other
## 2809       NA           Other
## 2810       NA           Other
## 2811       NA           Other
## 2812       NA           Other
## 2813       NA           Other
## 2814       NA           Other
## 2815       NA           Other
## 2816       NA           Other
## 2817       NA           Other
## 2818       NA           Other
## 2819       NA           Other
## 2820       NA           Other
## 2821       NA           Other
## 2822       NA           Other
## 2823       NA           Other
## 2824       NA           Other
## 2825       NA           Other
## 2826       NA           Other
## 2827       NA           Other
## 2828       NA           Other
## 2829       NA           Other
## 2830       NA           Other
## 2831       NA           Other
## 2832       NA           Other
## 2833       NA           Other
## 2834       NA           Other
## 2835       NA           Other
## 2836       NA           Other
## 2837       NA           Other
## 2838       NA           Other
## 2839       NA           Other
## 2840       NA           Other
## 2841       NA           Other
## 2842       NA           Other
## 2843       NA           Other
## 2844       NA           Other
## 2845       NA           Other
## 2846       NA           Other
## 2847       NA           Other
## 2848       NA           Other
## 2849       NA           Other
## 2850       NA           Other
## 2851       NA           Other
## 2852       NA           Other
## 2853       NA           Other
## 2854       NA           Other
## 2855       NA           Other
## 2856       NA           Other
## 2857       NA           Other
## 2858       NA        Decadent
## 2859       NA           Other
## 2860       NA           Other
## 2861       NA           Other
## 2862       NA           Other
## 2863       NA           Other
## 2864       NA           Other
## 2865       NA           Other
## 2866       NA           Other
## 2867       NA           Other
## 2868       NA           Other
## 2869       NA           Other
## 2870       NA           Other
## 2871       NA           Other
## 2872       NA           Other
## 2873       NA           Other
## 2874       NA           Other
## 2875       NA           Other
## 2876       NA           Other
## 2877       NA           Other
## 2878       NA           Other
## 2879       NA           Other
## 2880       NA           Other
## 2881       NA           Other
## 2882       NA           Other
## 2883       NA           Other
## 2884       NA           Other
## 2885       NA           Other
## 2886       NA           Other
## 2887       NA           Other
## 2888       NA           Other
## 2889       NA           Other
## 2890       NA           Other
## 2891       NA           Other
## 2892       NA           Other
## 2893       NA           Other
## 2894       NA           Other
## 2895       NA           Other
## 2896       NA           Other
## 2897       NA           Other
## 2898       NA           Other
## 2899       NA           Other
## 2900       NA           Other
## 2901       NA           Other
## 2902       NA           Other
## 2903       NA           Other
## 2904       NA           Other
## 2905       NA           Other
## 2906       NA           Other
## 2907       NA           Other
## 2908       NA           Other
## 2909       NA           Other
## 2910       NA           Other
## 2911       NA           Other
## 2912       NA           Other
## 2913       NA           Other
## 2914       NA           Other
## 2915       NA           Other
## 2916       NA           Other
## 2917       NA           Other
## 2918       NA           Other
## 2919       NA           Other
## 2920       NA           Other
## 2921       NA           Other
## 2922       NA           Other
## 2923       NA           Other
## 2924       NA           Other
## 2925       NA           Other
## 2926       NA           Other
## 2927       NA           Other
## 2928       NA           Other
## 2929       NA           Other
## 2930       NA           Other
## 2931       NA           Other
## 2932       NA           Other
## 2933       NA           Other
## 2934       NA           Other
## 2935       NA           Other
## 2936       NA           Other
## 2937       NA           Other
## 2938       NA           Other
## 2939       NA           Other
## 2940       NA           Other
## 2941       NA           Other
## 2942       NA           Other
## 2943       NA           Other
## 2944       NA           Other
## 2945       NA           Other
## 2946       NA           Other
## 2947       NA           Other
## 2948       NA           Other
## 2949       NA           Other
## 2950       NA           Other
## 2951       NA           Other
## 2952       NA           Other
## 2953       NA           Other
## 2954       NA           Other
## 2955       NA           Other
## 2956       NA           Other
## 2957       NA           Other
## 2958       NA           Other
## 2959       NA           Other
## 2960       NA           Other
## 2961       NA           Other
## 2962       NA           Other
## 2963       NA           Other
## 2964       NA           Other
## 2965       NA           Other
## 2966       NA           Other
## 2967       NA           Other
## 2968       NA           Other
## 2969       NA           Other
## 2970       NA           Other
## 2971       NA           Other
## 2972       NA           Other
## 2973       NA           Other
## 2974       NA           Other
## 2975       NA           Other
## 2976       NA           Other
## 2977       NA           Other
## 2978       NA           Other
## 2979       NA           Other
## 2980       NA           Other
## 2981       NA           Other
## 2982       NA           Other
## 2983       NA           Other
## 2984       NA           Other
## 2985       NA           Other
## 2986       NA           Other
## 2987       NA           Other
## 2988       NA           Other
## 2989       NA           Other
## 2990       NA           Other
## 2991       NA           Other
## 2992       NA           Other
## 2993       NA           Other
## 2994       NA           Other
## 2995       NA           Other
## 2996       NA           Other
## 2997       NA           Other
## 2998       NA           Other
## 2999       NA           Other
## 3000       NA           Other
## 3001       NA           Other
## 3002       NA           Other
## 3003       NA           Other
## 3004       NA           Other
## 3005       NA           Other
## 3006       NA           Other
## 3007       NA           Other
## 3008       NA           Other
## 3009       NA           Other
## 3010       NA           Other
## 3011       NA           Other
## 3012       NA           Other
## 3013       NA           Other
## 3014       NA           Other
## 3015       NA           Other
## 3016       NA           Other
## 3017       NA           Other
## 3018       NA           Other
## 3019       NA           Other
## 3020       NA           Other
## 3021       NA           Other
## 3022       NA           Other
## 3023       NA           Other
## 3024       NA           Other
## 3025       NA           Other
## 3026       NA           Other
## 3027       NA           Other
## 3028       NA           Other
## 3029       NA           Other
## 3030       NA           Other
## 3031       NA           Other
## 3032       NA           Other
## 3033       NA           Other
## 3034       NA           Other
## 3035       NA           Other
## 3036       NA           Other
## 3037       NA           Other
## 3038       NA           Other
## 3039       NA           Other
## 3040       NA           Other
## 3041       NA           Other
## 3042       NA           Other
## 3043       NA           Other
## 3044       NA           Other
## 3045       NA           Other
## 3046       NA           Other
## 3047       NA           Other
## 3048       NA           Other
## 3049       NA           Other
## 3050       NA           Other
## 3051       NA           Other
## 3052       NA           Other
## 3053       NA           Other
## 3054       NA           Other
## 3055       NA           Other
## 3056       NA           Other
## 3057       NA           Other
## 3058       NA           Other
## 3059       NA           Other
## 3060       NA           Other
## 3061       NA           Other
## 3062       NA           Other
## 3063       NA           Other
## 3064       NA           Other
## 3065       NA           Other
## 3066       NA           Other
## 3067       NA           Other
## 3068       NA           Other
## 3069       NA           Other
## 3070       NA           Other
## 3071       NA           Other
## 3072       NA           Other
## 3073       NA           Other
## 3074       NA           Other
## 3075       NA           Other
## 3076       NA           Other
## 3077       NA           Other
## 3078       NA           Other
## 3079       NA           Other
## 3080       NA           Other
## 3081       NA           Other
## 3082       NA           Other
## 3083       NA           Other
## 3084       NA           Other
## 3085       NA           Other
## 3086       NA           Other
## 3087       NA           Other
## 3088       NA           Other
## 3089       NA           Other
## 3090       NA           Other
## 3091       NA           Other
## 3092       NA           Other
## 3093       NA           Other
## 3094       NA           Other
## 3095       NA           Other
## 3096       NA           Other
## 3097       NA           Other
## 3098       NA           Other
## 3099       NA           Other
## 3100       NA           Other
## 3101       NA           Other
## 3102       NA           Other
## 3103       NA           Other
## 3104       NA           Other
## 3105       NA           Other
## 3106       NA           Other
## 3107       NA           Other
## 3108       NA           Other
## 3109       NA           Other
## 3110       NA           Other
## 3111       NA           Other
## 3112       NA           Other
## 3113       NA           Other
## 3114       NA           Other
## 3115       NA           Other
## 3116       NA           Other
## 3117       NA           Other
## 3118       NA           Other
## 3119       NA           Other
## 3120       NA           Other
## 3121       NA           Other
## 3122       NA           Other
## 3123       NA           Other
## 3124       NA           Other
## 3125       NA           Other
## 3126       NA           Other
## 3127       NA           Other
## 3128       NA           Other
## 3129       NA           Other
## 3130       NA           Other
## 3131       NA           Other
## 3132       NA           Other
## 3133       NA           Other
## 3134       NA           Other
## 3135       NA           Other
## 3136       NA           Other
## 3137       NA           Other
## 3138       NA           Other
## 3139       NA           Other
## 3140       NA           Other
## 3141       NA           Other
## 3142       NA           Other
## 3143       NA           Other
## 3144       NA           Other
## 3145       NA           Other
## 3146       NA           Other
## 3147       NA           Other
## 3148       NA           Other
## 3149       NA           Other
## 3150       NA           Other
## 3151       NA           Other
## 3152       NA           Other
## 3153       NA           Other
## 3154       NA           Other
## 3155       NA           Other
## 3156       NA           Other
## 3157       NA           Other
## 3158       NA           Other
## 3159       NA           Other
## 3160       NA           Other
## 3161       NA           Other
## 3162       NA           Other
## 3163       NA           Other
## 3164       NA           Other
## 3165       NA           Other
## 3166       NA           Other
## 3167       NA           Other
## 3168       NA           Other
## 3169       NA           Other
## 3170       NA           Other
## 3171       NA           Other
## 3172       NA           Other
## 3173       NA           Other
## 3174       NA           Other
## 3175       NA           Other
## 3176       NA           Other
## 3177       NA           Other
## 3178       NA           Other
## 3179       NA           Other
## 3180       NA           Other
## 3181       NA           Other
## 3182       NA           Other
## 3183       NA           Other
## 3184       NA           Other
## 3185       NA           Other
## 3186       NA           Other
## 3187       NA           Other
## 3188       NA           Other
## 3189       NA           Other
## 3190       NA           Other
## 3191       NA           Other
## 3192       NA           Other
## 3193       NA           Other
## 3194       NA           Other
## 3195       NA           Other
## 3196       NA           Other
## 3197       NA           Other
## 3198       NA           Other
## 3199       NA           Other
## 3200       NA           Other
## 3201       NA           Other
## 3202       NA           Other
## 3203       NA           Other
## 3204       NA           Other
## 3205       NA           Other
## 3206       NA           Other
## 3207       NA           Other
## 3208       NA           Other
## 3209       NA           Other
## 3210       NA           Other
## 3211       NA           Other
## 3212       NA           Other
## 3213       NA           Other
## 3214       NA           Other
## 3215       NA           Other
## 3216       NA           Other
## 3217       NA           Other
## 3218       NA           Other
## 3219       NA           Other
## 3220       NA           Other
## 3221       NA           Other
## 3222       NA           Other
## 3223       NA           Other
## 3224       NA           Other
## 3225       NA           Other
## 3226       NA           Other
## 3227       NA           Other
## 3228       NA           Other
## 3229       NA           Other
## 3230       NA           Other
## 3231       NA           Other
## 3232       NA           Other
## 3233       NA           Other
## 3234       NA           Other
## 3235       NA           Other
## 3236       NA           Other
## 3237       NA           Other
## 3238       NA           Other
## 3239       NA           Other
## 3240       NA           Other
## 3241       NA           Other
## 3242       NA           Other
## 3243       NA           Other
## 3244       NA           Other
## 3245       NA           Other
## 3246       NA           Other
## 3247       NA           Other
## 3248       NA           Other
## 3249       NA           Other
## 3250       NA           Other
## 3251       NA           Other
## 3252       NA           Other
## 3253       NA           Other
## 3254       NA           Other
## 3255       NA           Other
## 3256       NA           Other
## 3257       NA           Other
## 3258       NA           Other
## 3259       NA           Other
## 3260       NA           Other
## 3261       NA           Other
## 3262       NA           Other
## 3263       NA           Other
## 3264       NA           Other
## 3265       NA           Other
## 3266       NA           Other
## 3267       NA           Other
## 3268       NA           Other
## 3269       NA           Other
## 3270       NA           Other
## 3271       NA           Other
## 3272       NA           Other
## 3273       NA           Other
## 3274       NA           Other
## 3275       NA           Other
## 3276       NA           Other
## 3277       NA           Other
## 3278       NA           Other
## 3279       NA           Other
## 3280       NA           Other
## 3281       NA           Other
## 3282       NA           Other
## 3283       NA           Other
## 3284       NA           Other
## 3285       NA           Other
## 3286       NA           Other
## 3287       NA           Other
## 3288       NA           Other
## 3289       NA           Other
## 3290       NA           Other
## 3291       NA           Other
## 3292       NA           Other
## 3293       NA           Other
## 3294       NA           Other
## 3295       NA           Other
## 3296       NA           Other
## 3297       NA           Other
## 3298       NA           Other
## 3299       NA           Other
## 3300       NA           Other
## 3301       NA           Other
## 3302       NA           Other
## 3303       NA           Other
## 3304       NA           Other
## 3305       NA           Other
## 3306       NA           Other
## 3307       NA           Other
## 3308       NA           Other
## 3309       NA           Other
## 3310       NA           Other
## 3311       NA           Other
## 3312       NA           Other
## 3313       NA           Other
## 3314       NA           Other
## 3315       NA           Other
## 3316       NA           Other
## 3317       NA           Other
## 3318       NA           Other
## 3319       NA           Other
## 3320       NA           Other
## 3321       NA           Other
## 3322       NA           Other
## 3323       NA           Other
## 3324       NA           Other
## 3325       NA           Other
## 3326       NA           Other
## 3327       NA           Other
## 3328       NA           Other
## 3329       NA           Other
## 3330       NA           Other
## 3331       NA           Other
## 3332       NA           Other
## 3333       NA           Other
##  [ reached 'max' / getOption("max.print") -- omitted 17921 rows ]

2. Pivot all or part of the dataframe into either wide or long format.

?summarise
startdate__language_freq <- TC_clean %>%
  group_by(startdate, final_lang) %>%
  summarise(count = n(), .groups = 'drop') %>%
  pivot_wider(names_from = final_lang, values_from = count, values_fill = 0)
head(startdate__language_freq)
## # A tibble: 6 × 120
##   startdate   eng   ara   chi   cze   dan   fin   fre   ger   grc   hun   ita
##   <chr>     <int> <int> <int> <int> <int> <int> <int> <int> <int> <int> <int>
## 1 1874          1     0     0     0     0     0     0     0     0     0     0
## 2 1897          1     0     0     0     0     0     0     0     0     0     0
## 3 1900          2     0     0     0     0     0     0     0     0     0     0
## 4 1950        137     1     1     1     2     1    26    15     3     1     7
## 5 1951        128     0     3     1     5     3    46    14     0     0     6
## 6 1952        100     1     4     2     0     1    31    17     0     0    11
## # ℹ 108 more variables: jpn <int>, lav <int>, per <int>, pol <int>, rum <int>,
## #   rus <int>, spa <int>, yid <int>, dut <int>, gre <int>, nor <int>,
## #   por <int>, swe <int>, tur <int>, zul <int>, heb <int>, kor <int>,
## #   lat <int>, ben <int>, hin <int>, bul <int>, lit <int>, wel <int>,
## #   arm <int>, geo <int>, ice <int>, kan <int>, est <int>, san <int>,
## #   ukr <int>, ind <int>, mar <int>, Multiple <int>, dwu <int>, srp <int>,
## #   tha <int>, hrv <int>, slv <int>, dak <int>, cat <int>, nep <int>, …
language <- startdate__language_freq

3. Using cleaned and wrangled data either a) make a table of the new categories or b) analyze word frequencies.

freq_auth <- data.frame(TC_data$author, 1:21313)

wordcloud2(freq_auth, size = 1, color = "random-light", shape = "circle")

###4. With an unstructured text field, convert text to lowercase, remove stopwords and analyze the sentiments. Make a custom stopword list to augment an existing stopword list.

library(tm)
library(tidytext)
library(dplyr)

# Convert the text field to lowercase
TC_clean$author <- tolower(TC_clean$author)

# Remove stopwords
stopwords <- c(stopwords("en"), "custom_stopword1", "custom_stopword2")  # Add your custom stopwords
TC_clean$author <- removeWords(TC_clean$author, stopwords)

# Analyze sentiments
sentiments <- get_sentiments("afinn")  # Or any other sentiment lexicon

#Being a bit silly, seeing if names can be run through sentiment analysis
#TC_sentiments <- TC_clean$author %>%
#  unnest_tokens(word, text) %>%
#  inner_join(sentiments)

# Calculate sentiment scores
#sentiment_scores <- TC_sentiments %>%
#  group_by(startdate, final_lang) %>%
#  summarize(sentiment_score = sum(score))

# View the sentiment scores
#head(sentiment_scores)

###5. Create a clearly labeled, multi-color plot based on your dataset.

I tried

?ggplot2

#First attempt (one of the biggest hangups when I first tried to finish this problem set)

#ggplot(startdate__language_freq, aes(x = startdate__language_freq$startdate, y = after_stat(count), fill =NULL)) +
#  geom_bar(stat = "identity") +
#  scale_fill_manual(values = c("#F8766D", "#00BA38", "#619CFF", "#F5A451", "#B99FEB")) +
#  labs(title = "Language Frequencies Over Time",
#       x = "Start Date",
#       y = "Count",
#       fill = "Language") +
#  theme_bw()

#startdate__language_freq$ger : startdate__language_freq$bul

Error in geom_bar(): ! Problem while mapping stat to aesthetics. i Error occurred in the 1st layer. Caused by error in map_statistic(): ! Aesthetics must be valid computed stats. x The following aesthetics are invalid: x y = after_stat(count) i Did you map your stat in the wrong layer? Backtrace: 1. base (local) <fn>(x) 2. ggplot2:::print.ggplot(x) 4. ggplot2:::ggplot_build.ggplot(x) 5. ggplot2:::by_layer(…) 12. ggplot2 (local) f(l = layers[[i]], d = data[[i]]) 13. l$map_statistic(d, plot) 14. ggplot2 (local) map_statistic(…, self = self) Error in geom_bar(stat = “identity”) : i Error occurred in the 1st layer. Caused by error in map_statistic(): ! Aesthetics must be valid computed stats. x The following aesthetics are invalid: x y = after_stat(count) i Did you map your stat in the wrong layer?

#startdate__language_freq$ger : startdate__language_freq$bul
library(tidyr)

# Reshape data into long format
startdate__language_freq_long <- pivot_longer(startdate__language_freq, cols = -startdate, names_to = "Language", values_to = "Count")

# Plot the data
ggplot(startdate__language_freq_long, aes(x = startdate, y = Count, fill = Language)) +
  geom_col(position = "stack") +
  scale_fill_manual(values = rainbow(length(unique(startdate__language_freq_long$Language)))) +
  labs(title = "Language Frequencies Over Time",
       x = "Start Date",
       y = "Count",
       fill = "Language") +
  theme_bw()